PIC X(n)   | VARCHAR(n)  | 
PIC 9(1-2)  | TINYINT  | 
PIC 9(3-4)  | SMALLINT  | 
PIC 9(5-6)  | MEDIUMINT  | 
PIC 9(7-9)  | INT  | 
PIC 9(>9)  | BIGINT  | 
PIC 9(n)V9(m)  | DECIMAL(n+m,m)  | 
PIC S9(n)V9(m)  | DECIMAL(n+m,m)  | 
iscobol.jdbc.autocommit=false  | This is set in order to take a lock if issued. The COBOL program shouldn’t use COMMIT and ROLLBACK statements in order to avoid conflicts with the operations performed by EDBI routines.  | 
iscobol.easydb.commit_count=1  | This is set in conjunction with iscobol.jdbc.autocommit=false in order to update the table at each WRITE, REWRITE and DELETE statement. Otherwise updates would be made only at CLOSE.  | 
iscobol.jdbc.on_stop_run=commit  | Due to the above setting, it’s good practice to instruct the runtime to commit all modifications before exiting.  | 
           EXEC SQL                 EXECUTE IMMEDIATE                 "set innodb_lock_wait_timeout = 0"            END-EXEC  |