Can we delete the data using IEFBR14 , IEBGENER??

Answers were Sorted based on User's Feedback



Can we delete the data using IEFBR14 , IEBGENER??..

Answer / sukumar

Yes, you can delete it... using IEFBR14
//JOB1 JOB NOTIFY=&SYSUT1
//STEP1 EXEC PGM=IEFBR14
//DD1 DD DSN=ISAM12.CLASS.PGM12,DISP=(MOD,DEL,DEL),UNIT=3390
//SYSIN DD DUMMY
//


But IEBGENER is used to concatenate a dataset / edit / copy

Is This Answer Correct ?    24 Yes 5 No

Can we delete the data using IEFBR14 , IEBGENER??..

Answer / tidda

just put DISP=(MOD,DELETE,DELETE)
pgm=XYZ will also do!

Is This Answer Correct ?    12 Yes 6 No

Can we delete the data using IEFBR14 , IEBGENER??..

Answer / karunakar reddy

Hey Try as below and see if the below JCL can help.

//DELETEDS JOB (@),'PREP T-2 FOR R01',
// REGION=0M,
// CLASS=C,MSGCLASS=X,
// NOTIFY=&SYSUID
//JS10 EXEC PGM=IEBGENER
//SYSPRINT DD SYSOUT=*
//SYSUT1 DD DUMMY,DCB=SSR.TEST.FILE
//SYSUT2 DD DSN=SSR.TEST.FILE,DISP=(OLD,KEEP,KEEP)
//SYSIN DD DUMMY
//SYSUDUMP DD SYSOUT=*

Is This Answer Correct ?    4 Yes 6 No

Can we delete the data using IEFBR14 , IEBGENER??..

Answer / biswaranjan

Its possible.But 1st you have to delete the dataset and
recreate a empty dataset with the same name.

//XXXXXXXX JOB TEST,'SORT',
// MSGCLASS=X,
// CLASS=C,NOTIFY=&SYSUID
//STEP1 EXEC PGM=IEFBR14
//DD1 DD DSN=XXXXXXX.WORK.TEST,DISP=(MOD,DELETE,DELETE)
//SYSIN DD DUMMY
//STEP2 EXEC PGM=IEFBR14
//DD1 DD DSN=XXXXXXX.WORK.TEST,DISP=(NEW,CATLG,DELETE)
//SYSIN DD DUMMY
//

Is This Answer Correct ?    4 Yes 8 No

Can we delete the data using IEFBR14 , IEBGENER??..

Answer / sesha

in IEFBR14, give disp=(old,delete).

Is This Answer Correct ?    0 Yes 5 No

Post New Answer

More JCL Interview Questions

There are 5 steps in a Job. How to bypass the first step by making use of only COND Parameter and not using any Restart and IF/THEN/ELSE parameter?

11 Answers   IBM,


WORKING-STORAGE SECTION. 01 GROSS-PAY. 05 BASIC-PAY PIC 9(5). 05 ALLOWENCES PIC 9(3). PROCEDURE DIVISION. MOVE 1000 TO BASIC-PAY. MOVE 250 TO ALLOWENCES. DISPLAY GROSS-PAY. STOP RUN. 77 W-A PIC 9(3)V99 VALUE 23.75 77 W-B PIC ZZ9V99 VLAUE 123.45 after the statement MOVE W-A TO W-B what will be W-B's value? a.123.75 b.b23.75 (where b indicates space) c.023.75 d.invalid move

0 Answers  


Can we give TIME = (1440, 59) also ? or is TIME = (1439, 59) is the last one ?

5 Answers   IBM,


Explain about LMQUERY�give a dialog information about a data set

0 Answers  


How to compare 2 files using File-Aid?

1 Answers   IBM,






What do you understand by the terms: joblib and steplib?

0 Answers  


Explain about LMFREE�free data set from its association with data ID

0 Answers  


How To get the last record in VSAM file in cluster? and How can u get the ksds file records into ur cobol program ? Pls tell me about these two questions.

1 Answers   Cap Gemini,


At what stage, operator can change the class and priority of a submitted job?

2 Answers  


Explain about LMCOPY -

1 Answers  


If we want to see the eliminated duplicate record thru SORT, how its output file will be managed

6 Answers   Syntel,


Can I share my data with other jobs? How?

0 Answers  


Categories