IBM Mainframe Forum Index
 
Log In
 
IBM Mainframe Forum Index Mainframe: Search IBM Mainframe Forum: FAQ Register
 

Regarding the runtime abend - SFCB.


IBM Mainframe Forums -> IMS DB/DC
Post new topic   This topic is locked: you cannot edit posts or make replies.
View previous topic :: View next topic  
Author Message
jayant_tibhe

New User


Joined: 25 Feb 2006
Posts: 27
Location: Pune

PostPosted: Mon Feb 12, 2007 7:05 pm
Reply with quote

Hi,

I am executing a simple IMS DB test program. The DBD, PSB and program compillation all are successful.But at the runtime I am getting the Abend SFCB. I am not getting why this is? Whether my System is supporting or not?

Please help me in this....

Details in SPOOL for Abend :
Code:

IEF237I JES2 ALLOCATED TO DFSVSAMP                             
IEA995I SYMPTOM DUMP OUTPUT                                   
SYSTEM COMPLETION CODE=FCB                                     
 TIME=12.41.03  SEQ=00273  CPU=0000  ASID=0022                 
 PSW AT TIME OF ERROR  070C1000   80FFEBD2  ILC 2  INTC 0D     
   NO ACTIVE MODULE FOUND                                     
   NAME=UNKNOWN                                               
   DATA AT PSW  00FFEBCC - 00181610  0A0D4110  016D182F       




My COBOL Code is :

USERS.MOUNESH.IMSDB(CBLPGM)

Code:


IDENTIFICATION DIVISION.                                   
PROGRAM-ID. ISRTPGM.                                       
AUTHOR.  MOUNESH.                                           
ENVIRONMENT DIVISION.                                       
CONFIGURATION SECTION.                                     
SOURCE-COMPUTER. IBM-370.                                   
OBJECT-COMPUTER. IBM-370.                                   
INPUT-OUTPUT SECTION.                                       
DATA DIVISION.                                             
WORKING-STORAGE SECTION.                                   
01  WS-RECORD             PIC X(20).                       
01  UNQUAL-SSA-HOSP       PIC X(11) VALUE 'HOSPITAL*  '.   
01  UNQUAL-SSA-WARD       PIC X(09) VALUE 'WARD     '.     
                                                           
01  CN-IMS-FUNCTIONS.                                       
    05  CN-GU                     PIC XXXX    VALUE 'GU  '.
     05  CN-GN                     PIC XXXX    VALUE 'GN  '.   
     05  CN-GNP                    PIC XXXX    VALUE 'GNP '.   
     05  CN-GHU                    PIC XXXX    VALUE 'GHU '.   
     05  CN-GHN                    PIC XXXX    VALUE 'GHN '.   
     05  CN-GHNP                   PIC XXXX    VALUE 'GHNP'.   
     05  CN-ISRT                   PIC XXXX    VALUE 'ISRT'.   
     05  CN-DLET                   PIC XXXX    VALUE 'DLET'.   
     05  CN-REPL                   PIC XXXX    VALUE 'REPL'.   
                                                               
 LINKAGE SECTION.                                             
                                                               
 01  PCB-HOSPMASK.                                             
     05 PCB-HOSP-DBDNAME            PIC X(08).                 
     05 PCB-HOSP-LEVEL-NUMBER       PIC X(02).                 
     05 PCB-HOSP-STATUS-CODE        PIC X(02).                 
     05 PCB-HOSP-PROC-OPTIONS       PIC X(04).                 
     05 PCB-HOSP-JCB-ADDRESS        PIC X(04).                 
     05 PCB-HOSP-SEGMENT-NAME       PIC X(08).                   
     05 PCB-HOSP-KEY-LENGTH         PIC S9(05) COMP.             
     05 PCB-HOSP-NUMBER-SEGS        PIC S9(05) COMP.             
     05 PCB-HOSP-KEY-FEEDBACK       PIC X(48).                   
 PROCEDURE DIVISION.                                             
 0000-MAIN-PARA.                                                 
     ENTRY 'DLITCBL' USING PCB-HOSPMASK.                         
*    MOVE 'ZEBRA  HOSPITAL     SOUTH EXTENSION, NEW DELHI-29 01101
*    '126543   ERT             55002020015PHYSIO             '   
     MOVE 'ZEBRA  HOSPITAL' TO WS-RECORD.                         
                                                                 
     CALL 'CBLTDLI' USING CN-ISRT                                 
                        PCB-HOSPMASK                             
                        WS-RECORD                                 
                        UNQUAL-SSA-HOSP                           
*                       UNQUAL-SSA-WARD.                         
       IF PCB-HOSP-STATUS-CODE NOT = SPACES                       
          DISPLAY '******ERROR ON ISRT******'   
          DISPLAY 'PCB-HOSPMASK: ' PCB-HOSPMASK 
          GOBACK                                 
       END-IF.                                   
      DISPLAY '******THE END******'.             
      GOBACK.         




The run JCL for this Pgm is :

USERS.MOUNESH.IMSDB(RUNCOIMS)


Code:

//MOUNESHR JOB NOTIFY=&SYSUID,PRTY=15                   
//*************************************                       
// SET MBR=CBLPGM                                             
// SET PSB=HOSPPSB                                           
// SET PSBLIB=USERS.MOUNESH.PSBLIB                           
// SET DBDLIB=USERS.MOUNESH.DBDLIB                           
// SET LOADLIB=USERS.MOUNESH.LOAD                             
//*************************************                       
//G      EXEC PGM=DFSRRC00,REGION=4M,                         
//            PARM=(DLI,&MBR,&PSB,7,,,,,N,,T,,,N,,,N,,,,,,,N)
//STEPLIB  DD DSN=IMS810.SDFSRESL,DISP=SHR                   
//         DD DSN=IMS810.PGMLIB,DISP=SHR                     
//         DD DSN=&LOADLIB(&MBR),DISP=SHR                     
//SYSPRINT DD SYSOUT=*                                       
//DFSRESLB DD DSN=IMS810.SDFSRESL,DISP=SHR                   
//IMS      DD DSN=&PSBLIB,DISP=SHR                           
//         DD DSN=&DBDLIB,DISP=SHR                       
//PRIME    DD DSN=USERS.MOUNESH.KSDS,DISP=SHR           
//OVERFLOW DD DSN=USERS.MOUNESH.ESDS,DISP=SHR           
//*INFILE1  DD DSN=USERS.MOUNESH.INPUT.HOSPITAL,DISP=SHR
//*INFILE2  DD DSN=USERS.MOUNESH.INPUT.WARD,DISP=SHR     
//*INFILE3  DD DSN=USERS.MOUNESH.INPUT.PATIENT,DISP=SHR 
//IMSLOGR  DD DSN=USERS.MOUNESH.LOG,DISP=(MOD,CATLG),   
//    DCB=(RECFM=VB,BLKSIZE=1920,                       
//    LRECL=1916,BUFNO=2),SPACE=(TRK,(5,5))             
//IEFRDER  DD DSN=USERS.MOUNESH.IEFRDER,DISP=(MOD,CATLG),
//    DCB=(RECFM=VB,BLKSIZE=1920,                       
//    LRECL=1916,BUFNO=2),SPACE=(TRK,(5,5))             
//SYSUDUMP DD SYSOUT=*,                                 
//         DCB=(RECFM=FBA,LRECL=121,BLKSIZE=605),       
//         SPACE=(605,(500,500),RLSE,,ROUND)             
//IMSMON   DD DUMMY                                     
//DFSVSAMP DD *                                         
//*VSRBF=4096,4       
/*                   


Please resolve my query....Thanks in advance.
Back to top
View user's profile Send private message
Bitneuker

CICS Moderator


Joined: 07 Nov 2005
Posts: 1104
Location: The Netherlands at Hole 19

PostPosted: Mon Feb 12, 2007 7:50 pm
Reply with quote

Code:
CALL 'CBLTDLI' USING CN-ISRT                                 
                        PCB-HOSPMASK                             
                        WS-RECORD                                 
                        UNQUAL-SSA-HOSP                           
*                       UNQUAL-SSA-WARD.   


Is it correct I see the last ssa has been commented (*) and the period (.) is missing for the DLI-call?
Back to top
View user's profile Send private message
jayant_tibhe

New User


Joined: 25 Feb 2006
Posts: 27
Location: Pune

PostPosted: Mon Feb 12, 2007 8:06 pm
Reply with quote

Hi Bitneuker,

I have rectified that...Now my code is :

Code:

         CALL 'CBLTDLI' USING CN-ISRT           
                            PCB-HOSPMASK         
                            WS-RECORD           
                            UNQUAL-SSA-HOSP.     
    *                       UNQUAL-SSA-WARD.     


Still the same abend SFCB.....

Please help me out..
Back to top
View user's profile Send private message
miaowen17

New User


Joined: 16 Jan 2009
Posts: 1
Location: China

PostPosted: Mon Mar 30, 2009 1:14 pm
Reply with quote

Hi bro, i think this is a system level abend. pleas check your system nulstxx, i guess maybe your ims svc code not existes in this member.
Back to top
View user's profile Send private message
enrico-sorichetti

Superior Member


Joined: 14 Mar 2007
Posts: 10872
Location: italy

PostPosted: Mon Mar 30, 2009 1:37 pm
Reply with quote

did anybody care to look at the manual ...


Quote:

Fnn

Explanation: The system detected an error while processing a Supervisor Call (SVC) instruction. The last 2 digits of this completion code, nn, are the operand of the SVC instruction in hexadecimal. For example, completion code X'F0D' means that the error occurred while the system was processing SVC X'0D', that is, SVC 13.


One of the following occurred:


* When nn is equal to 13, 14, 17, or 37, recovery for OPEN/CLOSE/EOV failed to recognize a passed internal abend code. Register 12 contains the passed internal abend code. This is probably a system error. If the ABEND is accompanied by message IEC900I, the code was issued by DFSMSdfp and the code explanations are provided in this section. If the ABEND is accompanied by error messages starting with message prefix EDG, the code was issued by DFSMSrmm. See DFSMS/MVS DFSMSrmm Implementation and Customization Guide for explanations of the codes when they are issued by DFSMSrmm.


* When nn is not equal to 13, 14, 17, or 37, the system detected an incorrect SVC instruction.


ask the system support group
we know little about Your setup,
nothing we can do but point You to Your organization' s channels
Back to top
View user's profile Send private message
dick scherrer

Moderator Emeritus


Joined: 23 Nov 2006
Posts: 19244
Location: Inside the Matrix

PostPosted: Mon Mar 30, 2009 8:28 pm
Reply with quote

Hello miaowen17 and welcome to the forum,

Please note that this topic has been inactive for over 2 years, so there will most likely not be many replies.

It is best to reply to currently active topics. . . icon_smile.gif
Back to top
View user's profile Send private message
Gurpreet singh chhatwal

New User


Joined: 09 Dec 2013
Posts: 3
Location: India

PostPosted: Mon Mar 09, 2015 5:19 pm
Reply with quote

Hi,

I am also facing the same issue, kindly help me how to solve this abend.

9.38.06 JOB00322 $HASP165 MATE01 ENDED AT N1 - ABENDED SFCB U0000

Regards
Gurpreet
Back to top
View user's profile Send private message
Nic Clouston

Global Moderator


Joined: 10 May 2007
Posts: 2455
Location: Hampshire, UK

PostPosted: Tue Mar 10, 2015 4:25 pm
Reply with quote

Gurpreet - please start a new topic. You may do a link to this one but it is now almost 5 years since the last post (which was already 3 year after the original post).

You appear not to have read through the topics - see Dick's post immediately before yours and read carefully Enrico's post.
Back to top
View user's profile Send private message
View previous topic :: :: View next topic  
Post new topic   This topic is locked: you cannot edit posts or make replies. View Bookmarks
All times are GMT + 6 Hours
Forum Index -> IMS DB/DC

 


Similar Topics
Topic Forum Replies
No new posts ISAM and abend S03B JCL & VSAM 10
No new posts Abend S0C4 11 (Page Translation Excep... PL/I & Assembler 16
No new posts WER999A - UNSUCCESSFUL SORT 8ED U Ab... SYNCSORT 5
No new posts the system or user abend SF0F R=NULL COBOL Programming 0
No new posts Need to get an DLI abend like U0200 IMS DB/DC 2
Search our Forums:

Back to Top