CALL "C$WRU" USING programName, programLine, programIntraLine GIVING returnCode. |
programName | PIC X(n) | Receives the name of the calling program. If this routine is called by the main program, "RUNCOBOL" is returned. |
programLine | PIC 9(n) | Receives 0. |
programIntraLine | PIC 9(n) | Receives 0. |
1 | The currently running program has been called by another isCOBOL program. |
0 | The caller program name couldn’t be retrieved. Possible causes are: • The current program is the main program, the one started on the command line • The caller program is either a Java class or a C function, not a COBOL program • The current program is running on a separate JVM or a separate run unit. It happens when the caller program used either the CALL CLIENT statement or the CALL RUN statement as well as when the current program was loaded from the iscobol.remote.code_prefix. • The caller program has a CLASS-ID instead of a PROGRAM-ID. |
-1 | Missing or invalid parameter. |
*> define calling-program as pic x(n) *> define foo-1 and foo-2 as pic 9 call "c$wru" using calling-program, foo-1, foo-2. |