1.Can we define condition-name conditions in FD entry.
Answers were Sorted based on User's Feedback
Answer / k.phani
yes we can define condition variables in fd entry,here is
the example
FD TRANS-FILE.
01 TRANS-REC.
O2 TRANS-CODE PIC X.
88 INSERTION VALUE IS 'I'.
88 DELETION VALUE IS 'D'.
88 MODIFICATION VALUE IS 'M'.
02 REST-OF-TRANS.
03 TRAN-NO PIC X(5).
03 TRAN-NAME PIC X(20).
..............
HERE IN PROCEDURE DIVISION WE CAN USE CONDITIONS NAMES
AFTER READING TRANS-FILE FOR DELETING, MODIFYING,INSERTING
THE RECORD IN MASTER-FILE.
I HOPE THIS CLEAR UR DOUBT
| Is This Answer Correct ? | 10 Yes | 1 No |
Answer / harish
according to me yes, we can define condition names in FD
entry..
pls let me know if u have any queries
HARISH POOMGAME SHIVAPPA
NIIT TECHNOLOGY
KOLKATA
| Is This Answer Correct ? | 0 Yes | 0 No |
Answer / ashok
yes guys.. we can write it... evne i have tried it. its
working....
| Is This Answer Correct ? | 0 Yes | 0 No |
Answer / nag
Yes, we can used conditon names in FD section. here is
sample code of our project.
05 DIRECT-BILL-INDICATOR PICTURE X.
88 DIRECT-BILL-ONLY VALUE '1'.
88 DIRECT-OR-AGENCY-BILL VALUE '2'.
| Is This Answer Correct ? | 0 Yes | 0 No |
here is my compile and link edit steps in a jcl //COMPILE1 JOB (3CUS,S),'CCDM TEST' //STEPNAME EXEC PGM=IGYCRCTL,PARM='DYNAM,RENT,LIB,OBJECT, // OFFSET,APOST,OPTIMIZE',REGION=4096K //STEPLIB DD DSNAME=PM7351.TEST2.COB,DISP=SHR //SYSIN DD DSNAME=PM7351.TEST2.COB(PGM1),DISP=SHR //SYSUT1 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT2 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT3 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT4 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT5 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT6 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSUT7 DD UNIT=SYSDA,SPACE=(10,(10,10)) //SYSPRINT DD SYSOUT=* //SYSLIN DD DSNAME=&&LOAD,DISP=(MOD,PASS),UNIT=SYSDA, // SPACE=(10,(10,10)),DCB=BLKSIZE=400 //LKED EXEC PGM=IEWL,REGION=1024K //SYSPRINT DD SYSOUT=A //SYSLIB DD DSN=PM7351.TEST2.LOADLIB,DISP=SHR // DD DSN=PM7351.TEST2.COB(PGM1),DISP=SHR //SYSLMOD DD DSN=PM7351.TEST2.LOADLIB, // DISP=SHR //SYSUT1 DD UNIT=SYSDA,DCB=BLKSIZE=1024,SPACE=(CYL,(1,1)) //SYSTERM DD SYSOUT=* //SYSLIN DD DSN=&&LOAD,DISP=(OLD,DELETE) //SYSIN DD DUMMY i am getting IEW2013I 0F08 NO MEMBER NAME WAS SPECIFIED. MODULE WAS SAVED USING TEMPNAM1. could any one tell me the resolution for this..?
I want ALL ERROR codes in VSAM
3 Answers American Express, TCS,
RENAME clause takes new SPACE in memory.TRUE or FALSE? a)TRUE 2)FALSE
what is difference bt COND, REGION & TIME parameters at JOB & EXEC. give an exp.
In the JCL, how do you define the files referred to in a subroutine ?
What is the LINKAGE SECTION used for?
What are declaratives and what are their uses in cobol?
Difference between cobol and cobol-ii?
Size of a column has been changed in DB2 table (Suppose it was of 5 characters and later changed to 4 characters) and forgot to change the DCLGEN in COBOL program, what will happen during the execution of code? If the program Abends then what will be the error? If it doesn't abend then hpw the error can be catched?
What are literals?
why we are using picture clause in the cobol programs?
What is the use of EVALUATE statement?