Information about the object being debugged
You can use the AID command
%D[ISPLAY] {_COMPILER | _COMPILATION_DATE | _COMPILATION_TIME | _PROGRAM_NAME}
to call up general information on the object being debugged:
| the compiler that compiled the object |
| the date of compilation |
| the time of compilation |
| ID name of the object |
| Name of the EBCDIC variant which is assumed in the case of conversions between alphanumeric and national data |
Information about the exception condition
You can use the AID command
%D[ISPLAY] _LAST_EXCEPTION
to request general information on the last exception condition.
Format of the output:
01 _LAST-EXCEPTION.
02 _EXCEPTION_NAME PIC X(31).
| Name of the exception condition which has led to the exception condition (blank if no exception condition exists). |