ð5 FORMAT-NAME PIC X(ð8) VALUE "EXTIð1ðð".
ð5 FORMAT-NAME-1 PIC X(ð8) VALUE "EXTIð2ðð".
ð5 FORMAT-NAME-2 PIC X(ð8) VALUE "EXMPð1ðð".
ð5 NBR-OF-SELECT-CRITERIA PIC S9(ð9) VALUE ð BINARY.
ð5 CONTINUATION-HDL PIC X(16).
ð5 BASE-POINTER POINTER.
ð5 INFO-POINTER POINTER.
ð5 SPACE-NAME PIC X(2ð) VALUE "RCVVAR QTEMP ".
ð5 SPACE-ATTR PIC X(1ð).
ð5 SPACE-SIZE PIC S9(ð9) VALUE 35ðð BINARY.
ð5 SPACE-VALUE PIC X(ð1) VALUE X"ðð".
ð5 SPACE-AUTH PIC X(1ð) VALUE "\USE".
ð5 SPACE-TEXT PIC X(5ð).
ð5 SPACE-REPLACE PIC X(1ð) VALUE "\NO".
ð5 SPACE-DOMAIN PIC X(1ð) VALUE "\USER".
\
LINKAGE SECTION.
\
\ Variable to hold results of QUSRTVEI. The storage for this
\ variable will be allocated by way of a User Space.
\
ð1 RCVVAR PIC X(35ðð).
\
\ Registration Facility API include. These includes will be
\ mapped over the RCVVAR (User Space) previously defined.
\
COPY QUSREG OF QSYSINC-QLBLSRC.
\
\ Beginning of mainline
\
PROCEDURE DIVISION.
MAIN-LINE.
\
\ Retrieve the exit point information first. If the current
\ number of exit programs is not zero, retrieve the exit
\ programs. It is not necessary to call for the exit point
\ information to determine if the exit point has any exit
\ programs. It is done here for illustrative purposes only.
\ You can make one call to the API for the exit program
\ information and check the number of exit program entries
\ returned field to see if there are any exit programs to call.
\
\ Initialize the error code to inform the API that all
\ exceptions should be returned through the error code parameter.
\
MOVE 16 TO BYTES-PROVIDED OF QUS-EC.
\
\ Create a User Space for RCVVAR.
\
CALL "QUSCRTUS" USING SPACE-NAME, SPACE-ATTR, SPACE-SIZE,
SPACE-VALUE, SPACE-AUTH, SPACE-TEXT,
SPACE-REPLACE, QUS-EC, SPACE-DOMAIN.
\
\ If an exception occurs, the API returns the exception in the
\ error code parameter. The bytes available field is set to
\ zero if no exception occurs and greater than zero if an
\ exception does occur.
\
Appendix B. Original Examples in Additional Languages B-63