Allows you to select a match from a set or match candidates.
Syntax
01 GSID PIC S9(9) BINARY.
01 GSFUNSTAT PIC S9(9) BINARY.
01 INDEX PIC 9(4) BINARY.
*
CALL "GSSETSEL" USING GSID, INDEX, GSFUNSTAT.
Arguments
GSID ID returned by GSINITWP for the current instance of GeoStan. Input.
GSFUNSTAT Return value for the procedure. Output.
INDEX Index number (0-based) of the possible match. Input.
Return Values
GS-SUCCESS
GS-ERROR
Prerequisites
GSMGET
Notes
After GSFINDWP returns GS-ADDRESS-NOT-RESOLVED, use GSNMULT and GSMGET to determine which possible match is the correct match. Then use GSSETSEL to load that possible match into the data retrieval buffers and retrieve it using GSDATGET.
This procedure returns GS-ERROR if the selection is out of range.