CALL "C$CALLERR" USING errorCode [errorMessage] |
errorCode | PIC X(2) | It's the error code, it receives the value "01". |
errorMessage | PIC X(n) | Optional, It receives a descriptive message about the error encountered. |
working-storage section. 77 err-code pic x(2). 77 err-text pic x(256). ... procedure division. ... call "program-not-exist" on exception call "c$callerr" using err-code, err-text. |