VL10B is terminating in background job, no deliveries are generated

VL10B is terminating when running in a background job then no deliveries get generated for STO, is there a way to make the program skip to the next record instead of terminating so some deliveries will be generate?

Hi mohan,
check in material master whether there is any saftey stock / minimum stock is there.. if so. please correct it.
Ramki

Similar Messages

  • Background job spool is not generated

    Hi Guys,
    I am facing the problem with when i execute the program in background,spool is not generated.
    if execute it in foreground output is displaying.
    Please help me on this issue.
    Thanks,
    Bala

    Hi soumya,
    after call transaction i have used write statement and submit the report in the BDC program.
    BDC report is displaying the IM52 update budget orders in the output of the report.
    Thanks,
    Bala

  • Spool error for background job

    Hi All,
    I have scheduled one job in sap for a report.I have made a distribution list via tcode SO01.
    I have given this distribution list to the SPOOL RECEPIENT section in SM 36.
    The job is running successfully but is giving the following error and not sending emails to the distribution list.
    The error is :-
    "Spool list of step 1 could not be sent due to error 7".
    Does anybody has any idea about this error?
    Please help its a production issue.
    Thanks in advance
    Vivekanand Meghmala

    Look at SAP note : 760838
    Symptom
    Background job spool lists are not sent.
    Other terms
    RSBTCRTE, RSPO_SPOOLJOB_TO_OFFICE, SO_DOCUMENT_SEND_API1
    Reason and Prerequisites
    1. The jobs in question have recipient references in table TBTCO but these have no equivalent in the Business Object Repository.
    2. An error occurs when sending in the spool or in the Sapconnect layer.
    Solution
    This note does not provide a direct solution to the problem but it does provide a source code enhancement that you can use to create more trace information about the cause of the error. When you copy and execute a job with spool list recipients, trace messages are output when errors occur.
    After implementing the correction instructions, use transaction SE91 to create the following message:
    Message class: BT
    Number: 347
    Text: Spool list of step &1 could not be sent due to error &2.
    In detail, the error numbers mean:
    1 = Spool request does not exist (or no longer exists)
    2 = Spool request does not contain any data
    3 = Empty page area selected
    4 = No authorization to send the request
    5 = Access to the spool request is not possible
    6 = Read error in the Temse layer
    7 = Spool request could not be sent (sending problem)
    8 = Incorrect request type
    9 = Other

  • Need to know how to find out the Variant associated with a background job

    Hello,
    Plz help me in finding out how to find the variant associated with a background job. I need to know which variant does the program picks up when it runs the scheduled background job. There are so many variants that exist. How do I figure out which one is being picked up by the program. When I go and see into the job that are already finished it shows the parameter as "&00000000645354" which I do not understand what it corresponds to. I was expecting a variant name instead of this number in the parameter field. Is there a way I can find out the name of teh variant the program is using automatically in the background job ??
    Thanks in anticipation

    Yes it is possible which is variant, input fields are choosen
    - go to SM37 and locate the background job which was processed using proper selection criteria
    - select the Job and click on 'Step' button availabe in the screen
    - the new screen is 'step list overview'. now, place the cursor on selected variant avaialble on the screen, then from Menu >> Goto>> variant
    which gives the list of input values.
    hope this helps
    Thanks
    JK

  • Re: Background job

    Hi,
           In my program iam using this function call function 'LIST_TO_ASCI'
      so what ever the output placed in list is transfered to end customer in the textfile format , my problem is when i set in background job, some records are missing , is there any restrictions for setting column and row size
        REPORT  ZDEVTESTING
      NO STANDARD PAGE HEADING
                              LINE-SIZE 275
                              LINE-COUNT 80
                              MESSAGE-ID YMSG.
    INCLUDE Y_INCLUDE_FTP_V01.
    TYPE-POOLS : SLIS.
    TYPE-POOLS: SLIST.
    TABLES: LIKP,
            LIPS,
            LFA1,
            VBKD,
            KNA1,
            ADRC,
            VBAP,
            KNVK,
            T005T,
            ZMMGRINFO,
            ZSDDOITEM,
            ZPASPACKLIST,
            ZSDPACKINFO_V1.
    DATA : BEGIN OF TEM_ITAB OCCURS 0,
           VBELN LIKE LIKP-VBELN,
           END OF TEM_ITAB.
    DATA: V_LOTID(15) TYPE C,
          V_TOT_LFIMG(30),
           V_COUNTRY_TEXT(15),
           TEMP_CHARG,
           L_NTGEW LIKE ZSDPACKINFO_V1-NTGEW,
           L_LFIMG LIKE LIPS-LFIMG.
    DATA: BEGIN OF ITAB OCCURS 0,
            VBELN         LIKE LIKP-VBELN,               "UTAC DO NO
            CUSO(30),                                    "CUSTOMER SO
            CUIN(10),                                    "CUSTOMER PART NO
            POSNR         LIKE LIPS-POSNR,               "ITEM NO
            ARKTX         LIKE LIPS-ARKTX,               "ShortTextforSOITEM
            LFIMG         LIKE LIPS-LFIMG,               "QTY
            WADAT_IST     LIKE LIKP-WADAT_IST,           "DO DATE
            VBELN1        LIKE LIKP-VBELN,               "UTAC PO NO
            NAME1         LIKE KNA1-NAME1,               "SHIPPING NAME
            NAME2         LIKE ADRC-NAME1,               "Billing Name
            FNAM(35),                                    "Forwarder Name
            LIFNR         LIKE LFA1-LIFNR,               " Forwarder
            MAWB(40),                                    "MAWB Number
            HAWB(40),                                    "HAWB Number
            FLNO(70),                                    "Flight Number
            ZCUST_LOTID   LIKE ZMMGRINFO-ZCUST_LOTID,    "CUSTLOTID
            CHARG         LIKE LIPS-CHARG,               "UTACLOTID
            ZDATECODE     LIKE ZMMGRINFO-ZDATECODE,      "UTAC DATE CODE
            ZU_COO        LIKE ZMMGRINFO-ZU_COO,         "COUNTRY OF ORIGIN
            V_BTGEW(19),                                 "GROSS WEIGHT
            V_NTGEW      LIKE ZSDPACKINFO_V1-NTGEW,      "Net Weight
            V_CTN1       LIKE ZSDPACKINFO_V1-ZU_CTN_NUM, "CARTON NUMBER
            V_DIM(15),                                   "CARTON DIMENSION
            KUNAG         LIKE LIKP-KUNAG,               "Sold-to-Party
            V_QTY1(30),
            V_QTY2(30),
            V_QTY3 LIKE  LIPS-LFIMG,
            V_QTY LIKE  LIPS-LFIMG,
            V_QTY4 LIKE  LIPS-LFIMG,
            V_QTY5(30),
            ADRNR         LIKE KNA1-ADRNR,
            BSTKD         LIKE VBKD-BSTKD,               "CUST PO
            MATNR         LIKE LIPS-MATNR,               "MATERIAL
            WERKS         LIKE LIPS-WERKS,               "PLANT
            V_CTN(4),
            V_TOTCTN(4),
            NTGEW  LIKE ZSDPACKINFO_V1-NTGEW,
            NTGEW1(30),
            SHPN(35),                                    "CUSTOMER NAME
            KUNNR LIKE LIKP-KUNNR,                       "SHIP-TO-PARTY
      END OF ITAB.
    DATA : BEGIN OF ITAB1 OCCURS 0.
            INCLUDE STRUCTURE ITAB.
    DATA : END OF ITAB1.
    DATA: BEGIN OF S_DATA OCCURS 0,
            CUSO(30),                                    "CUSTOMER SO
            CUIN(10),                                    "CUSTOMER PART NO
            POSNR         LIKE LIPS-POSNR,               "ITEM NO
            ARKTX         LIKE LIPS-ARKTX,               "ShortTextforSOITEM
            LFIMG         LIKE LIPS-LFIMG,               "QTY
            KUNAG         LIKE LIKP-KUNAG,               "Sold-to-Party
            V_QTY1(30),
            V_QTY2(30),
            WADAT_IST     LIKE LIKP-WADAT_IST,           "DO DATE
            VBELN         LIKE LIKP-VBELN,               "UTAC DO NO
            VBELN1        LIKE LIKP-VBELN,               "UTAC PO NO
            NAME1         LIKE KNA1-NAME1,               "SHIPPING NAME
            NAME2         LIKE ADRC-NAME1,               "Billing Name
            LIFNR         LIKE LFA1-LIFNR,               " Forwarder
            FNAM(35),                                    "Forwarder Name
            MAWB(30),                                    "MAWB Number
            HAWB(30),                                    "HAWB Number
            FLNO(70),                                    "Flight Number
            ZCUST_LOTID   LIKE ZMMGRINFO-ZCUST_LOTID,    "CUSTLOTID
            CHARG         LIKE LIPS-CHARG,               "UTACLOTID
            ZDATECODE     LIKE ZMMGRINFO-ZDATECODE,      "UTAC DATE CODE
            ZU_COO        LIKE ZMMGRINFO-ZU_COO,         "COUNTRY OF ORIGIN
            V_BTGEW(19),                                 "GROSS WEIGHT
            V_NTGEW      LIKE ZSDPACKINFO_V1-NTGEW,      "Net Weight
            V_CTN1       LIKE ZSDPACKINFO_V1-ZU_CTN_NUM, "CARTON NUMBER
            NTGEW1(30),
            V_DIM(15),                                   "CARTON DIMENSION
            ADRNR         LIKE KNA1-ADRNR,
            BSTKD         LIKE VBKD-BSTKD,               "CUST PO
            MATNR         LIKE LIPS-MATNR,               "MATERIAL
            WERKS         LIKE LIPS-WERKS,               "PLANT
            V_QTY3 LIKE  LIPS-LFIMG,
            V_QTY LIKE  LIPS-LFIMG,
            V_QTY4 LIKE LIPS-LFIMG,
            V_QTY5(30),
            V_CTN(4),
            V_TOTCTN(4),
            NTGEW  LIKE ZSDPACKINFO_V1-NTGEW,
            SHPN(35),                         "Customer Name
            KUNNR LIKE LIKP-KUNNR,        " Ship-to-Party
       END OF S_DATA.
    DATA: HOST LIKE ZFTP-HOST,
          USERNAME LIKE ZFTP-USERNAME,
          PWD(100) TYPE C,
          PRGNAME LIKE ZFTP-PRGNAME,
          RDIRLOC LIKE ZFTP-RDIRLOC,
          LDIRLOC LIKE ZFTP-RDIRLOC,
          HANDLE TYPE I,
          FNAME(40) TYPE C,
          FAILED(1) TYPE C.
    DATA: L_OK(1) TYPE C,
          L_ERRMSG(150) TYPE C.
    DATA : T_ZMMGRINFO LIKE ZMMGRINFO OCCURS 0 WITH HEADER LINE.
    DATA:T_LINE LIKE TLINE OCCURS 0 WITH HEADER LINE,
         VBELN  LIKE THEAD-TDNAME.
    SELECTION-SCREEN BEGIN OF BLOCK B1 WITH FRAME TITLE TEXT-001.
    SELECT-OPTIONS :
                   S_KUNAG FOR LIKP-KUNAG DEFAULT 'BC1001'.
    PARAMETERS :   S_WADAT LIKE LIKP-WADAT_IST DEFAULT SY-DATUM.
    PARAMETERS: S_UPLOAD AS CHECKBOX DEFAULT 'X'.
    SELECTION-SCREEN END OF BLOCK B1.
    START-OF-SELECTION.
          PERFORM GET_DATA.
          PERFORM WRITE_DATA.
          PERFORM DOWN_DATA.
    *&      Form  GET_DETAILS
    FORM GET_DATA .
      SELECT  LIKP~VBELN
              LIPS~POSNR
              LIKP~WADAT_IST
              LIKP~KUNNR
              LIKP~KUNAG
              KNA1~NAME1
              KNA1~ADRNR
              VBKD~BSTKD
              LIPS~MATNR
              LIPS~CHARG
              LIPS~LFIMG
              LIPS~WERKS
              LIPS~VGBEL
              LIPS~ARKTX
                     INTO CORRESPONDING FIELDS OF TABLE ITAB
                      FROM LIKP
                      JOIN LIPS ON LIKPVBELN = LIPSVBELN
                      JOIN VBKD ON LIPSVGBEL = VBKDVBELN
                      JOIN KNA1 ON KNA1KUNNR = LIKPKUNNR
                  WHERE LIPS~LFIMG GT 0 AND
                        LIKP~KUNAG IN S_KUNAG AND
                        LIKP~WADAT_IST = S_WADAT
                  ORDER BY LIKP~WADAT_IST
                        LIKP~VBELN.
      LOOP AT ITAB.
        CALL FUNCTION 'Z_GET_CHAR_VAL'
          EXPORTING
            WERKS               = ITAB-WERKS
            MATNR               = ITAB-MATNR
            CHARG               = ITAB-CHARG
          IMPORTING
            ZMMGRINFO           = T_ZMMGRINFO
          EXCEPTIONS
            INVALID_COMBINATION = 1
            OTHERS              = 2.
        IF SY-SUBRC <> 0.
          MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
                 WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
        ENDIF.
        ITAB-ZCUST_LOTID  = T_ZMMGRINFO-ZCUST_LOTID.
        ITAB-ZDATECODE    = T_ZMMGRINFO-ZDATECODE.
        ITAB-ZU_COO       = T_ZMMGRINFO-ZU_COO.
    VBELN = ITAB-VBELN.
    *Extracting the Flight Number
        PERFORM READ_TEXT USING 'Z006' 'E' VBELN  'VBBK'.
        READ TABLE T_LINE INDEX 1.
        MOVE T_LINE-TDLINE TO ITAB-FLNO.
    Extracting the MAWB Number
        PERFORM READ_TEXT USING 'Z007' 'E' VBELN  'VBBK'.
        READ TABLE T_LINE INDEX 1.
        MOVE T_LINE-TDLINE TO ITAB-MAWB.
    Extracting the HAWB Number
        PERFORM READ_TEXT USING 'Z008' 'E' VBELN  'VBBK'.
        READ TABLE T_LINE INDEX 1.
        MOVE T_LINE-TDLINE TO ITAB-HAWB.
    Extracting the Carton Dimension
         PERFORM READ_TEXT USING 'Z013' 'E' VBELN 'VBBK'.
         READ TABLE T_LINE INDEX 1.
         MOVE T_LINE-TDLINE TO ITAB-V_DIM.
         CONCATENATE ITAB-V_DIM 'CM' INTO ITAB-V_DIM SEPARATED BY SPACE.
    PERFORM READ_TEXT USING 'Z015' 'E' VBELN 'VBBK'.
        DELETE T_LINE WHERE TDLINE = SPACE.
        IF NOT T_LINE[] IS INITIAL.
          READ TABLE T_LINE INDEX 1.
          MOVE T_LINE-TDLINE TO ITAB-CUSO.
        ENDIF.
    Customer PartNumber
          PERFORM READ_TEXT USING 'Z017' 'E' VBELN 'VBBK'.
          LOOP AT T_LINE.
            MOVE : T_LINE-TDLINE TO ITAB-CUIN.
          ENDLOOP.
    Extracting the Gross Weight
        PERFORM READ_TEXT USING 'Z022' 'E' VBELN 'VBBK'.
        READ TABLE T_LINE INDEX 1.
        MOVE T_LINE-TDLINE TO ITAB-V_BTGEW.
    *Qyantity in DO
    PERFORM READ_TEXT USING 'Z015' 'E' VBELN  'VBBP'.
        READ TABLE T_LINE INDEX 1.
        MOVE T_LINE-TDLINE TO ITAB-V_QTY.
    *UTAC PO NUMBER AND DO NUMBER
    MOVE ITAB-VBELN TO ITAB-VBELN1.
    *FARWORDER NAME
        SELECT SINGLE LIFNR INTO ITAB-LIFNR FROM VBPA
              WHERE VBELN = ITAB-VBELN AND PARVW = 'ZF'.
        SELECT SINGLE NAME1 INTO ITAB-FNAM FROM LFA1
                         WHERE LIFNR = ITAB-LIFNR.
        CONDENSE ITAB-FNAM.
        SELECT SINGLE * FROM KNA1 WHERE KUNNR = ITAB-KUNAG.
          IF SY-SUBRC = 0.
            ITAB-KUNNR = KNA1-KUNNR.
          ENDIF.
        SELECT SINGLE * FROM KNA1 WHERE KUNNR = ITAB-KUNNR.
          IF SY-SUBRC  = 0.
            SELECT SINGLE * FROM ADRC WHERE ADDRNUMBER = KNA1-ADRNR.
              ITAB-SHPN = ADRC-NAME1.
          ENDIF.
      SELECT SINGLE * FROM T005T
        WHERE LAND1 = ITAB-ZU_COO AND
                SPRAS = SY-LANGU.
        IF SY-SUBRC EQ 0.
          V_COUNTRY_TEXT = T005T-LANDX.
        ELSE.
          CLEAR V_COUNTRY_TEXT.
        ENDIF.
        MOVE ITAB-LFIMG TO ITAB-V_QTY1.
        TRANSLATE ITAB-V_QTY1  USING ','.
        CONDENSE ITAB-V_QTY1 NO-GAPS.
      MODIFY ITAB.
      CLEAR ITAB.
      ENDLOOP.
    ENDFORM.                      " GET_DETAILS
    ***&      Form  READ_TEXT
       Reading the text
    FORM READ_TEXT USING    P_ID   LIKE THEAD-TDID
                            P_LAN  LIKE THEAD-TDSPRAS
                            P_NAME LIKE THEAD-TDNAME
                            P_OBJ  LIKE THEAD-TDOBJECT.
      REFRESH T_LINE. CLEAR T_LINE.
      CALL FUNCTION 'READ_TEXT'
           EXPORTING
               CLIENT                  = SY-MANDT
                ID                      = P_ID
                LANGUAGE                = P_LAN
                NAME                    = P_NAME
                OBJECT                  = P_OBJ
           TABLES
                LINES                   = T_LINE
           EXCEPTIONS
                ID                      = 1
                LANGUAGE                = 2
                NAME                    = 3
                NOT_FOUND               = 4
                OBJECT                  = 5
                REFERENCE_CHECK         = 6
                WRONG_ACCESS_TO_ARCHIVE = 7
                OTHERS                  = 8.
    ENDFORM.                               " READ_TEXT
    *&      Form  WRITE_DATA
          text
    FORM WRITE_DATA.
    LOOP AT ITAB.
    MOVE-CORRESPONDING ITAB TO ITAB1.
    AT NEW VBELN .
        WRITE :/1 'ORDER'.
        WRITE : 6 SY-VLINE.
        WRITE : 7  ITAB1-CUSO LEFT-JUSTIFIED.
        WRITE : 17 SY-VLINE.
        WRITE : 18 ITAB1-CUIN LEFT-JUSTIFIED.
        WRITE : 24 SY-VLINE.
        WRITE : 25 ITAB1-ARKTX LEFT-JUSTIFIED.
        WRITE : 43 SY-VLINE.
        LOOP AT ITAB WHERE VBELN = ITAB1-VBELN.
        L_LFIMG = L_LFIMG + ITAB-LFIMG.
        ENDLOOP.
        WRITE : 44 L_LFIMG NO-GROUPING LEFT-JUSTIFIED.
        WRITE : 54 SY-VLINE.
        WRITE : 55 ITAB1-WADAT_IST LEFT-JUSTIFIED.
        WRITE:  65 SY-VLINE.
        WRITE : 66 ITAB1-VBELN LEFT-JUSTIFIED.
        WRITE:  76 SY-VLINE.
        WRITE : 77 ITAB1-VBELN1 LEFT-JUSTIFIED.
        WRITE : 87 SY-VLINE.
        WRITE : 88 ITAB1-NAME1 LEFT-JUSTIFIED. .
        WRITE : 123 SY-VLINE.
        WRITE : 124 ITAB1-SHPN LEFT-JUSTIFIED.
        WRITE : 159 SY-VLINE.
        WRITE : 160  ITAB1-FNAM LEFT-JUSTIFIED.
        WRITE : 204 SY-VLINE.
        IF ITAB1-HAWB <> ''.
        WRITE : 205  ITAB1-HAWB LEFT-JUSTIFIED.
        ELSE.
        WRITE : 205  ITAB1-MAWB LEFT-JUSTIFIED.
       ENDIF.
        WRITE : 245 SY-VLINE.
        WRITE : 246  ITAB1-FLNO LEFT-JUSTIFIED.
        WRITE : 266 SY-VLINE.
        CLEAR L_LFIMG.
    ENDAT.
        SELECT * FROM ZSDPACKINFO_V1 WHERE VBELN = ITAB-VBELN AND
        ZU_CTN_NUM NE '' AND ZU_LCHARG = ITAB-CHARG.
          MOVE ZSDPACKINFO_V1-LFIMG TO ITAB-V_QTY2.
          MOVE ZSDPACKINFO_V1-NTGEW TO ITAB-NTGEW.
          MOVE ZSDPACKINFO_V1-NTGEW TO ITAB-NTGEW1.
          MOVE ZSDPACKINFO_V1-ZU_CTN_NUM+6(4) TO ITAB-V_CTN.
          TRANSLATE ITAB-V_QTY2  USING ', '.
         CONDENSE ITAB-V_QTY2 NO-GAPS.
    MOVE-CORRESPONDING ITAB TO S_DATA.
    S_DATA-V_QTY4 = ITAB-V_QTY2.
    CLEAR S_DATA-V_QTY2.
    COLLECT S_DATA.
    ENDSELECT.
    LOOP AT S_DATA.
          WRITE :/1'LOT'.
          WRITE : 4 SY-VLINE.
          WRITE : 5  S_DATA-CUSO LEFT-JUSTIFIED.
          WRITE : 15 SY-VLINE.
          WRITE : 16 S_DATA-CUIN LEFT-JUSTIFIED.
          WRITE : 23 SY-VLINE.
          WRITE : 24 S_DATA-ZCUST_LOTID LEFT-JUSTIFIED.
          WRITE : 35 SY-VLINE.
          WRITE : 36 S_DATA-CHARG LEFT-JUSTIFIED.
          WRITE : 46 SY-VLINE.
          WRITE : 47 S_DATA-V_QTY4 NO-GROUPING LEFT-JUSTIFIED .
          WRITE : 57 SY-VLINE.
          WRITE : 58 S_DATA-ZDATECODE LEFT-JUSTIFIED.
          WRITE : 62 SY-VLINE.
          WRITE : 63 V_COUNTRY_TEXT  LEFT-JUSTIFIED.
          WRITE : 75 SY-VLINE.
          WRITE : 76 S_DATA-V_BTGEW  LEFT-JUSTIFIED.
          WRITE : 83 SY-VLINE.
          L_NTGEW = S_DATA-NTGEW1.
          WRITE : 84 L_NTGEW LEFT-JUSTIFIED.
          WRITE : 94 SY-VLINE.
          WRITE : 95 S_DATA-V_CTN LEFT-JUSTIFIED.
          WRITE : 99 SY-VLINE.
          WRITE : 100 S_DATA-V_DIM LEFT-JUSTIFIED.
          WRITE : 115 SY-VLINE.
    ENDLOOP.
    REFRESH S_DATA.
    ENDLOOP.
    ENDFORM.
    *&      Form  DOWN_DATA
          text
    -->  p1        text
    <--  p2        text
    FORM DOWN_DATA.
      DATA : P_FILE(128) TYPE C.
      DATA:  P_FNAME(100).
      data abap_list like abaplist occurs 1.
    DATA : BEGIN OF IFILE OCCURS 0,
           TEXT(1023) TYPE C,
           END OF IFILE.
    PRGNAME = SY-CPROG.
    CONCATENATE   '/home/sapifc/custrept/' 'IDT_' SY-DATUM  '_' '2245' '.txt' INTO P_FILE.
    call function 'LIST_TO_ASCI'
        exporting
          list_index         = sy-lsind
        tables
          listasci           = IFILE
          listobject         = abap_list
        exceptions
          empty_list         = 1
          list_index_invalid = 2
          others             = 3.
      if sy-subrc <> 0.
      endif.
    OPEN DATASET P_FILE FOR OUTPUT IN TEXT MODE ENCODING DEFAULT.
      IF SY-SUBRC = 0.
         LOOP AT  IFILE.
          TRANSFER IFILE TO  P_FILE.
        ENDLOOP.
      ENDIF.
      CLOSE DATASET P_FILE.
    ENDFORM.

    HI,
    The width of spool can be of max. 255 size.
    In your case, you are displaying data at 266 also (THe WRITE statement).
    Try to fit all the columns within 255 width.
    Best regards,
    Prashant

  • Scheduled Background jobs after Client Copy

    Hello,
    I've been doing some searching online and I don't seem to be able to find a definitive answer to this question:
    Are background jobs client specific?
    I've seen some discussions on here say some are and some are not.  I've also seen a discussion that says ALL background jobs are client specific.
    It's really related to non-SAP background jobs after a client copy.
    If I have a client 100 in QA with half a dozen non-SAP standard jobs configured, and I create client 110 in QA and perform a remote client copy from PROD into client 110 on QA, will my non-SAP standard backgrounds run in Client 110, or do I need to set them all up again?
    Thanks

    Hello All
    If I have a client 100 in QA with half a dozen non-SAP standard jobs configured, and I create client 110 in QA and perform a remote client copy from PROD into client 110 on QA, will my non-SAP standard backgrounds run in Client 110, or do I need to set them all up again?
    Yes. You will need to set those non standard jobs in the new client. When you schedule a job there will be a reference to the client where the job will be executed is stored under AUTHCKMAN in the table TBTCO. If the job is scheduled periodically then the job is executed only on the client where it is scheduled.
    I used SAP_ALL profile when performing the client copy.  So my scheduled jobs WILL have been copied along with everything else? Is that correct?
    In SAP_ALL profile the background jobs will be coming from source client not from QA client 100.
    No. Background jobs are not transportable and will not be copied during a client copy. Job definitions are client independent.
    Read these SAP notes.
    31503 - FAQ: Background jobs
    51135 - Why are bkgd processing jobs not generally transportable?
    If you want to schedule those jobs in the new client the follow the suggestion in the SAP note 3150 point 6.
    Regards
    RB

  • RSCRMBW_REPORT Background Jobs & Process Chain

    Hello Everyone,
    I have a program in a process chain that runs a query through rscrmbw_report. The program is the first step in the chain, followed by a DTP. When we have previously ran this program in our production box, we found that the we did not get all of the data from the query. We believe the fault is with the DTP running asynchronous to the background jobs of RSCRMBW_REPORT- In SM37, we believe we have found jobs from the report positioned before and after the DTP job.
    I've made some slight changes and on a small volume of data (~1000), the chain works with no issue. However, I am concerned with dealing with a large number of records (~1,000,000+). As of now, I'm not sure I believe the analysis of the background jobs because there are still jobs that appear before and after the DTP, but the data is consistant between the destination of the DTP and the query.
    Any advice on how to ensure those jobs run before my DTP? I've tried using commit work and wait, which I believe works because the DB should be open while the query jobs are running and I believe that the statement will wait for those jobs to finish before proceeding out of the code and to the DTP.
    Thanks & Regards,
    Christian

    HI,
    The background control options are available to directly schedule the start process. You can start the process chain immediately (when activating the process chain), at a specified time, or after a particular event. When you activate the process chain the start process is scheduled in the background, as defined in your selections.
    If there are not sufficient options available, you can trigger the start of the process chain using API. You can use the SAP NetWeaver Scheduling Framework to start the chain and to have more extensive scheduling options.
    You can also trigger the start of a process chain using a metachain. A metachain is a process chain, for which you determine this start condition, that is fixed to another process chain. The process chain is started directly by this metachain.
    Tarak

  • Logic or FM to fetch Background Jobs

    Hi,
    There is a reqmt to fetch the background jobs from tables TBTCO.
    Here inthe selection screen planned start date to be given and program need to fetch the jobs which were run till previous day data from the table .
    Background job logs however are cleaned-up every week.
    How to achieve this, any pointer pls.
    Thanks
    Moderator Message: please work yourself first on your requirement.
    Edited by: Thomas Zloch on Dec 13, 2010 12:29 PM

    hi,
    after entering output type and giving all the necessary parameters before saving put /h and press enter and save now
    wait here......
    in debugging screen select settings tab and check update debugging check box and save and press F8 now the control will stop at the break point.
    i think this is clear.
    reward points if useful.
    thanks,
    anupama.

  • Variants for background jobs

    You need to schedule and automate batch jobs in an organisation. There will be multiple variants and multiple steps within same batch jobs. The variants are date dependent and needs to change every day. You need to automatically change the variants every day and schedule the jobs. Also check for the failures in the jobs. Apart from that Once the jobs in one server example : R/3 server ends the jobs in BW servers should be triggered automatically. Explain all steps with proper T codes and also provide a dry run example. Also provide all the table used for the variants purpose.
    Please help on this,thanks
    Narendra

    Hi Narendra,
    The background jobs are scheduled depending on the requirement with specific variants which are both date specific and even specific sometimes. These variants are created for the programs or reports which are run in the background job ,These variants are stored in VARID table for client specific variants and
    VARID_CI for client independent. For most of the times all these jobs are maintained in some job scheduling tools so that they automatically inform about job failures and processes can be automated.In our organisation we use UC4 for background job schedulign and it controls the process as you are looking for.
    Please award points accordingly
    With Regards,
    Junaid
    Message was edited by:
            muhammed junaid

  • Regarding Variants for Background jobs

    Hi Folks
    Can you please let me know the procedure how we can create the variants for Background jobs.
    Points are assured for correct answers.
    Regards,
    kumar

    Hi Sree Ram,
    Check this info.
    If you have any selection screen parameters for your program you need to enter the values for those fields in runtime. So, if you schedule your program in background to execute then there is no one to do this job. Here comes the concept of Variant.
    With variant you define what are the selection field values in the runtime. During runtime the program picks this values and runs the program.
    When you execute your program which has selection fields, you enter the values and then you click on 'GO TO ' tab and 'SAVE AS VARIANT'.
    When you schedule your program in background, give this variant also. Then it will run automatically.
    Hope this resolves your query.
    Reward all the helpful answers.
    Regards

  • How we can done background job in web dynpro abap

    Hi expert,
    my requriment is how i can set background job in web dynpro .
    regard's
    vikash

    The same way you do it in normal ABAP. There is nothing Web Dynpro ABAP specific about starting a background job.
    There are API Function modules that begin with the name JOB_*.  Have a look at the online help for samples:
    http://help.sap.com/saphelp_nw70ehp1/helpdata/en/fa/096d40543b11d1898e0000e8322d00/frameset.htm
    http://help.sap.com/saphelp_nw70ehp1/helpdata/en/fa/096d4d543b11d1898e0000e8322d00/frameset.htm
    http://help.sap.com/saphelp_nw70ehp1/helpdata/en/fa/096d67543b11d1898e0000e8322d00/frameset.htm
    http://help.sap.com/saphelp_nw70ehp1/helpdata/en/fa/096d74543b11d1898e0000e8322d00/frameset.htm
    http://help.sap.com/saphelp_nw70ehp1/helpdata/en/fa/096d8e543b11d1898e0000e8322d00/frameset.htm
    http://help.sap.com/saphelp_nw70ehp1/helpdata/en/fa/096ce5543b11d1898e0000e8322d00/frameset.htm

  • Problem in getting spool number of a background job.

    Hi all,
    In a Z program I am calling a standard program to run as background job. I need to get the report o/p of the standard program. For this I need the spool no of the background job. Now I am querying on table tbtcp by giving jobname. Program name and run date and getting the spool no. but the cache is that the table is not getting updated with the spool no as soon as the job finishes. It is taking some time to update the table ( The time depends on the no of background jobs scheduled. ). So of we query on the table immediately after the background job finishes we are getting spool no as 0. so I am unable to read the spool into Internal tables. Even the table tsp01 is also behaving in the same way. ( it is taking time to update ) .
    Any pointers to this will be appreciated .
    Regards,
    Shiva....

    This is some prototype that I put together from separate pieces, so it looks funky, but might be helpful. The first step is to SUBMIT the program with EXPORTING LIST TO MEMORY. The next FM reads the list from memory and the next one (optional) converts it to a text format. You might want to search for other FMs in SE37 by 'LIST*'.
    DATA list_tab TYPE TABLE OF abaplist.
    SUBMIT RPR_TRIP_HEADER_DATA
    USING SELECTION-SET 'OLD_LIST'
    EXPORTING LIST TO MEMORY
                  AND RETURN.
    CALL FUNCTION 'LIST_FROM_MEMORY'
      TABLES
        listobject = list_tab
      EXCEPTIONS
        not_found  = 1
        OTHERS     = 2.
    types : t_txt(1000) type c.
    DATA: i_txt2 type table of t_txt,
    i_txt type list_string_table.
    call function 'LIST_TO_ASCI'
    EXPORTING
    *   LIST_INDEX               = -1
       WITH_LINE_BREAK          = 'X'
    IMPORTING
       LIST_STRING_ASCII        = i_txt
    *   LIST_DYN_ASCII           =
    TABLES
       LISTASCI                 =  i_txt2
       LISTOBJECT               = list_tab
    EXCEPTIONS
       EMPTY_LIST               = 1
       LIST_INDEX_INVALID       = 2
       OTHERS                   = 3
    if sy-subrc <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
             WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    endif.
    Also check this links:
    http://sap.ittoolbox.com/groups/technical-functional/sap-dev/spool-number-of-previously-printed-abap-list-635173#

  • Background Job " RDDVERSI" getting terminated

    Hi gurus,
    When we check in SM37, We are seeing a background job that is getting terminated. In the job log it says DATASET_NOT_OPEN, Job cancelled. It is trying to run "RDDVERSI" program.
    It is creating a Dump in ST22 and when we check the Dump in ST22, it says "The file "/usr/sap/trans/tmp/D01V985854.P01" has not been opened".
    I checked the log in the trans directory and it gives me following error. Path of the Log "usr/sap/trans/log/D01V985854.P01".
    1AEPU320 See job log"RDDVERSI""07435800""P01"
    1 ETP184 CREATE VERSIONS BEFORE IMPORT
    1 ETP110 end date and time   : "20070912074448"
    1 ETP111 exit code           : "12"
    1 ETP199 ######################################
    1 ETP199X######################################
    1 ETP184 CREATE VERSIONS BEFORE IMPORT
    1 ETP101 transport order     : "D01K985854"
    1 ETP102 system              : "P01"
    1 ETP108 tp path             : "tp"
    1 ETP109 version and release : "340.16.24" "640"
    1 ETP198
    1AETR012XProgram terminated (job: "RDDVERSI", no.: "07460000")
    1AEPU320 See job log"RDDVERSI""07460000""P01"
    1 ETP184 CREATE VERSIONS BEFORE IMPORT
    1 ETP110 end date and time   : "20070912074651"
    1 ETP111 exit code           : "12"
    1 ETP199 ######################################
    I think when it is trying to import a transport request, it is trying to create a version of it  and it is not able to create that.
    Can anybody help me in solving this problem?
    Any Help is appreciated
    Regards,
    Swaroop.

    Can you run this program in the foreground with a user that has the same permissions. If you get an authorization error again, check with transaction se53 on which objects you are missing authorization.
    For these objects you can create an additional authorization profile...
    Kind regards,
    Mark

  • Background Job Terminating with Signal 4 received by operating system

    Hi ,
    There is a zee ABAP program which is working fine in foreground  but the same was not working at BACKGROUND when I shedule the job with the same zee ABAP program. the job is terminating with "Job also cancelled due to process termination. See the system log" But the same was worked previous at background too, there are no changes to the program too.The problem was with only this zee ABAP program for remaining are all working fine.
    St22:
    An SAP System process was terminated by an operating system signal.
    Possible reasons for this are:
    1. Internal SAP System error.
    2. Process was terminated externally (by the system administrator).
               Last error logged in SAP kernel
    Information on where termination occurred
    The termination occurred in the ABAP/4 program "ZSDUZ980" in
    "ADD_NO_ACTIVITY_RECORDS".
    The main program was "ZSDUZ980".
    The termination occurred in line 1174
    of the source code of program "ZSDUZ980" (when calling the editor 11740).
    The program "ZSDUZ980" was started as a background job.
    Component............ "Taskhandler"
    Place................ "SAP-Server witco-10_NCQ_00 on host witco-10 (wp 1)"
    Version.............. 1
    Error code........... 11
    Error text........... "ThSigHandler: signal"
    Description.......... " "
    System call.......... " "
    Module............... "thxxhead.c"
    Line................. 7209
    The error reported by the operating system is:
    Error number..... " "
    Error text....... " "
    System Environment
    SAP Release.............. "31I"
    Operating system......... "AIX"
    Database type............ "ORACLE"
    SAP kernel............... "31I"
    SAP database version..... "31I"
    Thanks
    Sambi

    Hi Mark,
    Thanks for the reply,
    Below are the memory details in our system, according to the Notes you send to me, They have set it as it is.
    abap/heap_area_dia                          188743680
    abap/heap_area_nondia                       400556032
    abap/heap_area_total                        838860800
    abap/heaplimit                              25165824
    The same Zprogram was worked before in the BAckground, But from last week it stop working. But there are no chages happen to this zee ABAP program.
    Thanks
    Sambi

  • Background  job terminated in LSMW last step

    Experts:
    When I run the last step in LSMW: 13 Start Direct Input Program,
    I set a background job for Trans:BMV0,
    But it goes an error:
    "Job started
    Step 001 started (program RMDATIND, variant....)
    Could not open file xxxx.lsmw.conv
    Job cancelled after system exception ERROR_MESSAGE"
    could you tell me possible reasons for this error?thank you!

    Ichecked the file assignment in step seven.
    what file path and name did you define for the converted file? is this located on your PC or on the application server?
    did you execute step 11?
    did step 11 tell you that SAP had written xxx records to the conv-file?
    The file path is on the application server
    yes,I executed it.
    Transactions Read:                9,066
    Records Read:                    50,324
    Transactions Written:             9,046
    Records Written:                 50,228

Maybe you are looking for

  • Hi there, I have a iphone 3gs and it wants to upgrade to the ios6 software, and you can't even use the phone now. My question is, how do i get out of the software update?

    Hi there, My partner owns an iphone 3gs, and was working fine yesterday, but now it doesnt want to work, as it is stuck on the new software update. How do i get passed this? I have tried plugging it into my computer as it was saying, connect to itune

  • Numeric value in words (for Cheque printing)

    Hi All, To convert numeric value in words (for Cheque printing), I created two functions in Forms and reports 6i. 1) FUNCTION Spell (val number) RETURN CHAR IS sp varchar2(100); BEGIN if val > 0 then      return(initcap(to_char(to_date(val, 'SSSSS'),

  • Binary Search Help

    Below is the coding for the binary search: public class Binary_Search_ public int binarySearch(int arr[],int key) int low=0; int high=arr.length-1; while(low<=high) int middle=(low+high)/2; if(key==arr[middle]) return middle; else if(key<arr[middle])

  • Restricting Non Valuated Stock

    Hello Gurus, I want to restrict the posting of Non Valuated materials to an Internal order. It would be nice of you if anyone can provide me a solution in this regards. If the solution is creating a validation, could you provide me the "Step by Step

  • AXL Play Uri

    If there anyway to play raw files that aren't in the TFTP path?? Thanks in advance