HP 3000 Manuals

Index [ HP COBOL II/XL Programmer's Guide ] MPE/iX 5.0 Documentation


HP COBOL II/XL Programmer's Guide

Index

A
    address alignment trap   
    addresses
       data item   
    ADD statement enhancement   
    alignment
       data   
       parameter   
    ALPHABETIC-LOWER class test   
    ALPHABETIC-UPPER class test   
    ALPHABET keyword   
    ALTER statement
       nonobsolete alternative to   
    American National Standards Institute (ANSI)   
    ANSI74
       entry point   
       vs ANSI85   
    ANSI'74 COBOL   
    ANSI85
       entry point   
       features   
       incompatible features   
       new features   
       obsolete features   
    ANSI'85 COBOL   
    ANSI85 features
       ADD statement enhancement   
       ALPHABETIC-LOWER class test   
       ALPHABETIC-UPPER class test   
       BINARY USAGE data item format   
       CALL BY CONTENT   
       CLASS clause   
       DATA DIVISION   
       de-editing   
       ENVIRONMENT DIVISION   
       FILLER   
       IDENTIFICATION DIVISION   
       INITIAL clause   
       INITIALIZE statement   
       INSPECT CONVERTING statement   
       PACKED-DECIMAL USAGE data item format   
       PROCEDURE DIVISION   
       reference modification   
       relational operators   
       REPLACE statement   
       Setting condition names   
       Setting switches   
       structured programming   
       SYMBOLIC CHARACTERS clause   
       table initialization   
    ANSI (American National Standards Institute)   
    ANSISORT control option   
    ANSISUB
       control option   
       option   
       subprogram   
    appending records to files   
    area A, B   
    argument descriptor fields   
    ASCII digit replacement
       signed   
       unsigned   
    ASCII files as source program input   
    ASSIGN clause   
    associating logical and physical files   
    AUTHOR paragraph
       nonobsolete alternative to   

B
    basic block optimization   
    BINARY USAGE data item format   
    binding
       COBOL subprograms   
       compile-time   
       execution-time   
       link-time   
       load-time   
    BLOCK CONTAINS clause   
    blocked files   
    BOUNDS control option   
    branch optimization   
    buffers, file system   
    BUILD command   

C
    calculating code addresses   
    calculating data item addresses   
    call binding
       COBOL subprograms   
       compile-time   
       execution-time   
       link-time   
       load-time   
    call by content   
    CALL BY CONTENT   
    call by reference   
    call by value   
    CALLINTRINSIC control option   
    call rules for compile-time bound subprograms   
    CALL statement   
    CANCEL statement   
    carriage control   
    CCTL in ASSIGN clause   
    CHECKSYNTAX control option   
    chunked program, maps example   
    chunk names   
    chunks
       names   
       verb maps   
    circular files   
    CLASS clause   
    CLOSE WITH NO REWIND statement   
    CMCALL control option   
    COB74XL command   
    COB85XL command   
    COBCAT.PUB.SYS   
    COBCNTL.PUB.SYS   
    COBOL subprograms   
       ANSISUB   
       call binding   
       DYNAMIC   
       SUBPROGRAM   
    COBRUNTIME variable   
    code address calculation   
    CODE control option   
    CODE-SET clause   
    coding heuristics   
    command files   
    COMMON clause   
    Compatibility Mode   
    Compatibility Mode UDCs   
    compiler entry points   
    compiler limits   
    compiler listing
       example for unchunked program   
       for debugging   
    compiler modes   
    compile-time call binding   
       call rules   
       terminology   
    compile-time messages   
       classes   
    compiling your program   
       ANSI74 vs ANSI85   
       command files   
       Compatibility Mode UDCs   
       RUN command   
       source program input   
    concatenated program
       example   
       maps example   
    CONTINUE statement   
    control file   
    control options   
       CALLINTRINSIC   
       debugging   
       interprogram communication   
       listing   
       migration   
       miscellaneous   
       OPTFEATURES=LINKALIGNED[16]   
       performance   
       run-time efficiency   
       standard conformance   
       SYNC16   
       SYNC32   
    control-Y traps example   
    cross-development   
    CROSSREF control option   
    C subprograms   

D
    data alignment   
    DATA DIVISION
       ANSI85 features   
    data item format, PACKED-DECIMAL usage   
    data items
       calculating addresses of   
       EXTERNAL   
       GLOBAL   
       GLOBAL-and-EXTERNAL   
    DATA MEMORY PROTECTION error message   
    DATA RECORDS clause
       nonobsolete alternative to   
    data validation   
    DATE-COMPILED paragraph
       nonobsolete alternative to   
    DATE-WRITTEN paragraph
       nonobsolete alternative to   
    dead code elimination   
    DEBUG control option   
    debugging   
       compiler limits   
       control options   
       messages   
       options   
       symbolic debugger   
       using compiler listings   
    debugging traps   
       address alignment   
       illegal digit   
       invalid GO TO   
       no size error   
       PERFORM stack overflow   
       range error   
       trace traps   
    debug module
       nonobsolete alternative to   
    Debug system debugger   
       calculating code addresses   
       calculating data item addresses   
       debugging traps   
       link map   
       maps example   
       register meanings   
       subprogram parameters   
       symbol table map   
       verb map   
    de-editing   
    deleting records   
    delimited scope statements   
    DIFF74 control option   
    digit replacement
       signed   
       unsigned   
    direct containment   
    disastrous error messages   
    dummy records   
    duplicate keys   
    DYNAMIC
       control option   
       option   
       subprogram   
    dynamic access   
       indexed files   

E
    END PROGRAM header   
    ENTER statement
       nonobsolete alternative to   
    entry points
       compiler   
    ENVIRONMENT DIVISION
       ANSI85 features   
    error messages
       run-time   
    ERRORS control option   
    EVALUATE statement   
    executable code   
    executing your program   
    execution-time call binding   
    EXIT PROGRAM statement   
    explicit scope terminators   
    exponentiation   
    extended blocks   
    extend open mode   
    EXTEND phrase   
    EXTERNAL data items and files
       FORTRAN subprograms   
       multilanguage example   
    EXTERNAL files
       CCTL in ASSIGN clause   
       L in ASSIGN clause   
    EXTERNAL items   
       in symbol table map   
       sharing   
    external names   
    external naming convention   

F
    Federal Standard COBOL   
    FILE command   
    file equations   
    file number   
    files
       appending to   
       associating logical and physical   
       attributes   
       blocked   
       control   
       error handling   
       EXTERNAL   
       fixed attributes   
       GLOBAL   
       GLOBAL-and-EXTERNAL   
       indexed   
       KSAM (indexed)   
       logical   
       multiple   
       non-ASCII   
       overwriting   
       physical   
       portability   
       random access   
       relative organization   
       sequential organization   
       temporary physical   
       updating   
    FILE STATUS clause   
    file status codes   
       incompatible   
       portability   
    file system buffers   
    FILLER   
    floating point value   
    FORTRAN 77
       functions   
       subprograms   
    FORTRAN subprograms
       EXTERNAL data items and files   
    functions
       FORTRAN 77   
       Pascal   

G
    generic keys   
    GLOBAL
       data   
       data items and files   
    GLOBAL-and-EXTERNAL data items and files   
    GLOBAL files
       CCTL in ASSIGN clause   
       L in ASSIGN clause   
    GLOBAL items   
       SPECIAL-NAMES paragraph   

H
    hashing algorithms   
    heuristics   
    HP extensions   
    HPSQL   
    HP System Dictionary/XL   See System Dictionary/XL
    HP Toolset/XL   See Toolset/XL
    HP TOOLSET/XL   

I
    IDENTIFICATION DIVISION
       ANSI85 features   
    illegal digit trap   
    implementation-defined features   
    incompatible features   
       ALPHABET keyword   
       CANCEL statement   
       exceptions   
       EXIT PROGRAM statement   
       exponentiation   
       file status codes   
       OCCURS clause   
       READ NEXT after OPEN I-O and WRITE statements   
       STOP RUN statement   
       VARYING...AFTER phrase in PERFORM statement   
    INDEX16 control option   
    INDEX32 control option   
    indexed files   
       creating   
       duplicate keys   
       dynamic access   
       generic keys   
       how to code   
       random access   
       sequential access   
    indirect containment   
    indirection operator   
    informational messages   
    INITIAL clause   
    INITIALIZE statement   
    initializing data   
    INITIAL option   
    in-line PERFORM statements   
    input open mode   
    input-output
       error handling   
       errors   
       open mode   
       sequential files   
    inserting records in files   
    INSPECT CONVERTING statement   
    INSTALLATION paragraph
       nonobsolete alternative to   
    instruction scheduling   
    internal names   
    interprogram communication options   
       OPTFEATURES   
    intrinsic file   
    intrinsics   
       parameter checking   
    INVALID ADDRESS error message   
    invalid ASCII digit replacement
       signed   
       unsigned   
    invalid GO TO trap   

J
    JCW   
    job control word   
    job stream
       inputting source program from   

K
    key-assigning procedure   
    keys
       duplicate   
       generic   
    KSAM files (indexed files)   

L
    labelled tapes   
    LABEL RECORDS clause
       nonobsolete alternative to   
    libraries
       subprogram   
    L in ASSIGN clause   
    LINES control option   
    linking your program   
    link map   
    link-time call binding   
    LIST control option   
    listing
       compiler   
       options   
    load-time call binding   
    locality set names   
    LOCKING control option   
    LOCOFF control option   
    LOCON control option   
    logical files   
       associating with physical files   
       variable records   

M
    MAP control option   
    maps example
       chunked program   
       concatenated program   
       nested program   
    MEMORY-SIZE clause
       nonobsolete alternative to   
    message files   
    messages   
       compile-time   
       run-time   
    migration options   
    millicode routines   
    miscellaneous options   
    MIXED control option   
    modes
       compiler   
    module names   
    MPE special files
       circular   
       message files   
       print files   
    multiple files on labelled tapes   
    MULTIPLE FILE TAPE clause   
       nonobsolete alternative to   

N
    names
       external   
       internal   
    Native Mode   
    nested programs   
       hierarchy   
       maps example   
    NOCODE control option   
    NOCROSSREF control option   
    NODEBUG option   
    NOLIST control option   
    NOMAP control option   
    NOMIXED control option   
    non-ASCII files   
    non-COBOL subprograms   
       C   
       FORTRAN 77   
       Pascal   
       SPL   
    non-GLOBAL data items with same names   
    nonstandard warnings   
    no size error trap   
    NOSOURCE control option   
    NOSTDWARN control option   
    NOT phrases   
    NOVALIDATE control option   
    NOVERBS control option   
    NOWARN control option   

O
    obsolete features   
    OCCURS clause   
    ON EXCEPTION phrase   
    ON OVERFLOW phrase   
    OPEN I-O statement   
    open modes
       extend   
       input   
       input-output   
       output   
    OPEN statement
       EXTEND phrase   
    OPTFEATURES=CALLALIGNED[16] control option   
    OPTFEATURES=LINKALIGNED[16] control option   
    OPTFEATURES option   
    OPTIMIZE control option   
    optimizer   
       transformations   
       when to use   
    options
       control   
    outermost programs   
    output open mode   
    overwriting files   

P
    PACKED-DECIMAL USAGE data item format   
    parameter checking   
       number   
       type   
    parameter passing
       by content   
       BY CONTENT   
       by reference   
       by value   
    parameters
       alignment   
       number   
       type   
    Pascal functions   
    Pascal subprograms   
    peephole optimization   
    performance options   
    PERFORM enhancements   
    PERFORM stack overflow trap   
    PERFORM statement
       VARYING...AFTER phrase in   
    physical files   
       associating with logical files   
    portability   
       between HP and non-HP machines   
       between HP machines   
       cross-development   
       file   
       file status codes   
       HP extensions   
       programs   
    print files   
    PROCEDURE DIVISION
       ANSI85 features   
    program
       source input   
       unique names   
    programming practices   
       portability   
       run-time efficiency   
       structured programming   
    pseudo-text   

Q
    questionable error messages   
    QUOTE control option   

R
    random access   
       indexed files   
    random access files   
       accessed sequentially   
       how to code them   
       key-assigning procedure   
    range error trap   
    READ NEXT statement
       after OPEN I-O, WRITE, REWRITE   
    real numbers   
    RECORD IS VARYING clause   
    recursion   
    reference modification   
    register meanings   
    relational operators   
    relative organization files   
       how to code   
    REPLACE statement   
    replacing invalid ASCII digits
       signed   
       unsigned   
    RERUN clause
       nonobsolete alternative to   
    RESERVE clause   
    RETURN-CODE special register   
    REVERSED phrase
       nonobsolete alternative to   
    REWRITE statement   
    RLFILE control option   
    RLINIT control option   
    RUN command   
    run-time efficiency   
       coding heuristics   
       control option effects   
       optimizer   
    run-time error messages   
       input-output errors   
       traps   

S
    same names for non-GLOBAL data items   
    SAVE command   
    SECURITY paragraph
       nonobsolete alternative to   
    separately compiled programs   
    sequential access
       indexed files   
    sequential organization   
    sequential organization files   
       accessed randomly   
       circular   
       how to code   
       message files   
       print files   
    serious error messages   
    Setting condition names   
    Setting switches   
    SOURCE control option   
    source program input   
       ASCII file   
       job stream   
       $STDIN file   
       terminal   
       TSAM file   
    SPECIAL-NAMES paragraph   
    SPL subprograms   
    standard COBOL format   
    standard conformance options   
    STAT74 control option   
    status codes   
    $STDIN file
       inputting source program through   
    STDWARN control option   
    STOP LITERAL statement
       nonobsolete alternative to   
    STOP RUN statement   
    structured programming   
       COMMON clause   
       CONTINUE statement   
       END PROGRAM header   
       EVALUATE statement   
       explicit scope terminators   
       GLOBAL data   
       GLOBAL data items and files   
       nested programs   
       NOT phrases   
       PERFORM statement enhancements   
       SPECIAL-NAMES paragraph   
       USE GLOBAL AFTER ERROR PROCEDURE ON statement   
    SUBPROGRAM control option   
    subprogram libraries   
    SUBPROGRAM option   
    subprogram parameters
       finding with Debug   
    subprograms   
       COBOL   
       non-COBOL   
       parameter checking   
       parameter passing   
    SUBPROGRAM subprogram   
    substrings   
    SWAT (Switch Assist Tool)   
       example   
    switch stubs   
    SYMBOLIC CHARACTERS clause   
    symbolic debugger   
    symbol table map   
    SYMDEBUG control option   
    SYNC16 control option   
    SYNC32 control option   
    SYSINTR.PUB.SYS   
    system debugger Debug   
    System Dictionary/XL   
    system traps
       DATA MEMORY PROTECTION   
       INVALID ADDRESS   

T
    table initialization   
    temporary physical files   
    terminal
       inputting source program from   
    terminal input-output   
    TEST AFTER   
    TEST BEFORE   
    Toolset/XL   
    TOOLSET/XL   
    trace traps   
    transformations   
    traps   
       debugging   
       system   
    TSAM files
       as source program input   
    TurboIMAGE/XL   

U
    uniqueness of program names   
    unsigned ASCII digits
       invalid   
    updating files   
    updating records   
    USE GLOBAL AFTER ERROR PROCEDURE ON statement   
    USE procedures
       hierarchy   
    USLINIT control option   

V
    VALIDATE control option   
    validation of data   
    VALUE OF clause   
       nonobsolete alternative to   
    value pairs
       limit   
    variable length records
       applications   
    variable record files   
    variable records   
       reading   
       specifying   
       terminal input-output   
    VARYING...AFTER phrase
       in PERFORM statement   
    verb map   
    VERBS control option   

W
    WARN control option   
    warnings   
    WRITE statement   

X
    XCONTRAP example   



MPE/iX 5.0 Documentation