|
VMS Help COBOL, IDENTIFICATION_DIVISION *Conan The Librarian |
The IDENTIFICATION DIVISION marks the beginning of a COBOL program. It
also identifies a program and its source listing.
Format -
IDENTIFICATION DIVISION.
PROGRAM-ID. program-name [IS {| INITIAL |} PROGRAM ][WITH IDENT id-str] .
[ {| COMMON |} ]
[ AUTHOR. [comment-entry] ... ]
[ INSTALLATION. [comment-entry] ... ]
[ DATE-WRITTEN. [comment-entry] ... ]
[ DATE-COMPILED. [comment-entry] ... ]
[ SECURITY. [comment-entry] ... ]
[ OPTIONS. [ARITHMETIC {NATIVE|STANDARD}.] ]
Additional Information (explode) :
|
|