Initializes the Geographic Determination Library/zOS; must be called before any other library procedure.
Syntax
05 GDL-INITIALIZE.
10 GDL-INIT-HANDLE PIC S9(09) BINARY.
10 FILLER PIC S9(09) BINARY.
10 FILLER PIC X(08).
*
CALL "GDLINIT"
USING GDL-INITIALIZE, GDL-RETURN-CODE.
Arguments
GDL-INIT-HANDLE
Pointer to a gdlHandle. Output.
GDL-INIT-NUMBER
Unused.
GDL-INIT-LICENSE-DDNAME
Unused.
Note: z/OS users, fill with low-values.
Return Values
GDL-OK | Success |
Prerequisites
None.
Alternates
None.
Notes
This should be the first procedure called. Call GDLTERM when finished with gdlHandle.