Formats a LACSLink false positive detail record from GSLACGFH.
Syntax
01 GSID PIC 9(9) BINARY.
01 GS-FALSE-POS-DETAIL-DATA
01 RETURN-CODE PIC 9(9) BINARY.
01 HEADER PIC X(len).
01 HEADER-SIZE PIC 9(9) BINARY VALUE len.
CALL "GSLACFPD" USING GSID, GS-FALSE-POS-DETAIL-DATA, GS-FPHD-SIZE, HEADER, HEADER-SIZE, RETURN-CODE
Arguments
GS ID returned by GSINITWP for the current instance of GeoStan. Input.
GS-FALSE-POS-DETAIL-DATA Pointer to the LACSLink report data structure. This value is completed by GSLACGFD. Input.
RETURN-CODE Size of the LACSLink report data structure. Input.
HEADER Buffer containing the LACSLink false positive header after GSLACFPD successfully completes. When the GeoStan application writes the false positive report, it writes this buffer to the last line of the file. Output.
HEADER-SIZE Length of the detail buffer. Input.
Return Values
GS-SUCCESS
GS-ERROR Call GSERRGTX for more information.
GS-WARNING Call GSERRGTX for more information.
Prerequisites
GSLACGFD