CALL "CBL_CHANGE_DIR" USING pathName GIVING returnCode |
pathName | PIC X(n) | Specifies the new current directory. Must be terminated by space or low-value. |
0 | Operation successful. |
14605 | Not found. |
*> define new-dir as pic x(n) move "c:\tmp\reports" to new-dir call "cbl_change_dir" using new-dir if return-code = 0 display message "Current Directory changed to " new-dir else display message "Error : " return-code end-if |