Finds next object for any SPOFFPX procedure and calculates the percentage of the input region overlapped by the returned region in the object file if SPOFFPG was used.
Syntax
01 SPOBJHANDLE | PIC S9(9) BINARY. | |
01 NAME-OUT | PIC X(60). | |
01 NAME-SIZE | PIC S9(9) BINARY. | |
01 NUMINCREME | NTS | PIC S9(9) BINARY. |
01 PERCENTAGE COMP-2.
01 SPRETCODE PIC S9(9) BINARY.
-
CALL ‘SPOFNX'
USING SPOBJHANDLE, NAME-OUT,
NAME-SIZE, NUMINCREMENTS, PERCENTAGE, SPRETCODE.
Arguments
SPOBJHANDLE The handle of the opened object file. Input.
NAME-0UT A buffer to be filled with the identifier of the object that is found.
Output.
NAME-SIZE 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.
NUMINCREMENTS Number of increments used in the overlap percentage calculation. Input.
PERCENTAGE Calculated overlap percentage. Output.
Return Values
PIP-ERROR
PIP-NOT-FOUND PIP-IN-POLYGON PIP-IN-BUFFER
PIP-IN-BORDER PIP-OK
PIP-REGION-OVERLAP PIP-OBJECT-IN-INPUT
PIP-OBJECT-EQUALS-INPUT
SPOFFPX.
Prerequisites
Alternates
None.
Notes
If the number of increments is greater than 0 and the percentage is not NULL, this procedure computes the percentage of the input region overlapped by the region in the spatial file. The accuracy and precision of the calculation increases as the number of increments is increased. Note that increasing the number of increments also increases processing time.
If no additional objects are found, the procedure returns PIP-NOT-FOUND.