CALL "C$CONFIG" USING CCONFIG-RESET                       [newConfigurationFile]                 GIVING returnCode  | 
CCONFIG-RESET  | Constant   | |
newConfigurationFile  | PIC X(n)   | Optional. Specifies the name of a configuration file to be used after resetting the current configuration. Relative pathnames are resolved according to the Framework’s working directory.  | 
0  | Operation successful.  | 
-1  | Operation failed as the configuration file couldn’t be opened.  |