ABEND=S000 U4038 REASON=00000000



Support for OS/VS COBOL, VS COBOL II, COBOL for OS/390 & VM and Enterprise COBOL for z/OS

ABEND=S000 U4038 REASON=00000000

Postby GUI1504 » Thu Sep 23, 2010 10:53 pm

Hello again guys, i got a new abend when i'm trying to Input a file on my cobol to do a Redefines: ABEND=S000 U4038 REASON=00000000 . I know that's it happens because the Open/Close clause, but i don't understand why

COBOL - I've comment some lines to repair them after
       IDENTIFICATION DIVISION.
       PROGRAM-ID. REDEFINE.
      *
       ENVIRONMENT DIVISION.
      *
       INPUT-OUTPUT SECTION.
       FILE-CONTROL.
           SELECT ENTRADA
           ASSIGN TO ENTRADA.
      *
       DATA DIVISION.
      *
       FILE SECTION.
      *
       FD ENTRADA
           LABEL RECORD IS STANDARD
           RECORDING MODE IS F
           RECORD CONTAINS 36 CHARACTERS.
      *
       01 REG-ENTRADA PIC X(36).
      *
       WORKING-STORAGE SECTION.
      *
       01 WS-REG-FILE.
           05 WS-REG-INDEX     PIC       X(1).
           05 WS-REG-ARQ       PIC       X(35).
           05 WS-REG-HEADER    REDEFINES WS-REG-ARQ.
              10 WS-NOME-PGM   PIC       X(16).
              10 WS-VERSAO-PGM PIC       9(6).
              10 FILLER        PIC       X(13).
           05 WS-REG-DETALHE   REDEFINES WS-REG-ARQ.
              10 WS-CONTA-CLI  PIC       9(10).
              10 WS-NOME-CLI   PIC       X(15).
              10 WS-VALOR-CTA  PIC       9(4).
              10 WS-DATA-CTA   PIC       9(6).
           05 WS-REG-TRAILER   REDEFINES WS-REG-ARQ.
              10 WS-REG-QTD    PIC       9(6).
              10 FILLER        PIC       X(29).
       77 WS-CONT              PIC       X(3) VALUE 'NAO'.
      *
       PROCEDURE DIVISION.
      *
           OPEN I-O ENTRADA
           READ ENTRADA AT END MOVE 'SIM' TO WS-CONT.
      *
      *    IF WS-REG-INDEX EQUAL 'H'
      *       MOVE WS-REG-ARQ TO WS-REG-HEADER
      *    ELSE
      *    IF WS-REG-INDEX EQUAL 'D'
      *       MOVE WS-REG-ARQ TO WS-REG-DETALHE
      *    ELSE
      *    IF WS-REG-INDEX EQUAL 'T'
      *       MOVE WS-REG-ARQ TO WS-REG-TRAILER
      *    ELSE
      *      DISPLAY "ERRO"
      *    END-IF
      *    END-IF
      *    END-IF
      *
      *    DISPLAY WS-NOME-PGM
      *    DISPLAY WS-VERSAO-PGM
      *    DISPLAY WS-CONTA-CLI
      *    DISPLAY WS-NOME-CLI
      *    DISPLAY WS-DATA-CTA
      *    DISPLAY WS-REG-QTD
           DISPLAY WS-CONT
      *
           CLOSE ENTRADA
           STOP RUN.


SYSOUT
IGZ0035S There was an unsuccessful OPEN or CLOSE of file ENTRADA in program REDEFINE at relative location X'0414'.
         Neither FILE STATUS nor an ERROR declarative were specified. The status code was 35.
         From compile unit REDEFINE at entry point REDEFINE at compile unit offset +00000414 at entry offset +00000414
          at address 118AD414.                                                 
GUI1504
 
Posts: 28
Joined: Fri Sep 03, 2010 10:40 pm
Location: Campinas, SP - Brazil
Has thanked: 0 time
Been thanked: 0 time

Re: ABEND=S000 U4038 REASON=00000000

Postby Robert Sample » Thu Sep 23, 2010 11:11 pm

A U4038 abend is typically a Language Environment abend. The 4038 means that another error occurred in the program and LE is shutting down the program. The other error is the file status 35 (and why do you not have a FILE STATUS IS clause in your SELECT -- it should be mandatory these days?) means that file ENTRADA could not be opened because there was no DD statement //ENTRADA in the execution step -- and ENTRADA was not specified as OPTIONAL in the SELECT clause.
Robert Sample
Global moderator
 
Posts: 3719
Joined: Sat Dec 19, 2009 8:32 pm
Location: Dubuque, Iowa, USA
Has thanked: 1 time
Been thanked: 279 times

Re: ABEND=S000 U4038 REASON=00000000

Postby GUI1504 » Thu Sep 23, 2010 11:18 pm

look JCL

//GUI1504R     JOB (GUI1504),GUI1504,CLASS=A,MSGCLASS=X,NOTIFY=GUI1504
//PROCLIB      JCLLIB ORDER=IBMMFS.PROC.IBMCOB                       
//STEP1        EXEC IGYWCG                                           
//ENTRADA      DD DSN=GUI1504.REDEFINE.ENTER,DISP=SHR                 
//COBOL.SYSIN  DD DSN=GUI1504.REDEFINE.COBOL,DISP=SHR                 
//SYSPRINT     DD SYSOUT=*                                           
/*                                                                   


GUI1504.REDEFINE.ENTER
HNOME-DO-PROGRAMA000001         
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
D0123456789NOME-DO-CLIENTE200009
T000013                         
GUI1504
 
Posts: 28
Joined: Fri Sep 03, 2010 10:40 pm
Location: Campinas, SP - Brazil
Has thanked: 0 time
Been thanked: 0 time

Re: ABEND=S000 U4038 REASON=00000000

Postby Robert Sample » Thu Sep 23, 2010 11:22 pm

You have //COBOL.SYSIN after the //ENTRADA statement. If you carefully check the expanded JCL in the job listing, you will discover that //ENTRADA is associated with the COBOL step, not the GO step -- hence the abend, because you have no //ENTRADA DD statement when the program attempts to execute. You need to move //ENTRADA after the //COBOL.SYSIN and if I were you I'd make it //GO.ENTRADA to make it clear which step the DD name applies to.
Robert Sample
Global moderator
 
Posts: 3719
Joined: Sat Dec 19, 2009 8:32 pm
Location: Dubuque, Iowa, USA
Has thanked: 1 time
Been thanked: 279 times

Re: ABEND=S000 U4038 REASON=00000000

Postby GUI1504 » Thu Sep 23, 2010 11:55 pm

I move //ENTRADA after //COBOL.SYSIN, but the error continues
GUI1504
 
Posts: 28
Joined: Fri Sep 03, 2010 10:40 pm
Location: Campinas, SP - Brazil
Has thanked: 0 time
Been thanked: 0 time

Re: ABEND=S000 U4038 REASON=00000000

Postby Robert Sample » Thu Sep 23, 2010 11:56 pm

Post the expanded JCL from the job listing -- we don't need to see anything else at this point.
Robert Sample
Global moderator
 
Posts: 3719
Joined: Sat Dec 19, 2009 8:32 pm
Location: Dubuque, Iowa, USA
Has thanked: 1 time
Been thanked: 279 times

Re: ABEND=S000 U4038 REASON=00000000

Postby dick scherrer » Fri Sep 24, 2010 12:04 am

Maybe //GO.ENTRADA . . .? Assuming this is a compile/link/go job. . .

Just a guess.

It will be better if we can see what is actually being used. . .

d
User avatar
dick scherrer
Global moderator
 
Posts: 6268
Joined: Sat Jun 09, 2007 8:58 am
Has thanked: 3 times
Been thanked: 93 times

Re: ABEND=S000 U4038 REASON=00000000

Postby Robert Sample » Fri Sep 24, 2010 12:26 am

Dick: I'm assuming that ICYWCG is the standard IBM compile / go procedure for COBOL from IGY.SIGYPROC. That's why I want to see the expanded JCL -- to make sure the site hasn't changed the IBM default JCL (too much)!
Robert Sample
Global moderator
 
Posts: 3719
Joined: Sat Dec 19, 2009 8:32 pm
Location: Dubuque, Iowa, USA
Has thanked: 1 time
Been thanked: 279 times

Re: ABEND=S000 U4038 REASON=00000000

Postby NicC » Fri Sep 24, 2010 1:24 am

GUI1504 wrote:I move //ENTRADA after //COBOL.SYSIN, but the error continues


All step overrides default to the first, or last mentioned, step. Therefore, as this DD is for the GO step, you have to specify the stepname (GO, we are assuming), or, if there are already over-rides for the GO step place the DD after this/these.
The problem I have is that people can explain things quickly but I can only comprehend slowly.
Regards
Nic
NicC
Global moderator
 
Posts: 3025
Joined: Sun Jul 04, 2010 12:13 am
Location: Pushing up the daisies (almost)
Has thanked: 4 times
Been thanked: 136 times

Re: ABEND=S000 U4038 REASON=00000000

Postby dick scherrer » Fri Sep 24, 2010 3:01 am

Hi Robert,

That's why I want to see the expanded JCL
Yup, inquiring minds want to know. . . :)

Maybe TS will post this soon :)

d
User avatar
dick scherrer
Global moderator
 
Posts: 6268
Joined: Sat Jun 09, 2007 8:58 am
Has thanked: 3 times
Been thanked: 93 times

Next

Return to IBM Cobol

 


  • Related topics
    Replies
    Views
    Last post