CALL "C$ASYNCRUN" USING threadHandle                          cobolProgram                         [parameter(s)]                   GIVING returnCode  | 
threadHandle   | Usage handle   | Contains the handle of the thread that has been created. You can use this handle with the C$ASYNCPOLL routine to test whether the thread still exists or if it's terminated.  | 
cobolProgram   | PIC X(n)   | The name of the program to be called asynchronously.  | 
parameter(s)   | Any cobol type   | Optional. You can pass up to 14 parameters to the thread.  | 
working-storage section. 77 threadHandle usage handle. ... procedure division. ...    call "c$asyncrun" using threadHandle                            "programB"                            "some data".  |