Retrieves the data in the GSA attribute file based on the name of the attribute.
Syntax
01 SPHANDLE PIC S9(9) BINARY.
01 FIELDNAME PIC S9(9) BINARY.
01 INFO.
02 NAME PIC X(12).
02 VALUE PIC X(256).
02 LENGTH PIC S9(9) BINARY.
02 TYPE PIC S9(9) BINARY.
02 DECIMALS PIC S9(9) BINARY.
01 SPRETCODE PIC S9(9) BINARY.
*
CALL 'SPATIBNM' USING SPHANDLE, FIELDNUMBER,
NAME, BUFSIZE, SPRETCODE.
Arguments
SPHANDLE The file handle of the opened object file. Input. FIELDNAME The field name in the attribute (GSA) file. Input.
INFO The INFO structure containing the information about the attribute.
Output.
Return Value
PIP-OK PIP-ERROR
PIP-NOT-FOUND
Prerequisites
SPOFOP
Alternates
None.
Notes
The SPATIBNM function uses INFO as a data structure to hold information about the specified attribute.
Example
The INFO structure holds the following file information:
Field Description
02 NAME PIC X(12). Field name
02 VALUE PIC X(256). Field value
02 LENGTH PIC S9(9) BINARY. Field length
02 TYPE PIC S9(9) BINARY. Field type: CHARACTER=67,
NUMERIC=78.
02 DECIMALS PIC S9(9) BINARY. If numeric, are there any decimals?