- 
                    
- 
                    
- 
                    
- 
                    Impact analysis in mainframeWhat is meant by impact analysis in mainframes 
- 
                    
- 
                    
- 
                    COBOL dynamic call and static callWhat is difference between dynamic call and static call with examples ..? 
- 
                    What is Load module & Link edit and How will it work Dynamic call?Normally we are using Dynamic call. What will happen when COBOL program compilation & execution. 
- 
                    Impact AnalysisSuppose a program has one i/p file and one o/p file now we want to add another file to the Cobol program and also two new fields (i.e columns) are added to the o/p file from the new i/p file then how will you do impact analysis. 
- 
                    File ConceptThe Disposition Parameter in the JCL is Share ( DISP=SHR ) and Cobol program opens file in " Extend " mode. In this scenarion what will happen to that file? 
- 
                    
- 
                    Usage of copy statement in CobolHi, 
 
 Can any one tell how to use copybook in COBOL, and please explain with file structure(means i am using 5 fields of file and i want to declare them in copybook and and i want use it in COBOL programming)
 
- 
                    Prime number in COBOLCuld any body tell the concept for the prime number programe? 
- 
                    How to separate to multi-field?For example: 
 01 something PIC X(06).
 01 one PIC 9(02).
 01 two PIC 9(02).
 01 three PIC X(02).
 SELECT socket(:number)
 INTO :something
 FROM DUAL
 result:
 something = 1234ww
 one = 12
 two = 34
 three = ww
- 
                    EMail Validation via COBOLI have file with customer details and I need to process only those records who is having valid email id, so how we can validated these records using COBOL? 
- 
                    
- 
                    
- 
                    Explain call by context by comparing it to other calls?The parameters passed in a call by context are protected from modification by the called program. In a normal call they are able to be modified. 
- 
                    In an EVALUTE statement is the order of the WHEN clauses significant?Absolutely. Evaluation of the WHEN clauses proceeds from top to bottom and their sequence can determine results. 
- 
                    
COBOL Interview Questions

 
  
  
  Read Best Answer
                        Read Best Answer 
		
Ans