Automated Testing

Automated Testing

Automated Testing

Build an automated testing process to enable continuous integration of your hybrid cloud applications including z/OS

 View Only
  • 1.  RDz VSAM Issue

    Posted Thu December 15, 2011 12:24 PM
    Hi All,
    I have created a VSAM by using a JCL and if i want to write on that VSAM so i am getting errors.

    The Cobol Program for VSAM is:-
    ID DIVISION.
    PROGRAM-ID. PROG3
    ENVIRONMENT DIVISION.
    CONFIGURATION SECTION.
    SOURCE-COMPUTER. IBM-Z10.
    OBJECT-COMPUTER. IBM-Z10.
    INPUT-OUTPUT SECTION.
    FILE-CONTROL.
    SELECT CUR-FILE ASSIGN TO MYFILE1
    ORGANIZATION INDEXED ACCESS IS SEQUENTIAL
    RECORD KEY IS EMP-NO FILE STATUS IS F13.
    DATA DIVISION.
    FILE SECTION.
    FD CUR-FILE
    RECORD CONTAINS 80 CHARACTERS
    DATA RECORD IS CUR-REC.
    01 CUR-REC.
    02 EMP-NO PIC 9(6).
    02 EMP-NAME PIC X(24).
    02 EMP-ADDRESS PIC X(50).
    WORKING-STORAGE SECTION.
    77 F13 PIC 99 VALUE ZEROS.
    PROCEDURE DIVISION.
    0001-MAIN.
    DISPLAY ' I M IN MAINFRAME WOW '.
    DISPLAY ' I M IN MAIN '.
    OPEN OUTPUT CUR-FILE. IF F13 = 00
    DISPLAY ' I M OPENED SUCCESSFULLY ' ELSE
    DISPLAY 'OPEN-ERROR ' F13 STOP RUN.
    MOVE '822655' TO EMP-NO.
    DISPLAY EMP-NO.
    MOVE 'John A' TO EMP-NAME.
    MOVE 'P01 ST. TOWN' TO EMP-ADDRESS.
    DISPLAY CUR-REC.
    WRITE CUR-REC.
    IF F13 = 00 DISPLAY 'WRITE SUCCESSFUL' ELSE
    DISPLAY 'WRITE ERROR ' F13 STOP RUN.
    CLOSE CUR-FILE.
    STOP RUN.

    and the JCL for this Program is :-
    //RTPOT06 JOB ,
    // MSGCLASS=H,MSGLEVEL=(1,1),TIME=(,4),REGION=0M,COND=(16,LT)
    //*
    //STP0000 EXEC PROC=ELAXFCOC,
    // CICS=',''CICS LIB''',
    // DB2=,
    // COMP=
    //COBOL.SYSPRINT DD DISP=SHR,
    // DSN=RTPOT06.TEST.LISTING(VSAMCBL)
    //COBOL.SYSDEBUG DD DISP=SHR,
    // DSN=RTPOT06.TEST.SYSDEBUG(VSAMCBL)
    //COBOL.SYSLIN DD DISP=SHR,
    // DSN=RTPOT06.TEST.OBJ(VSAMCBL)
    //COBOL.SYSLIB DD DISP=SHR,
    // DSN=RTPOT06.TEST.COPYLIB
    //COBOL.SYSXMLSD DD DUMMY
    //COBOL.SYSIN DD DISP=SHR,
    // DSN=RTPOT06.TEST.COBOL(VSAMCBL)
    //MYFILE1 DD DISP=SHR,DSN=RTPOT06.VSAMTST2
    //*
    //******* ADDITIONAL JCL FOR COMPILE HERE ******
    //LKED EXEC PROC=ELAXFLNK
    //LINK.SYSLIB DD DSN=RTPOT06.TEST.OBJ,
    // DISP=SHR
    // DD DSN=CEE.SCEELKED,
    // DISP=SHR
    //LINK.OBJ0000 DD DISP=SHR,
    // DSN=RTPOT06.TEST.OBJ(VSAMCBL)
    //LINK.SYSLIN DD *
    INCLUDE OBJ0000
    /*
    //LINK.SYSLMOD DD DISP=SHR,
    // DSN=RTPOT06.TEST1.LOAD(VSAMCBL)
    //*
    //******* ADDITIONAL JCL FOR LINK HERE ******

    The Errors which i am receiving here are :-

    10.59.37 JOB08600 IEC141I 013-18,IGG0191B,RTPOT06,COBOL,SYSIN,030C,DMEU23,RTPOT06.TEST.COBOL(VSAMCBL)
    10.59.37 JOB08600 IEA995I SYMPTOM DUMP OUTPUT 932
    932 SYSTEM COMPLETION CODE=013 REASON CODE=00000018
    932 TIME=10.59.37 SEQ=00993 CPU=0000 ASID=001E
    932 PSW AT TIME OF ERROR 075C1000 80CADB02 ILC 2 INTC 0D
    932 NO ACTIVE MODULE FOUND
    932 NAME=UNKNOWN

    Kindly help me out in this issue.

    Thanks,
    Shajeel
    RVXY_Shajeel_Khan


  • 2.  Re: RDz VSAM Issue

    Posted Thu December 15, 2011 12:36 PM
    Look up the error messages at https://www-03.ibm.com/systems/z/os/zos/bkserv/lookat/index.html . All of the information you need to debug the problem is there.

    RDzJohn
    RDzJohn


  • 3.  Re: RDz VSAM Issue

    Posted Tue December 20, 2011 09:41 AM
    You are getting the error in the compile step named COBOL.
    1) Check if member VSAMCBL exists in dataset RTPOT06.TEST.COBOL
    2) Please check that RTPOT06.TEST.COBOL data set has DCB attributes set to RECFM=FB, LRECL=80.
    The error you are having in this data set, and the 013-18 and means member not found
    SystemAdmin


  • 4.  Re: RDz VSAM Issue

    Posted Thu December 22, 2011 08:58 AM
    Hi Rafa,

    The VSAM issue had resolved. Btw can u help me out in WAS issue in UT box. We want to run WAS in UT Box. So i want to ask that from where we can view the data set of WAS Configuration files? like where WAS files are located because we want to configure them and want to see them in up and running.
    RVXY_Shajeel_Khan