CALL "CBL_CLOSE_FILE" USING fileHandle                       GIVING returnCode  | 
fileHandle  | PIC X(4) COMP-X  | A handle returned from CBL_OPEN_FILEor CBL_CREATE_FILE.                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              | 
0  | Operation successful.  | 
>0  | Operation failed, the return code must be processed as file status.  | 
       ...        working-storage section.        ...        77 file-handle pic x(4) comp-x.        ...        procedure division.        ...            call "cbl_close_file" using file-handle.        ...  |