CALL "CBL_GET_SCR_SIZE" USING screenDepth                                 screenWidth                         GIVING returnCode   | 
screenDepth  | PIC X COMP-X  | Returns the number of lines in the screen.  | 
screenWidth  | PIC X COMP-X  | Returns the number of columns in the screen.  | 
0  | Operation successful.  | 
1   | Operation failed.  | 
call "cbl_get_scr_size" using depth, width.  |