COBOL Questions With Answers
COBOL Questions With Answers
In the above scenario, if we execute the above program which one of the
following errors we get?
a) S806 b)SE37 c)S0C4 d)S0C7
3. A file attribute mismatch was encountered. Which of the following status code is
related to the above message?
a)35 b)39 c)46 d)90
5. 01 WS-ABC PIC X.
88 FOUND VALUE ‘Y’.
88 NOT-FOUND VALUE ‘N’.
What is the error in the above code?
a) PIC clause is missing in the FOUND declaration.
b) PIC clause is missing in the NOT-FOUND declaration.
c) 88 level variables are declared in Area-A.
d) 01 level variable is declared in Area-A.
6. Every file entry in the File Control should have a description in the File Section.
a) True b) False
7. IF A>B
IF A>C
DISPLAY ‘A’
NEXT SENTENCE
END-IF
DISPLAY ‘C’
END-IF.
DISPLAY ‘B’.
8. What is the statement that is used to stop the execution of the program?
a) GOBACK b) EXIT c) STOP RUN d) EXIT
9. MAIN-PARA
DISPLAY ‘IN MAIN-PARA’.
PERFORM PARA1 THRU PARA2.
STOP RUN.
PARA1.
DISPLAY ‘IN PARA1’.
PARA3.
DISPLAY ‘IN PARA3’.
PARA2.
DISPLAY ‘IN PARA2’.
Assume that the above code is in the PROCEDURE DIVISION of a COBOL program. If
the above program is executed, what is the output?
a) Yes b) No
11. How many bytes are required to store data internally for a variable defined as PIC
9(7)V99 USAGE COMP-3.
a) 4 b) 5 c) 6 d) 9
12. Find the number of bytes which will be stored in the variable EMP-RECORD
01 EMP-RECORD.
02 EMP-DATA1.
03 EMP-NAME PIC X(10).
03 EMP-SAL PIC 9(04).
02 EMP-DATA2 REDEFINES EMP-DATA1.
03 EMP-N1 PIC X(12).
03 EMP-N2 PIC 9(02).
02 EMP-DATA3.
03 DEPT1 PIC X(02).
03 DEPT2 PIC X(02).
a) 14 b) 16 c) 18 d) 32