Retrieves informational, error, and fatal warning messages for the current thread.
Syntax
01 GSID PIC S9(9) BINARY.
01 ERROR-MESSAGE PIC X(256).
01 DETAILS PIC X(256).
01 GSFUNSTAT PIC S9(9) BINARY.
CALL "GSERRGTX" USING GSID, ERROR-MESSAGE, DETAILS, GSFUNSTAT.
Arguments
GSID ID returned by GSINITWP for the current instance of GeoStan. Input.
ERROR-MESSAGE GeoStan error code and descriptive text. Output.
DETAILS Descriptive message, such as the file name associated with the error. Output.
GSFUNSTAT Return value for the procedure. Output.
Return values
Next GeoStan error detected in the current thread. Upon return, error messages contain a brief description and additional text, such as the name of the file or directory associated with the error.
Prerequisites
GSINITWP
and GSERRHAS