Returns the range handle for the match candidate item specified.
Syntax
01 GSID PIC S9(9) BINARY.
01 GSFUNSTAT PIC S9(9) BINARY.
01 INDEX PIC 9(4) BINARY.
01 RANGE-HANDLE PIC S9(9) BINARY.
*
CALL "GSMGH" USING GSID, INDEX, RANGE-HANDLE, GSFUNSTAT.
Arguments
GSID ID returned by GSINITWP for the current instance of GeoStan. Input.
GSFUNSTAT Return value for the procedure. Output.
INDEX Entry number (0-based) of the possible match. Input.
RANGE-HANDLE Range handle for the possible match entry. Output.
Return Values
GS-SUCCESS
GS-ERROR
Prerequisites
GSNMULT
Notes
This procedure can to extract more information about a possible match, then GSMGET. It retrieves the range handle for the possible match indicated by the entry argument. Once you have the correct range handle, you can retrieve information by using GSHGET. For a list of elements returned by GSMGET or GSHGET, see Variables for storing and retrieving data.