Module 5: Data Division
Nameless data description entry
- It allows data declaration without specifying data name. For example:-
05 PIC 9(04) VALUE ZERO.
- This is valid data declaration entry in COBOL-85. When you compile program, compiler treats this entry as FILLER entry. Thus above declaration is similar to:-
05 FILLER PIC 9(04) value zero.
- Along with this feature the COBOL-85 also allows to specify FILLER for Group items. For example below declaration is valid:-
01 FILLER. 05 FILLER PIC 9(04) value zero. 05 FILLER PIC 9(04) value zero.
- For more details about FILLER, please click here < LINK >