IS$SQLADR
The IS$SQLADR library routine allows you to get the addresses of data buffers that store input and output values. You store the addresses in a bind or select SQLDA so that the JDBC driver knows where to read bind-variable values or write select-list values.
This routine is equivalent to the Oracle’s SQLADR routine. If you’re transitioning from Pro*COBOL and your programs are calling SQLADR, set iscobol.oracle.sqlcall.internal=true in the configuration, and the runtime will automatically call IS$SQLADR instead of SQLADR.
Syntax:
 CALL "IS$SQLADR" USING buffer
                        address
Parameters:
buffer
PIC S9(4) COMP or PIC X(n) depending on the SQLDA field
The data buffer that stores the value or name of a select-list item, bind variable, or indicator variable.
address
PIC S9(4) COMP or PIC X(n) depending on the SQLDA field
Integer variable that returns the address of the data buffer.
Examples:
Example - use IS$SQLADR to initialize the select descriptor tables SELDV, SELDH-VNAME and SELDI
 ...
    PERFORM INIT-SELDSC
            VARYING i FROM 1 BY 1 UNTIL i > SQLDNUM IN SELDSC.
 ...
 INIT-SELDSC.
    CALL "IS$SQLADR" USING SEL-DV(i), SELDV(i).
    CALL "IS$SQLADR" USING SEL-DH-VNAME(i), SELDH-VNAME(i).
    CALL "IS$SQLADR" USING SEL-DI(i), SELDI(i).