CALL "C$FORNAME" USING className                        [exceptionMessage]                 GIVING returnCode  | 
className  | PIC X(n)   | Specifies the name of the class to be searched.  If the class is included in a package, the package name should be specified as well.  The value of this parameter is case sensitive.  | 
exceptionMessage  | PIC X(n)   | This optional parameter receives the Java exception behind a "class not found" error or spaces if the class was correctly found.  | 
0   | The class is available.  | 
1   | Class not found.  | 
call "c$forname" using "oracle.jdbc.OracleDriver" if return-code = 0    display message "Oracle JDBC driver is available" else    display message "Oracle JDBC driver not available" end-if  |