Returns the version number of the Spatial+ library.
Syntax
01 VERSTRING PIC X(128).
01 BUFSIZE PIC S9(9) BINARY VALUE 128.
01 SPRETCODE PIC S9(9) BINARY.
*
CALL ‘SPGETV'
USING VERSTRING, BUFSIZE, SPRETCODE.
Arguments
VERSTRING A buffer for the version string. Output. BUFSIZE Length of the buffer. Input.
Return Values
PIP-OK
Prerequisites
None.
Alternates
None.
Notes
SPGETV returns the current version number of the Spatial+ library in the following format:
Spatial+/390 v#.#
where #.# is the version number, for example, Spatial+/390 v22.03.