- 
                    
- 
                    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

 
  
  
  
		
Ans