VMS Help  —  COBOL  PROCEDURE_DIVISION, 1format_declaratives
  The Procedure Division contains the routines that process the files and
  data described in the Environment and Data Divisions.

  Format 1 -

  [ PROCEDURE DIVISION  [ USING {data-name} ... ]  [ GIVING identifier ] .

  [ DECLARATIVES.
  { section-name SECTION [ segment-number ] . declarative-sentence
  [ paragraph-name. [sentence] ... ] ... } ...
   END DECLARATIVES. ]

  { section-name SECTION [ segment-number ] .
  [ paragraph-name. [sentence] ... ] ... } ... ]
Close Help