- 
                    What is the difference between static & dynamic call?In the case of static call the mainprogram and subpgms r loaded into the mainmemory initially.in the case of dynamic call only the mainpgm is loaded first and the subpgm is loaded only when a call to it is made.so the memory utilization is good in dynamic call. 
- 
                    
- 
                    RedefineWhat is redefine in COBOL? 
- 
                    
- 
                    Explain the difference between an internal and an external sort, the pros and cons, internal sort syntax etc?An external sort is not COBOL; it is performed through JCL and PGM=SORT. It is understandable without any code reference. An internal sort can use two different syntaxes: 1.) USING, GIVING sorts are comparable to external sorts with no extra file processing; 2) INPUT PROCEDURE, OUTPUT PROCEDURE sorts allow for data manipulation before and/or after the sort. 
- 
                    COBOL DivisionsWhat are the four divisions in COBOL 
- 
                    
- 
                    
- 
                    
- 
                    
- 
                    
- 
                    In the example below05 WS-VAR1 PIC X(5),05 WS-VAR2 REDEFINES WA-VAR1 PIC 9(5),PROCEDURE DIVISION MOVE 'ABCDE' TO WS-VAR1.Now what is the value of WS-VAR1 and WS-VAR2 ? 
- 
                    How many bytes occupied following comp example?Dear Friends, 
 
 This is regarding COBOL comp.
 
 PIC X(3) occupy the 3 bytes... but PIC 9(3)V9(7) COMP occupied how much bytes?
 
 I said in interview that 10/2 = 5 bytes. V is specified for decimal point.
 
 Is that correct? But interviewer looked at me differently when I said this answer?
 
 If you are more confident, please reply this ...thanks...
COBOL Interview Questions

 
  
  
  Read Best Answer
                        Read Best Answer 
		
Ans