Finds first object containing the input point.
Syntax
01 SPOJHANDLE PIC S9(9).
01 LAT-IN PIC S9(9) BINARY.
01 LONG-IN PIC S9(9) BINARY.
01 RADIUS-IN PIC S9(9) BINARY.
01 NAMEOUT PIC X(60).
01 OUTLEN PIC S9(9) BINARY VALUE 60.
01 SPRETCODE PIC S9(9) BINARY.
*
CALL ‘SPOFFCT'
USING SPOJHANDLE, LONG-IN,
LAT-IN, RADIUS-IN, NAMEOUT, OUTLEN.
Arguments
SPOBJHANDLE The handle of the opened object file. Input.
LONG-IN The longitude (in millionths of degrees) or x coordinate defining the input point. Input.
LAT-IN The latitude (in millionths of degrees) or y coordinate defining the input point. Input.
RADIUS-IN The buffer radius or width (in feet) to apply to the features in the object file. To use this parameter, the object file must either contain only point features, or be built with buffering enabled.
Input.
NAMEOUT A buffer to be filled with the identifier of the object in which the point is located. Output.
OUTLEN The size of the buffer that contains the identifier of the object in which the point is located. 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
SPOFOP.
Prerequisites
Alternates
None.
Notes
This procedure gets the primary name of the object that contains the point given. Use
SPOFN to retrieve the next object.
In no object containing input is found, the procedure returns
PIP-NOT-FOUND