Finds the next object for any SPOFF* procedure.
Syntax
01 SPOBJHANDLE PIC S9(9) BINARY.
01 NEAREST-OUT PIC X(60).
01 OUTLEN PIC S9(9) BINARY VALUE 60.
01 SPRETCODEPIC S9(9) BINARY.
-
CALL ‘SPOFN'
USING SPOBJHANDLE, NEAREST-OUT, OUTLEN, SPRETCODE.
Arguments
SPOBJHANDLE The handle of the opened object file. Input.
NEAREST-OUT A buffer to be filled with the identifier of the object that is found.
Output.
OUTLEN The size of the buffer that contains the identifier of the object that is found. If the buffer size is smaller than the identifier, the identifier is truncated. Input.
Return Values
PIP-ERROR
PIP-NOT-FOUND PIP-IN-POLYGON PIP-IN-BUFFER PIP-IN-BORDER PIP-OK
PIP-REGION-OVERLAP
Prerequisites
SPOFFCT, SPOFFNM, SPOFFNR, SPOFFPG, or SPOFFREC.
Alternates
None.
Notes
This procedure returns the identifier of a polygon or buffered area that contains a point. This point was identified by SPOFFCT, SPOFFPG, or SPOFFREC.
This procedure also returns the identifier of the object that matches the name pattern given by SPOFFNM.
If no additional objects found, the procedure returns PIP-NOT-FOUND.