CALL "C$FSFULLNAME" USING fileName                             fullName                     GIVING returnCode  | 
fileName  | PIC X(n)   | Specifies the name of the file.  | 
fullName   | PIC X(n)   | Receives the full path of fileName.  | 
0   | Operation successful, file found.  | 
1   | An error occurred, file not found.  | 
call "c$fsfullname" using "customers" fsfullname display fsfullname *> The value displayed could be : c:\myapp\data\customers *> This value is possible if for instance, the c:\myapp\data *> path is included in the iscobol.file.prefix runtime property  |