IBM Mainframe Forum Index
 
Log In
 
IBM Mainframe Forum Index Mainframe: Search IBM Mainframe Forum: FAQ Register
 

HELP JOB COMP LINK EDIT ZOS 1.6


IBM Mainframe Forums -> JCL & VSAM
Post new topic   Reply to topic
View previous topic :: View next topic  
Author Message
batusai

New User


Joined: 21 Aug 2008
Posts: 15
Location: lima peru

PostPosted: Wed Aug 27, 2008 5:38 am
Reply with quote

Hello I am learning Cobol,


now compile the comprogramas in this way
Code:

//PPCOMLNK  JOB                                         
//PPCL     EXEC DFHEITVL,PROGLIB='USERID.CLASS.LOAD'     
//TRN.SYSIN   DD *                                       
       IDENTIFICATION DIVISION.                         
       PROGRAM-ID.    TAND3997.                         
      *AUTHOR.        BCION.                             
       ENVIRONMENT DIVISION.                             
       DATA DIVISION.                                   
       WORKING-STORAGE SECTION.                         
       01  WE-SALUDO   PIC X(15) VALUE 'HELLO WORLD....'.
       PROCEDURE DIVISION.                               
      *------------------*                               
           DISPLAY '...HOLA MUNDO.....'.                 
           DISPLAY WE-SALUDO.                           
           DISPLAY  WE-SALUDO '...HOLA MUNDO.....'     
           STOP RUN.       
//LKED.SYSIN DD *           
   NAME PROG1(R)           
/*                         
 


and I work well

but now I would like to compile my programs this way
Code:

//TOLDCIC2  JOB (ACCT),'BATUSA',CLASS=B,MSGCLASS=Z,REGION=2M,
//             NOTIFY=
//DFHEITVL PROC SUFFIX=1$,           Suffix for translator module
//       INDEX='CICSTS23.CICS', Qualifier(s) for CICS libraries
//       PROGLIB=&INDEX..SDFHLOAD, Name of output library
//       DSCTLIB='CICSTS23.CICS.SDFHCOB', Name of private macro/DSECT lib
//       COMPHLQ='SYS1', Qualifier(s) for COBOL compiler
//       OUTC=A, Class for print output
//       REG=2M, Region size for all steps
//       LNKPARM='LIST,XREF', Link edit parameters
//       STUB='DFHEILIC', Link edit INCLUDE for DFHECI
//       LIB='SDFHCOB', Library
//       WORK=SYSDA Unit for work data sets
//*************************************************************
//*  PROCED COMPILA PROG ONLINE -                *
//*************************************************************
//*
//TRN    EXEC PGM=DFHECP&SUFFIX,
//            PARM='COBOL2',
//            REGION=&REG
//STEPLIB  DD DSN=&INDEX..SDFHLOAD,DISP=SHR
//SYSPRINT DD SYSOUT=&OUTC
//SYSPUNCH DD DSN=&&SYSCIN,
//            DISP=(,PASS),UNIT=&WORK,
//            DCB=BLKSIZE=400,
//            SPACE=(400,(400,100))
//*
//COB    EXEC PGM=IGYCRCTL,REGION=&REG,
//       PARM='NODYNAM,LIB,OBJECT,RENT,RES,APOST,MAP,XREF'
//STEPLIB  DD DSN=&AD370HLQ..SIGYCOMP.V210,DISP=SHR
//         DD  DSN=SYS1.SORTLIB,DISP=SHR
//SYSLIB   DD DSN=&DSCTLIB,DISP=SHR
//         DD DSN=&INDEX..SDFHCOB,DISP=SHR
//         DD DSN=&INDEX..SDFHMAC,DISP=SHR
//         DD DSN=&INDEX..SDFHSAMP,DISP=SHR
//SYSPRINT DD SYSOUT=&OUTC
//SYSIN    DD DSN=&&SYSCIN,DISP=(OLD,DELETE)
//SYSLIN   DD DSN=&&LOADSET,DISP=(MOD,PASS),
//            UNIT=&WORK,SPACE=(80,(250,100))
//SYSUT1   DD UNIT=&WORK,SPACE=(460,(350,100))
//SYSUT2   DD UNIT=&WORK,SPACE=(460,(350,100))
//SYSUT3   DD UNIT=&WORK,SPACE=(460,(350,100))
//SYSUT4   DD UNIT=&WORK,SPACE=(460,(350,100))
//SYSUT5   DD UNIT=&WORK,SPACE=(460,(350,100))
//SYSUT6   DD UNIT=&WORK,SPACE=(460,(350,100))
//SYSUT7   DD UNIT=&WORK,SPACE=(460,(350,100))
//*-------------------------------------------------------------------*
//COPYLINK EXEC PGM=IEBGENER,COND=(7,LT,COB)
//SYSUT1   DD DSN=&INDEX..&LIB(&STUB),DISP=SHR
//SYSUT2   DD DSN=&&COPYLINK,DISP=(NEW,PASS),
//            DCB=(LRECL=80,BLKSIZE=400,RECFM=FB),
//            UNIT=&WORK,SPACE=(400,(20,20))
//SYSPRINT DD SYSOUT=&OUTC
//SYSIN    DD DUMMY
//*
//LKED   EXEC PGM=IEWL,REGION=&REG,
//            PARM='&LNKPARM',COND=(5,LT,COB)
//SYSLIB   DD DSN=&INDEX..SDFHLOAD,DISP=SHR
//         DD DSN=&COMPHLQ..COB2CICS,DISP=SHR
//         DD DSN=&COMPHLQ..COB2LIB,DISP=SHR
//SYSLMOD  DD DSN=&PROGLIB,DISP=SHR
//SYSUT1   DD UNIT=&WORK,DCB=BLKSIZE=1024,
//            SPACE=(1024,(200,20))
//SYSPRINT DD SYSOUT=&OUTC
//SYSLIN   DD DSN=&&COPYLINK,DISP=(OLD,DELETE)
//         DD DSN=&&LOADSET,DISP=(OLD,DELETE)
//         DD DDNAME=SYSIN
/*


please help me understand this code and run it like to compile my programs cobol

sorry, not very well write the English

thanks
Back to top
View user's profile Send private message
dick scherrer

Moderator Emeritus


Joined: 23 Nov 2006
Posts: 19244
Location: Inside the Matrix

PostPosted: Wed Aug 27, 2008 7:00 am
Reply with quote

Hello,

Did you correct the loadlib definition problem described in your other topic about the same program's compile/link?

One of the topics will be locked - we don't support duplicate threrads.

You can choose which you want to keep active. . .

FWIW, you have a batch program and this set of compile jcl is for a cics program. Given your environment and your lack of familiarity with the mainframe cobol environment, i'd suggest you continue learning batch before you include the cics environment.

The hint being that you probably want the other topic to continue, not this one.
Back to top
View user's profile Send private message
View previous topic :: :: View next topic  
Post new topic   Reply to topic View Bookmarks
All times are GMT + 6 Hours
Forum Index -> JCL & VSAM

 


Similar Topics
Topic Forum Replies
No new posts Query on edit primary command CLIST & REXX 5
No new posts Query on edit primary command CLIST & REXX 1
No new posts COBOL - Move S9(11)v9(7) COMP-3 to -(... COBOL Programming 5
No new posts Need help to resolve a hard edit COBOL Programming 8
This topic is locked: you cannot edit posts or make replies. Need help to resolve a hard edit COBOL Programming 4
Search our Forums:

Back to Top