-
-
-
-
-
-
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.
-
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.
-
-
Reformat Output file
I have a file having 1000 records and each record having 8 fields, but i want to output having 1,3,5,7 fields only, then how can i achieve this criteria?
-
Alternate Index
What is the use of Alternate Index? Is using alternate index in file processing fast ?
-
Skip alternate records
I have a seq file with 1000 records and I need to skip alternate records and write into a output file using cobol How can I do it
-
-
-
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 '.
-
-
What is file status 39 in cobol?
Lrecl and block size mismatch .can anyone explain in detail...
-
-
How do you delete specific record using COBOL
I want delete one record from the file that is50 th record how can we delete ...?
-
-
COBOL Interview Questions
Ans