EDBI Routines for Generic RDBMS 
Data mapping (any COMP type could be used, mapping is done according to the digits):
PIC X(n)   | CHAR(n)  | 
PIC 9(n)  | NUMERIC(n)  | 
PIC 9(n)V9(m)  | NUMERIC(n+m,m)  | 
PIC S9(n)  | NUMERIC(n)  | 
PIC S9(n)V9(m)  | NUMERIC(n+m,m)  | 
Limitations:
No record lock support.
No check for table existence (OPEN INPUT / I-O)
Peculiar jdbc settings:
None.