The PICTURE and VALUE clauses for (1) the record passed from MFX, (2) the record WORK area, and (3) the record in the output buffer are application-specific.
-
For the first definition (EXIT-STATUS) specify PIC 9(8) COMPUTATIONAL. When using 88 levels to define exit status codes, specify values 00, 04, and 08.
-
For the second definition (RECORD-UP) define the record leaving Phase 3.
-
For the third definition (WORK) define the record that MFX is to put in the output data set. This is the "work" area.
-
For the fourth definition (IN-BUF) define the record in the output data set.
-
For the fifth definition define a dummy area with PIC X(4).
-
For the sixth through the eighth definition define dummy areas.
-
For the ninth definition (COMM-LEN) specify PIC 9(4) COMPUTATIONAL. This area defines the communication area length.
-
For the tenth definition (COMMUNICATION-AREA) code an OCCURS clause DEPENDING ON data-name PIC X.