Finds first object's mbr overlapping the search rectangle.
Syntax
01 SPOBJHANDLE PIC S9(9) BINARY.
01 LAT1 PIC S9(9) BINARY VALUE 40041884.
01 LONG1 PIC S9(9) BINARY VALUE -105255478.
01 LAT2 PIC S9(9) BINARY VALUE 40141884.
01 LONG2 PIC S9(9) BINARY VALUE -105366000.
01 NAME-OUT PIC X(60).
01 OUTLEN PIC S9(9) BINARY VALUE 60.
01 SPRETCODE PIC S9(9) BINARY.
-
CALL ‘SPOFFREC'
USING SPOBJHANDLE, LAT1,
LONG1, LAT2, LONG2, NAME-OUT, OUTLEN, SPRETCODE.
Arguments
SPOBJHANDLE The handle of the opened object file. Input.
LONG1, LAT1 The lower left corner of the rectangle to search. Input.
LONG2, LAT2 The upper right corner of the rectangle to search. Input.
NAME-OUT A buffer to be filled with the identifier of the overlapping object.
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-OK
SPOFOP.
Prerequisites
Alternates
None.
Notes
This procedure returns the identifier of the first object that overlaps the given rectangle. Use SPOFN to retrieve the next object.
If no MBR found to overlap input search rectangle, the procedure returns
PIP-NOT-FOUND.
Note that the test used in this search is an MBR (Minimum Bounding Rectangle) overlap test. It is possible to return a polygon which does not actually intersect the search object, as shown below. Thus, SPOFFREC may return a set of points which are not contained within the search rectangle.