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