CDESKTOP-EDIT
The CDESKTOP-EDIT function opens a file with the associated editor, so the user can edit the file.
Syntax:
 CALL "C$DESKTOP" USING CDESKTOP-EDIT 
                        fileName
                       [csFlag]
                 GIVING returnCode
Parameters:
CDESKTOP-EDIT
Constant
 
fileName
PIC X(n)
Specifies the name of the file to open. It can be either a relative or a full pathname.
csFlag
PIC 9
Optional parameter evaluated in thin client environment. If it is set to 1, the file is edited on the client, otherwise it is edited on the server.
 
In order to edit the file on the client, the routine creates a temporary copy of the file on the client machine, then it opens it with the associated editor.
 
Set this flag to 1 only if the file resides on the server and you want to edit it on the client. If the file reside on the client, call C$DESKTOP with CALL CLIENT statement and omit this flag.
Return code:
returnCode can be any signed numeric data item and provides additional information:
0
Operation successful.
-1
Unsupported operation or routine not supported in this context. This is returned for example if the routine is called in webDirect environment.
-2
Invalid or missing parameters.
-3
I/O error. This is returned for example when the file is not found.
-4
A Security exception occured.