C$FSCOPY
The C$FSCOPY library routine copies an indexed file by invoking the proper file handler functions.
The configuration properties iscobol.file.index and iscobol.file.index.FileName specify which file handler is used.
This routine is particularly suitable for copying files that reside on a remote file server like c-tree. In order to copy files on the local machine, C$COPY routine should be used instead.
Note - this routine is not thread safe. Calling multiple instances of C$FSCOPY simultaneously in the same runtime session may lead to unexpected errors.
Syntax:
 CALL "C$FSCOPY" USING inputFile 
                       outputFile
                GIVING returnCode
Parameters:
inputFile
PIC X(n)
Specifies the name of the indexed file to be copied.
 
The name is passed to the indexed file handler APIs so it must be suitable for them. For example, if the file handler is c-tree, avoid the "dat" extension.
outputFile
PIC X(n)
Specifies the name of the indexed file to be created.
The name is passed as is to the file handler.
Return code:
returnCode can be any numeric data item and provides additional information:
0
Operation successful.
1
An error occurred.
Examples:
Example - Make a backup copy of an indexed file
*> define retCode as pic s9(2)
 
call "c$fscopy" using "cust"
                      "cust_bk"
               giving retCode
if retCode not = 0
   display message "File backup has failed"
end-if