CALL "C$FULLNAME" USING fileName fullName [fileInfo] GIVING returnCode |
fileName | PIC X(n) | Specifies the name of the file. This should either be a full path name or a name relative to the current directory. |
fullName | PIC X(n) | Receives the full path of fileName. If FILE-PREFIX includes paths starting with "isf://" and the file is found on the specified File Server, a name in the form "isf://servername[:port]:/path/to/file" is returned. See The ISF protocol for more information. |
fileInfo | Group Item | Receives the file information. It must have the following structure: 01 fileInfo. 03 fileSize pic x(8) comp-x. 03 fileDate pic 9(8) comp-x. 03 fileTime pic 9(8) comp-x. fileSize Size of the file. fileDate Date of the file, in YYYYMMDD format. fileTime Time of the file. |
0 | Operation successful, file found. |
1 | An error occurred, file not found. |
call "c$fullname" using "customers.dat" fullname display fullname *> The value displayed could be : c:\myapp\data\customers.dat |