Your Browser is not longer supported

Please use Google Chrome, Mozilla Firefox or Microsoft Edge to view the page correctly
Loading...

{{viewport.spaceProperty.prod}}

Predefined information

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:

_Compiler

the compiler that compiled the object

_Compilation_Date

the date of compilation

_Compilation_Time

the time of compilation

_Program_Name

ID name of the object

_EBCDIC_CCSN

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).

_EXCEPTION_NAME

Name of the exception condition which has led to the exception condition (blank if no exception condition exists).