-
-
-
-
-
-
-
-
-
-
-
What is the WORKING-STORAGE SECTION in Cobol?
A place to reserve storage for data that is not part of the program's input or output. This area contains fields that are used as temporary storage while the program is executing. Some temporary storage variables include: switches, flags, fields containing textual comments, fields to accumulate numeric totals.
-
-
Move X TO XX
A PIC X(1) value A.B PIC X(2) VALUE SPACES.IF MOVE A TO B. WHAT IS THE VALUE OF B. Is it ' A' OR 'A '.
-
PIC clause to hold decimal values
I have a file with 2 fields say 1st field is a indicator.2nd field is amount field.It has the values A,B,C,D.Suppose if the indicator is A,i want to move 123.4when B move 12.34when c move 1.234when d move 1234my question is what pic clause(only one op field variable) should be used to hold all the 4 types of variables.
-
-
-
-
-
-
COBOL Interview Questions
Ans