IBM MainFrame Interview Questions
Questions Answers Views Company eMail

hi iam learning mainframes,can anybody tell me how to check JCL errors.(after submiting the JCL we have check in spool or is there any other method)

8 22129

i want to know how the commit option works,how it save the changes? it will update the database or what ? where we can see these saved changes?

4 5784

i have the following varibles in the working storage 05 ws-A PIC X(30) VALUE 'ABCDEFGHIJKLMNOPQRESTUVWXYZ ' 05 WS-B REDEFINES WS-A 10 WS-B1 PIC X(10). 10 WS-B2 PIC 9(10). 10 WS-B3 PIC X(10). If I Display B1, B2 and B3 respectively, what is the value displayed in B2

9 10245

I'm new to rexx. How to code rexx in jcl to read in a lpar cpu usage file and select 1. date, time 2. some system names 3. cpu usage for each system. The input file has hourly reporting. The output file (CSV)is for excel use. Run in batch mode. Output in FB.

1 6741

RMF reporting: What is the best way to code to provide me the info that there are disks in the array failing or failed? How to code? Run in batch.

1 3425

I have 3 cursors declared. Cursor1 retieves some data. Based on this curso2 will also fetches some data. In cursor3 (using for some updation) I'm using the data retrieved by the above 2 cursor. My question is, while working with cursor3, periodically if I give commit, will all the three crsors will be closed or only cursor3 will be closed?

4 7336

1) can we display the index?

ADP, IBM,

3 25759

Can we access the a[0] in the array ?

DCL, IBM,

6 9889

what is S04E error in jcl?

IBM, L&T,

11 66474

i am trying to copy a PS file into VSAM file in step2 by using PGM=IDCAMS,COND=(0,LT) and the pS file is getting sorted in the step1. I got the return code 00 for step1 but step2 got flushed. can u please help on this. Below is My JCL. SEPP050 EXEC PGM=SORT,REGION=6144K SYSIN DD DSN=SYSCMN.PROD.CCLIB (F5910BNN), DISP=SHR SYSOUT DD SYSOUT=* SYSUDUMP DD SYSOUT=A SORTIN DD DSN=Z1225BT.F5910EPP.HISOUT, DISP=SHR SORTOUT DD DSN=Z1225BT.F5910EPP.HISOUT.SORTOUT5, DISP= (NEW,CATLG,DELETE),UNIT=DELQ, SPACE=(CYL, (500,500),RLSE), DCB= (RECFM=FB,LRECL=1606,BLKSIZE=16060,BUFNO=15) SORTWK01 DD UNIT=SYSDA,SPACE=(CYL, (1)) SORTWK02 DD UNIT=SYSDA,SPACE=(CYL, (1)) SORTWK03 DD UNIT=SYSDA,SPACE=(CYL, (1)) SORTWK04 DD UNIT=SYSDA,SPACE=(CYL, (1)) SYSIN1 DD UNIT=VIO,SPACE= (80,1) * SEPP060 EXEC PGM=IDCAMS,COND= (0,LT) SYSPRINT DD SYSOUT=* SYSOUT DD SYSOUT=* SYSLIST DD SYSOUT=* *** DD01 DD DSN=Z1225BT.F5910EPP.HISOUT.SORTOUT, // DISP=SHR //*** //DD01O DD DSN=Z1225BT.F5910PHS, // DISP=SHR, // AMP=(AMORG,'BUFND=12,BUFNI=5') //SYSIN DD DSN=SYSCMN.PROD.CCLIB(F5910BBB), // DISP=SHR Output RC for the two steps: SDCBPJ05 SEPP050 00 236 .00 .00 .0 SDCBPJ05 SEPP060 FLUSH 0 .00 .00 .0

3 13088

How to declare the EMP Name, EMP No., DOB in VSAM KSDS file? Please explain.....

CTS,

3 8863

how to code the following map using occours clause? all the three fields have different length. ename eno addr 1) _______ _________ __________ 2) _______ _________ __________ 3) _______ _________ __________ 4) _______ _________ __________ 5) _______ _________ __________ 6) _______ _________ __________

L&T, TCS, Wipro,

1 11855

What is Static,Dynamic linking ?

2 5688

How I sort the records in a file and copy the first 10 records to another file

5 27832

Can we use icetool in cobol program?

3 7701


Un-Answered Questions { IBM MainFrame }

how to do automated restart when a job abends?

835


What is sqlca’s maximum length?

662


What are some jcl statements that are not allowed in procedures?

717


How the interaction between DB2, SQL, and QMF takes place?

1118


Can we give +2 instead of +1 while creating a new gdg file?

527






How are the next sentence and continue different from each other?

753


What is afoper?

481


Write about the self-referencing constraint?

569


What are the pertinent COBOL commands?

2615


Explain the device independent method to indicate where a record is stored?

468


What does the 'cebr:cics' transactions do?

567


Explain processing program table(ppt)?

624


Explain about find and obtain commands?

531


What is multithreading in jcl?

926


Differentiate between addressing mode and run mode.

606