CBL_FLUSH_FILE
The CBL_FLUSH_FILE library routine ensures all file buffers for a file are written to disk.
Syntax:
 CALL "CBL_FLUSH_FILE" USING fileHandle
                      GIVING returnCode
 
Parameters:
fileHandle
PIC X(4) COMP-X
A handle returned from CBL_OPEN_FILEor CBL_CREATE_FILE.
Return code:
returnCode can be any numeric data item and provides additional information:
0
Operation successful.
>0
todo
Examples:
Example - Flush a previously opened byte-stream
       ...
       working-storage section.
       ...
       77 file-handle pic x(4comp-x.
       ...
       procedure division.
       ...
           call "cbl_flush_file" using file-handle.
       ...