COBOL II and LE COBOL variable mapping record


The COBOL variable mapping record defines the output area of the exit parameter record.

Using this record allows you to easily address the variable definition table. The number of entries in this table (each entry consists of both a variable name and its value) must not exceed 100.

The following is a COBOL II and LE COBOL variable mapping record:

           05  USER-DEFINED-VARILABLE-TABLE OCCURS 100 TIMES.
               10  VARIABLE-NAME             PIC X(9).
               10  VARIABLE-VALUE            PIC X(8).
               10  FILLER REDEFINES VARIABLE-VALUE.
                   15  VARIABLE-PREFIX       PIC X(1).
                   15  VARIABLE-JUL-DATE     PIC X(7).

 The following table describes the COBOL user exit variable mapping record fields:

Field

Description

USER-DEFINED-VARIABLE-TABLE

The table containing user-defined variable information

For details about establishing user-defined variables, see Rules-for-the-user-defined-variables-created-in-LOADPLUS-user-exits.

VARIABLE-NAME

The name of the variable that you are defining

VARIABLE-VALUE

The value of the variable that you are defining

 

 

Tip: For faster searching, add an asterisk to the end of your partial query. Example: cert*