Returns properties from the shape object in the form of a string.
Syntax
05 GDL-SHAPE-GET-STR.
10 GDL-SGS-SHAPE PIC S9(09) BINARY.
10 GDL-SGS-TYPE PIC S9(09) BINARY.
10 GDL-SGS-VALUE PIC X(80).
10 GDL-SGS-MAXSIZE PIC S9(09) BINARY.
*
CALL "GDLSGS"
USING GDL-SHAPE-GET-STR, GDL-RETURN-CODE.
Arguments
GDL-SGS-SHAPE
The GDL/zOS shape. Input.
GDL-SGS-TYPE
The type of variable to return. Input.
Constants:
GDL-NAME | The name of the object |
GDL-NAME2 | The secondary name of the object |
GDL-SGS-VALUE
An alphanumeric value in which to place the property value. Output.
GDL-SGS-MAXSIZE
The size of the character array in value. Input.
Return Values
GDL-OK | Success |
GDL-ERROR | An internal error occurred |
Prerequisites
None.
Alternates
None.