Library /sys$common/syshlp/helplib.hlb  —  COBOL  DATA_DIVISION
  The DATA DIVISION describes data the program creates, receives as input,
  manipulates, and produces as output.

  Format -

  [ DATA DIVISION.
  [SUB-SCHEMA SECTION.
   [subschema-entry [keeplist-entry] ... ] ]
  [FILE SECTION.
   [file-description-entry {record-description-entry} ... ] ...
   [report-file-description-entry] ...
   [sort-merge-file-description-entry {record-description-entry} ... ] ... ]
  [WORKING-STORAGE SECTION.
   [record-description-entry] ... ]
  [LINKAGE SECTION.
   [record-description-entry] ... ]
  [REPORT SECTION.
   [report-description-entry {report-group-description-entry} ... ] ... ]
  [SCREEN SECTION
   [screen-description-entry] ...] ... ] ]
Additional Information: explode extract

rf_report-file-description-entry
FD file-description-entry
SD sort-merge-file-description-entry
DB subschema-entry
RD report-description-entry
LD keeplist-entry
dd_record-description-entry
clauses
rg_report-group-description-entry
ss_screen-description-entry
miscellaneous_topics
Close Help