CALL "CBL_FLUSH_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  | todo  | 
       ...        working-storage section.        ...        77 file-handle pic x(4) comp-x.        ...        procedure division.        ...            call "cbl_flush_file" using file-handle.        ...  |