- 
                    
- 
                    
- 
                    Skip alternate recordsI have a seq file with 1000 records and I need to skip alternate records and write into a output file using cobol How can I do it 
- 
                    Alternate IndexWhat is the use of Alternate Index? Is using alternate index in file processing fast ? 
- 
                    Reformat Output fileI have a file having 1000 records and each record having 8 fields, but i want to output having 1,3,5,7 fields only, then how can i achieve this criteria? 
- 
                    
- 
                    PIC clause to hold decimal valuesI have a file with 2 fields say 1st field is a indicator.2nd field is amount field.It has the values A,B,C,D.Suppose if the indicator is A,i want to move 123.4when B move 12.34when c move 1.234when d move 1234my question is what pic clause(only one op field variable) should be used to hold all the 4 types of variables. 
- 
                    What is the WORKING-STORAGE SECTION in Cobol?A place to reserve storage for data that is not part of the program's input or output. This area contains fields that are used as temporary storage while the program is executing. Some temporary storage variables include: switches, flags, fields containing textual comments, fields to accumulate numeric totals. 
- 
                    
- 
                    
- 
                    
- 
                    
- 
                    
- 
                    
- 
                    
- 
                    What is the difference between comp and comp-3 usage? Explain other COBOL usages?Comp is a binary usage, while comp-3 indicates packed decimal. The other common usages are binary and display. Display is the default. 3/28/00 Dave Herrmann: 'I was reading your FAQ on Cobol, as an fyi Comp is defined as the fastest/preferred numeric data type for the machine it runs on. IBM Mainframes are typically binary and AS400's are packed.' 
- 
                    
- 
                    
- 
                    
- 
                    What is the linkage section?The linkage section is part of a called program that 'links' or maps to data items in the calling program's working storage. It is the part of the called program where these share items are defined. 
COBOL Interview Questions

 
  
  
  
		
Ans