Returns details about most recent error.
Syntax
01 SPHANDLE PIC S9(9) BINARY.
01 ERRMSG PIC X(128).
01 ERRDET PIC X(128).
01 SPRETCODE PIC S9(9) BINARY.
*
CALL ‘SPERRGET'
USING SPHANDLE, ERRMSG, ERRDET, SPRETCODE.
Arguments
SPHANDLE The valid handle returned by SPINIT for the current instance of Spatial+. Input.
ERRMSG A string buffer where the error message will be placed. Output.
ERRDET A string buffer where details about the error message will be placed. Output.
Return Values
1-99
PIP-ERROR-INVALID-HANDLE PIP-ERROR-UNCLASSED
PIP-ERROR-UNKNOWN PIP-ERROR-BAD-FILE PIP-ERROR-LIMIT
PIP-ERROR-MEMORY PIP-ERROR-NOT-FOUND PIP-ERROR-ARGUMENT PIP-ERROR-EXPIRED PIP-ERROR-LICENSE 109-199
Prerequisites
None.
Alternates
None.
Notes
Be sure to allocate string space of at least 256 bytes for both ERRMSG and ERRDET.