- 
                    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...
- 
                    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 ? 
- 
                    
- 
                    RedefineWhat is redefine in COBOL? 
- 
                    What is the difference between NEXT SENTENCE and CONTINUE?NEXT SENTENCE gives control to the verb following the next period. CONTINUE gives control to the next verb after the explicit scope terminator. (This is not one of COBOL II's finer implementations). It's safest to use CONTINUE rather than NEXT SENTENCE in COBOL II. 
- 
                    
- 
                    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. 
- 
                    
- 
                    
- 
                    
- 
                    How will you analyze a COBOL program?Hi, 
 
 I was asked in interview how would you analyze a COBOL program?
 
 I gave the ans as there are many kind of analyses -:
 Requirement analysis
 Root cause analysis
 Impact Analysis
 Problem / logic analysis
 
 but in general we talk about problem finding in a program
 and told him we would first go in for a procedure division and check what...
- 
                    
- 
                    
- 
                    
- 
                    
- 
                    COBOL DivisionsWhat are the four divisions in COBOL 
- 
                    
- 
                    
- 
                    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? 
- 
                    
COBOL Interview Questions

 
  
  
  Read Best Answer
                        Read Best Answer 
		
Ans