CALL "CBL_EXIT_PROC" USING installFlag                              programName                  [RETURNING statusCode]   | 
installFlag   | any numeric data item or numeric literal   | Zero if the exit procedure is to be installed; nonzero if it is to be removed.  | 
programName   | PIC X(n)   | Name of the exit procedure to be installed or queried.  | 
call "cbl_exit_proc" using 0, "myclean".  |