Page 1 of 1

about RUN JCl (both 2 infile and 2 outfile).

PostPosted: Fri Oct 31, 2008 11:33 pm
by lxw039
HI, my run JCL works well when I have just one input file and outfile,
can anybody tell me how to modify my RUN JCL (just add 2 DD statement or not) when my cobol exist 2
input file and 2 output file, thanks.

Re: about RUN JCl (both 2 infile and 2 outfile).

PostPosted: Sat Nov 01, 2008 1:25 am
by dick scherrer
Hello,

Your jcl needs to reflect the select/assign/open code in your program.

For someone to help at any level of detail, you need to post more complete info.

Re: about RUN JCl (both 2 infile and 2 outfile).

PostPosted: Mon Nov 03, 2008 8:11 am
by lxw039
my cobol: (SEQ1000)
 INPUT-OUTPUT SECTION.
             FILE-CONTROL.
                     SELECT RCTTRAN ASSIGN TO RCTTRAN.
                     SELECT OLDMAST ASSIGN TO OLDMAST.
                     SELECT NEWMAST ASSIGN TO NEWMAST
                                                 FILE STATUS IS NEWMAST-FILE-STATUS.
                     SELECT ERRTRAN  ASSIGN TO ERRTRAN
                                                 FILE STATUS IS ERRTRAN-FILE-STATUS.
       
              DATA DIVISION.
              FILE SECTION.
              FD RCTTRAN.
              01 TRANSACTION-RECORD               PIC X(23).
              FD OLDMAST.
              01 OLD-MASTER-RECORD                 PIC X(70).
              .......


MY JCL:(RUN JCL)
         //LXW039MR JOB (31450), 'SUPP SLCT',
         //     CLASS=T,MSGCLASS=X
         //ESYLIB JCLLIB ORDER=(SYSP.HOST.UT.JCLLIB)

         //SCRATCH EXEC PGM=IDCAMS
         //SYSPRINT DD SYSOUT=*
         //SYSIN       DD *
                                DELETE('MP.LXW039.NEWMAST')
                                DELETE('MP.LXW039.ERRTRAN')
         /*

         //GOSTEP EXEC PGM=SEQ1000,PARM='USR/CHEC(ON)'
         //STEPLIB INCLUDE MEMBER=SYSTEP00
         //                DD DSN=MP.CTEST08.LOAD,DISP=SHR
         //                 INCLUDE MEMBER=SYNDVRB0

         //OLDMAST DD DSN=MP.LXW039.OLDMAST
         //RCTTRAN DD DSN=MP.LXW039.RCTTRAN

         //NEWMAST DD DSN=MP.LXW039.NEWMAST,DISP=(NEW,CATLG,KEEP),
         //                          UNIT=SYSDA,
         //                          SPACE=(TRK,(1,1),RLSE)
         //ERRTRAN DD DSN=MP.LXW039.ERRTRAN,DISP=(NEW,CATLG,KEEP),
         //                          UNIT=SYSDA,
         //                          SPACE=(TRK,(1,1),RLSE)
         //SYSOUT   DD SYSOUT=*
         //CEEDUMP DD SYSOUT=*
         //SYSPRINT DD SYSOUT=*
         //*
         


I passed the compile, but when i run the jcl, it didn't work, it always stop
//GOSTEP EXEC PGM=SEQ1000,PARM='USR/CHEC(ON)', no execute seq1000,
what's wrong with my run jcl, thanks.

Re: about RUN JCl (both 2 infile and 2 outfile).

PostPosted: Mon Nov 03, 2008 8:46 am
by dick scherrer
Hello,

From what you posted, the actual problem/error is not shown. . . Is this
//GOSTEP EXEC PGM=SEQ1000,PARM='USR/CHEC(ON)', no execute seq1000,
part of some error message or is it just something you chose to post that way?

What was the return code of the compile and the link edit? Was a link edit run?

When posting problems for us to help with, it is best to copy/paste the actual/complete diagnostic output from the system rather than choosing some things to post.

I'd suggest coding a disp= on the input files and providing dcb info for the output files. The indentation is incorrect for the unit and space parameters for the output files. I also have never seen a steplib constructed as this one is. Is this some local "standard"? A steplib names the load library(ies). The includes are something nowhere i've supported use. . . :?

Re: about RUN JCl (both 2 infile and 2 outfile).

PostPosted: Wed Nov 05, 2008 1:07 am
by lxw039
thanks a lot.

Re: about RUN JCl (both 2 infile and 2 outfile).

PostPosted: Wed Nov 05, 2008 2:36 am
by dick scherrer
You're welcome :)

thanks a lot.

Does this indicate that your process is now working?

d