Count of background jobs

Dear users,
I Have a couple of questions.
1) Is there a way to find the list of custom developed (Z* or Y*) programs executed in the background in a specific period?
2) Given a function module name, is there a way to find the list of programs using it (not using the where used list). I mean something using tools like Code inspector.
Kindly help.
Thanks and Regards
Ravi

Hello Ravi
Please use transaction SM37 with Prog name as Z* and execute...
Another way to find the transactions executed by users within a particular timeframe is to use FM SAPWL_WORKLOAD_GET_STATISTIC or use transaction ST03 and click on 'Transaction profile' ...
Regards,
Arun

Similar Messages

  • How to get Current Background Job name and Job Count programmically?

    Hi all,
            I have a requirement wherein I need to get the Current Background Job name and Job Count in the program and store it in a custom table. In other words, whenever I schedule a particular program ( This is a Std program) in background, I need to update this table with the Job Name and Job Count. This will be used by another program later to read the Job Information from table TBTCO. TBTCO has key fields Job Name and Job ID. The sheduled program will be a SAP standard program and I'll be writing the logic to get the info in an Implicit Enhancement Spot.
    Is there anyway I can do this? Any FM to get this information?
    Thanks,
    Mahesh.

    Hey Adrian,
                             Thanks a lot. This is what exactly i was looking for. Appreciate it.
    Mahesh.

  • How to cancel the background job processing in ABAP programming?

    Hi,
    I have a requirement where i need to cancel the job depending on some constraint. My code is something like this:
    Select some data from the table.
    if sy-subrc = 0.
    Do nothing.
    Else
    Cancel the job
    call function 'BP_JOB_ABORT'
      exporting
       jobcount                         = number
        jobname                          = name
    EXCEPTIONS
       CHECKING_OF_JOB_HAS_FAILED       = 1
       JOB_ABORT_HAS_FAILED             = 2
       JOB_DOES_NOT_EXIST               = 3
       JOB_IS_NOT_ACTIVE                = 4
       NO_ABORT_PRIVILEGE_GIVEN         = 5
       OTHERS                           = 6
    The above code is cancelling the job but it is throwing an exception called CX_SY_DYN_CALL_PARAM_MISSING because i dint pass job count. How can we find the job count of next job that is going to run? Or How to handle the exception which it is throwing. Even if i try to handle that exception something like this:
    TRY
    call function 'BP_JOB_ABORT'
      exporting
       jobcount                         = number
        jobname                          = name
    EXCEPTIONS
       CHECKING_OF_JOB_HAS_FAILED       = 1
       JOB_ABORT_HAS_FAILED             = 2
       JOB_DOES_NOT_EXIST               = 3
       JOB_IS_NOT_ACTIVE                = 4
       NO_ABORT_PRIVILEGE_GIVEN         = 5
       OTHERS                           = 6
    RAISE EXCEPTION TYPE CX_SY_DYN_CALL_PARAM_MISSING.
    CATCH
    CX_SY_DYN_CALL_PARAM_MISSING.
    ENDTRY.
    It avoids the exception but it doesnt cancel the job.  I even tried with function modules like JOB_OPEN
    JOB_SUBMIT,BP_JOB_SELECT,BP_JOB_ABORT and tried to build some logic using status overview table (TBTCO) and TBTCP (Jobstep overview table).
    Can someone suggest me the right way to write this program ?
    Thanks in advance.
    Rashmi

    Hi,
    Problem is solved.
    Create an background job with 2 steps. The first step in the background job calls the program ZBACKJOB_STEP1.  In the variant we have a wrong material number
    If the material number is not found in Mara, the next step in the job should not get executed and the job should get cancelled..
    In the above posts i had asked how do I get the job count of the job that is currently triggering the program at the runtimeu2026..If u see the below code uu2019ll get to know.. We have to use the standard structure TBTCM which captures the properties/characteristics of the job.
    REPORT ZBACKJOB_STEP1.
    TABLES: MARA,TBTCM.
    PARAMETERS : MATNR TYPE MATNR.
    START-OF-SELECTION.
      SELECT SINGLE * FROM MARA WHERE MATNR = MATNR.
      IF SY-SUBRC IS INITIAL.
        WRITE / : 'This is the material selected on the selection-screen' , MARA-MATNR.
    ELSE.
            CALL FUNCTION 'GET_JOB_RUNTIME_INFO'
          IMPORTING
            EVENTID                                    = TBTCM-EVENTID
            EVENTPARM                             = TBTCM-EVENTPARM
            EXTERNAL_PROGRAM_ACTIVE = TBTCM-XPGACTIVE
            JOBCOUNT                                = TBTCM-JOBCOUNT
            JOBNAME                                  = TBTCM-JOBNAME
            STEPCOUNT                              = TBTCM-STEPCOUNT
          EXCEPTIONS
            NO_RUNTIME_INFO                    = 1
            OTHERS                                     = 2.
        IF SY-SUBRC = 0.
          CALL FUNCTION 'BP_JOB_ABORT'
            EXPORTING
              JOBCOUNT                                     = TBTCM-JOBCOUNT
              JOBNAME                                       = TBTCM-JOBNAME
            EXCEPTIONS
              CHECKING_OF_JOB_HAS_FAILED  = 1
              JOB_ABORT_HAS_FAILED              = 2
              JOB_DOES_NOT_EXIST                   = 3
              JOB_IS_NOT_ACTIVE                      = 4
              NO_ABORT_PRIVILEGE_GIVEN       = 5
              OTHERS                                         = 6.
          IF SY-SUBRC <> 0.
          ENDIF.
        ENDIF.
      ENDIF.
    Regards,
    Rashmi

  • Some background jobs not shown in SM37

    Dear Friends,
    Some of my background jobs are not shown or visible in SM37. But, it is available in TBTCO, TBTCP & TBTCS tables. These jobs are scheduled in daily basis. These tables having records for all days of missed jobs.
    I dont know, why it is not comming in SM37. I tried in many search parameters in SM37 like prog. name, date and so on.
    These missed background jobs are not comes in spooler (SP01) also.
    Kindy, suggest me to find out the missed background jobs.
    Thanks in advance
    Regards,
    Rajagopal
    Chennai - INDIA.

    Hi rajagopalan,
    Normally this should not happen. Make sure the following in sm37:
    a. The start date is :  01.01.1800
    b. The end date is : 31.12.9999
    c. All the checkboxes (six checkboxes) are ticked.
    d. username = your username
    e. jobname = *
    SM37 gets records from the view V_OP (containing TBTCO and TBTCP)
    and filters for username using the field SDLUNAME.
    So you can basically cross-check if the count is atleast correct or the jobs were of different user (fieldname in the view/table) etc. (From SM37, you can export to excel and check the count)
    regards,
    amit m.

  • Data capturing in background job scheduling

    HI,
    I hava a specific requirement in background job scheduling.
    in my layout i have to show <b>pagenumber / total number of page numbers.</b>
    for that iam useing a variable with value '$$$' and iam replacing this variable with total number of pages..
    when we run in foreground it is working fine. but in background the variable is not being replaced..
    how can i modify the data in spool..

    REPORT ztest no STANDARD PAGE HEADING
                                     MESSAGE-ID zfi
                                     LINE-COUNT 65(1)
                                     LINE-SIZE 165.
    DATA:        v_sum(3)  TYPE c VALUE'$$$'.
    CONSTANTS:  c_slash    TYPE c VALUE '/'.        "Stores /
    parameters : p_1 type c.
    START-OF-SELECTION.
      WRITE : 'Hi'.
      SKIP 80.
      WRITE : 'Helloo'.
    END-OF-SELECTION.
    *To print the total no. of pages in report heading.
      PERFORM f_replace_totpage.
      TOP-OF-PAGE
    TOP-OF-PAGE.
    Display Standard Report Header
      PERFORM f_report_header.
    *&      Form  f_replace_totpage
         To print the total no. of pages in report heading.
    FORM f_replace_totpage .
      DATA: l_tot_page(3) TYPE c,
            l_pgcnt TYPE i,
            l_licnt TYPE i VALUE '3'.
    Assign value of total number of pages into l_tot_page.
      l_tot_page = sy-pagno.
    To replace the value of v_sum ($$$) by total number of pages after
    reading the content of fourth line of each page.
      WHILE l_pgcnt LE l_tot_page.
        l_pgcnt = l_pgcnt + 1.
        READ LINE l_licnt OF PAGE l_pgcnt.
        REPLACE v_sum WITH l_tot_page INTO sy-lisel.
        MODIFY LINE l_licnt OF PAGE l_pgcnt.
      ENDWHILE.
      CLEAR: l_tot_page,
             l_pgcnt,
             l_licnt.
    ENDFORM.                    " f_replace_totpage
    *&      Form  f_report_header
          Report Header display
    FORM f_report_header.
      FORMAT COLOR 1 INTENSIFIED ON.
    Text-246 - Page:
    WRITE:/1 text-247, 45 text-241, 110 text-242, 150 space.
    WRITE:/1 text-243, sy-repid, 110 text-244, sy-datum, c_slash, sy-uzeit,
             150 space.
      WRITE:/1 text-245, sy-uname, 110 text-246, sy-pagno,c_slash,v_sum,
             150 space.
      FORMAT COLOR OFF.
      ULINE.
    ENDFORM.                    " f_report_header

  • 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

  • Custom Background Job Cancelling

    Hi Folks,
    I'm working on a custom development and I'm experiencing some trouble - I would greatly appreciate any help / effort from anyone in providing me with some ideas as to what the cause may be.
    Basically my development is made up of two parts - Part 1) A custom RFC used to trigger a custom program in the background - here i'm using job_open / submit program / job_close. This works fine and a job is successfully created to run the custom program
    Part 2) - The custom program, running in the background job tries to create a background job  to trigger standard program (f.05) with a variant. Again using job_open / submit program / job_close. However on this occassion when the second background job starts it cancels immediately -  stating "Make an entry in all required fields". . However the variant is fine and all the parameters for the standard program are filled. I can even trigger this program and variant seperately and it works.
    Are there conflicts in creating a background job from a background job ? I'm confused as to why this is not working and i would appreciate any help or ideas anyone could give me on this.
    Thanks alot for your time.
    Regards
    DK
    Overview
    RFC -> Create Background Job # 1 -> Background Job # 1 created successfully - Custom program running in Background Job # 1 tries to run standard program in backgroun - Background Job # 2 created successfully but immediately cancels - Job log message - "Make an entry in all required fields". Job cancelled after system exception ERROR_MESSAGE.

    Hi Guys,
    Thanks for your answers. The job log does say "Make an entry in all required fields" - but all the required fields are specified under the variant. I can even run this program with the same variant with no problems. I'm wondering what would affect the submit to program to prevent it passing the variant correctly - here is my submit
        SUBMIT sapf100 VIA JOB l_jobnam NUMBER l_jobcnt
        USING SELECTION-SET l_vari
        AND RETURN.
    l_vari = Variant Name
    l_jobname = job name
    l_jobcnt  = job count
    here is the message from the job log. your help is appreciated - thanks
    10.09.2009 14:22:18 Job started                                                             
    10.09.2009 14:22:18 Step 001 started (program SAPF100, variant &0000000000018, user ID XXXX)
    10.09.2009 14:22:18 Make an entry in all required fields                                    
    10.09.2009 14:22:18 Job cancelled after system exception ERROR_MESSAGE

  • Background job RDDIMPDP is not scheduled. Please run report RDDNEWPP.

    Dear Guru's,
                     I am having a problem during transportation. i am not able to transport to quality system.And the tp system logs shows following error messages:-
    WARNING: System GNQ. Warning.        20071105123442 :
    ERROR:       Background job RDDIMPDP is not scheduled. Please run report RDDNEWPP.
    ERROR:       I'm waiting 100 sec (Count: 1).
    WARNING:       (This warning is harmless if no further warnings follow.)
    Please help.
    Regards
    Akif

    Re: Importing trans request failed
    Re: Transports Erroring
    Re: What is RDDIMPDP .....
    have a look it may help you
    Message was edited by:
            Vinod Udapudi
    Message was edited by:
            Vinod Udapudi

  • Error in MRP Run- Background Job.

    Hi PP Gurus,
    I defined scope of planning for two plants and defined counter too. And set background job through Transaction code MDBT taking 24Hrs as Schedule selection parameter.
    When I'm accessing MDBT after 24Hrs system is throwing following messages in Scheduling log:
    1. Please check the destination for Parallel MRP (message no. MD251)
    Diagnosis of Message:
    No destination have been entered in Customizing or none of the destinations (application server) entered are active. In Customizing for MRP, you define the logical destinations (servers) to be used for parallel processing.
    2. Job cancelled after system exception ERROR_MESSAGE (Message no. 00564)
    Though I tried to enter to Customization through Message no. 1 but system is not allowing for it.
    What could be the problem. No help is available through any OSS note also.
    Please suggest the required solution in terms of Configuration or any other changes?
    Thanks & Regards,
    Abu Arbab

    Hi,
    Two more queries:
    1. If I don't want to go for Parallel Processing MRP, I don't have to select 'Parallel Processing' in Transaction code MDBT variant. But when I'm trying to change it system is not allowing me. It's not allowing me to go further without selection of it. What could be the reason behind it? Either Customization problem or any other?
    2. If set 'Parallel Processing destination' through Customization, system is giving only Development server as available destination and also Customization Request is getting generated. But the request is going to be transported to Production server. Since Parallel Processing destination was selected 'Development server' earlier and now MRP will run on 'Production server', it has to be changed to 'Production server'. But as already mentioned Customization Request will be getting generated and further it is freeze for Customization. How could get rid of these issues?
    Please come back with prompt comments.
    Thanks & Regards,
    Abu Arbab

  • Problems creating background job for program (job open, submit and close)

    Hi gurus,
    im trying to start a background job using the FM BP_START_DATE_EDITOR to show the start date to the job or if it's imediate. this FM it's working fine, after call it im opening a job, submiting it and call the job close FM and the job close FM creates me the job.
    The problem it's when i go to the sm37 to see the job status the job has been canceled, and the job log says that i have to give a start date to the job.
    What i dont understand it's either the job is imediate or i choose a date to start the job always gives me this error...
    Below goes my code,
    any ideas will be rewarded
      CLEAR: stdt_modify_type, stdt_output.
      CALL FUNCTION 'BP_START_DATE_EDITOR'
           EXPORTING
                stdt_dialog                    = 'Y'
                stdt_input                     = stdt_input
                stdt_opcode                    = 14
           IMPORTING
                stdt_modify_type               = stdt_modify_type
                stdt_output                    = stdt_output
           EXCEPTIONS
                fcal_id_not_defined            = 1
                incomplete_last_startdate      = 2
                incomplete_startdate           = 3
                invalid_dialog_type            = 4
                invalid_eventid                = 5
                invalid_opcode                 = 6
                invalid_opmode_name            = 7
                invalid_periodbehaviour        = 8
                invalid_predecessor_jobname    = 9
                last_startdate_in_the_past     = 10
                no_period_data_given           = 11
                no_startdate_given             = 12
                period_and_predjob_no_way      = 13
                period_too_small_for_limit     = 14
                predecessor_jobname_not_unique = 15
                startdate_interval_too_large   = 16
                startdate_in_the_past          = 17
                startdate_is_a_holiday         = 18
                startdate_out_of_fcal_range    = 19
                stdt_before_holiday_in_past    = 20
                unknown_fcal_error_occured     = 21
                no_workday_nr_given            = 22
                invalid_workday_countdir       = 23
                invalid_workday_nr             = 24
                notbefore_stdt_missing         = 25
                workday_starttime_missing      = 26
                no_eventid_given               = 27
                OTHERS                         = 28.
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
        MOVE 'X' TO gv_flag.
      ENDIF.
      DATA jobname LIKE tbtcjob-jobname.
      DATA jobcount LIKE tbtcjob-jobcount.
      DATA job_release LIKE  btch0000-char1.
      DATA job_imediate TYPE c.
      CLEAR: jobname, jobcount, job_release.
      CONCATENATE 'MAPAEXEC' sy-uname sy-datum
                   INTO jobname SEPARATED BY space.
      CALL FUNCTION 'JOB_OPEN'
           EXPORTING
                jobname          = jobname
           IMPORTING
                jobcount         = jobcount
           EXCEPTIONS
                cant_create_job  = 1
                invalid_job_data = 2
                jobname_missing  = 3
                OTHERS           = 4.
      IF sy-subrc <> 0.
        MESSAGE i003(zmapas).
        EXIT.
      ENDIF.
      SUBMIT z_mapa_execucao_orcamental
             VIA JOB jobname NUMBER jobcount
             WITH ano EQ ano
             WITH so_perio IN so_perio
             WITH so_date IN so_date
             WITH so_org EQ so_org
             WITH so_num IN so_num
             AND RETURN.
      IF stdt_output-startdttyp EQ 'I'.
        CLEAR job_imediate.
        job_imediate = 'X'.
      ENDIF.
      CALL FUNCTION 'JOB_CLOSE'
           EXPORTING
                calendar_id                 = stdt_output-calendarid
                event_id                    = stdt_output-eventid
                event_param                 = stdt_output-eventparm
                event_periodic              = stdt_output-periodic  "?
                jobcount                    = jobcount
                jobname                     = jobname
                laststrtdt                  = stdt_output-laststrtdt
                laststrttm                  = stdt_output-laststrttm
                prddays                     = stdt_output-prddays  "??
                prdhours                    = stdt_output-prdhours  "?
                prdmins                     = stdt_output-prdmins  "??
                prdmonths                   = stdt_output-prdmonths
                prdweeks                    = stdt_output-prdweeks  "?
                predjob_checkstat           = stdt_output-checkstat
                pred_jobcount               = stdt_output-predjobcnt
                pred_jobname                = stdt_output-predjob
                sdlstrtdt                   = stdt_output-sdlstrtdt
                sdlstrttm                   = stdt_output-sdlstrttm
                strtimmed                   = job_imediate
                targetsystem                = stdt_output-instname
                start_on_workday_not_before = stdt_output-notbefore
                start_on_workday_nr         = stdt_output-wdayno
                workday_count_direction     = stdt_output-wdaycdir
           IMPORTING
                job_was_released            = job_release
           EXCEPTIONS
                cant_start_immediate        = 1
                invalid_startdate           = 2
                jobname_missing             = 3
                job_close_failed            = 4
                job_nosteps                 = 5
                job_notex                   = 6
                lock_failed                 = 7
                OTHERS                      = 8.
      IF sy-subrc <> 0.
        MESSAGE i003(zmapas).
        EXIT.
      ELSE.
        MESSAGE i004(zmapas) WITH jobname.
      ENDIF.
    Thanks in advance,
    Best Regards
    João Martins

    Hello João.
    In debug mode, check the value of variables you passed to parameters sdlstrtdt and sdlstrttm.
    As aditional info, I usually achieve your goal without FM BP_START_DATE_EDITOR.
    Check this code:
    CALL FUNCTION 'JOB_OPEN'
          EXPORTING
               jobname          = w_jobname
          IMPORTING
               jobcount         = w_jobcount
          EXCEPTIONS
               cant_create_job  = 1
               invalid_job_data = 2
               jobname_missing  = 3
               OTHERS           = 4.
    CHECK sy-subrc = 0.
    CLEAR seltab_wa.
    MOVE: t_jobs-param TO seltab_wa-selname,
    t_processar-line+34 TO seltab_wa-low.
    APPEND seltab_wa TO seltab.
    seltab_wa-selname = 'P_LOJA'.
    seltab_wa-low = t_processar-ficheiro+7(4).
    APPEND seltab_wa TO seltab.
    *** Submete o programa para o JOB
    SUBMIT (t_jobs-repid)
      WITH  SELECTION-TABLE seltab
      USER sy-uname
       VIA JOB w_jobname NUMBER w_jobcount
       AND RETURN.
    *** Encerra o JOB
      l_hora = sy-uzeit.
      ADD 60 TO l_hora.
    CALL FUNCTION 'JOB_CLOSE'
       EXPORTING
          jobcount           = w_jobcount
          jobname           = w_jobname
          sdlstrtdt            = sy-datum
          sdlstrttm           = l_hora
          targetserver       = w_servidor
       IMPORTING
          job_was_released     = l_liberado
       EXCEPTIONS
          cant_start_immediate = 1
          invalid_startdate    = 2
          jobname_missing      = 3
          job_close_failed     = 4
          job_nosteps          = 5
          job_notex            = 6
          lock_failed          = 7
          OTHERS               = 8.
    Regards.
    Valter Oliveira.

  • Scheduling one background job inside another

    Hi All,
    Is it possible to Scheduling one background job inside another.? i.e In my Z program I am calling job_open, job_submit, job_close and to execute one standard report in background. And after that I am executing my Z program itself  from SE38 as Program->Execute->Background->Execute Immediately. Is this logically correct? I am asking this because I am not getting the desired result
    Thanks & Regards,
    Neethu.

    HI,
    Check the job steps in SM36.
    First schedule the Standard job and in the job steps schedule the z report.
    Schedule job in chain

  • Background Job pass value

    Hi, I am calling a Background job in my program. I am using JOB_OPEN, JOB_SUBMIT and JOB_CLOSE FM to start a job. My need is to pass a value to the job program(job program doesnt have any selection screen values). Is their any way without creating variants each time to pass value to it.
    Please advice.....

    Hello,
    You can first use  JOB_OPEN which returns job number. Then build ranges or parameters to use SUBMIT to call the program.
    Eg: SUBMIT RM06BB20 AND RETURN
          WITH S_EKGRP IN R_EKGRP
          WITH S_EKORG IN R_EKORG
          WITH S_FLIEF IN R_FLIEF
          WITH S_KONNR IN R_KONNR
          USER sy-uname VIA JOB w_jobname
          NUMBER w_job_number.
    Now use JOB_CLOSE.
    Thanks,
    Venu

  • How can i get Background Jobs list which is made me?

    I created background job using JOB_OPEN and SUBMIT and JOB_CLOSE.
    I need to Background Job list which is made me..
    Do u know any function or logic?
    plz~

    [BP_JOBVARIANT_OVERVIEW|http://help.sap.com/saphelp_45b/helpdata/en/fa/096ccb543b11d1898e0000e8322d00/frameset.htm]
    BP_JOBLOG_READ

  • Submit RSEOUT00 as background job

    Hi all,
    Here is my requirement.There is a Z program from which RSEOUT00 program has to be called , so that it will change the Idoc status to '03'. I tried using Submit RSEOUT00..and return and also tried JOB_open and then SUBMIT rseout00 WITH docnum EQ p_idocno  user sy-uname  via  job jobname number jobcount and return and then JOB_CLOSE .I checked SM37 also where i can see this job as finished..
    I tried COMMIT WORK statement and also WAIT statement .
    But still the idoc status wont change to '03' .
    Can anyone plase advise on how to correct this .
    Regards,
    Sudheer

    Hi,
    I have created background job for RSEOUT00 and written the below code. It worked.
    DATA: w_number           TYPE tbtcjob-jobcount,
               w_name              TYPE tbtcjob-jobname VALUE 'ZTEST_JOB'.
       CALL FUNCTION 'JOB_OPEN'
         EXPORTING
           jobname          = w_name
         IMPORTING
           jobcount         = w_number
         EXCEPTIONS
           cant_create_job  = 1
           invalid_job_data = 2
           jobname_missing  = 3
           OTHERS           = 4.
       IF sy-subrc = 0.
         SUBMIT rseout00  VIA JOB w_name NUMBER w_number AND RETURN.
         IF sy-subrc = 0.
           CALL FUNCTION 'JOB_CLOSE'
             EXPORTING
               jobcount             = w_number
               jobname              = w_name
               strtimmed            = 'X'
             EXCEPTIONS
               cant_start_immediate = 1
               invalid_startdate    = 2
               jobname_missing      = 3
               job_close_failed     = 4
               job_nosteps          = 5
               job_notex            = 6
               lock_failed          = 7
               OTHERS               = 8.
           IF sy-subrc <> 0.
           ENDIF.
         ENDIF.
       ENDIF.
    Thanks,
    Appanaboina

  • Error while scheduling Background Job for User/Role Full Synchronization

    Hi all,
    We have installed RAR 5.3 Component and uploaded the authorization data & established the connectors to the backend system.
    We have performed all the post installation activities and everything is complete.
    When we have scheduled User -Full Synchronization with the Back End system as  a part of Post Installation Activity we are receiving the below error message
    "Error while executing the Job:Cannot assign an empty string to host variable 2."
    Also the VIEW LOG/ Terminate Job buttons are disabled  in this screen.
    Can somebody please help us in resolving the above issue
    Thanks and Best Regards,
    Srihari.K

    Hi,
    We are copy pasting the error log (Part as it is huge) below here. We could able to do Full Synch for Roles and also for Profiles. Only for User Synch we are getting this error and none of the users are sychronized to RAR
    Jan 13, 2009 12:34:27 AM com.virsa.cscext.dao.CSCDAO populateGenObjUser
    INFO: Update user WILSONA of HL2-QAHR
    Jan 13, 2009 12:34:27 AM com.virsa.cscext.dao.CSCDAO populateGenObjUser
    INFO: Update user WINDC of HL2-QAHR
    Jan 13, 2009 12:34:27 AM com.virsa.cscext.dao.CSCDAO populateGenObjUser
    INFO: Update user WLADICHJ of HL2-QAHR
    Jan 13, 2009 12:34:27 AM com.virsa.cscext.dao.CSCDAO populateGenObjUser
    INFO: Update user WUK of HL2-QAHR
    Jan 13, 2009 12:34:27 AM com.virsa.cscext.dao.CSCDAO populateGenObjUser
    INFO: Update user ZENGS of HL2-QAHR
    Jan 13, 2009 12:34:27 AM com.virsa.cscext.dao.CSCDAO populateGenObjUser
    INFO: Update user ZHENGL of HL2-QAHR
    Jan 13, 2009 12:34:27 AM com.virsa.cscext.dao.CSCDAO populateGenObjUser
    INFO: All System Flag:false=====Last Batch Flag:true
    Jan 13, 2009 12:34:27 AM com.virsa.cc.xsys.bg.BatchRiskAnalysis loadUserData
    INFO: @@@ User sync completed for params true: Syskey List is [HL2-QAHR]
    Jan 13, 2009 12:34:27 AM com.virsa.cc.xsys.bg.BgJob run
    WARNING: *** Job Exception: Cannot assign an empty string to host variable 2.
    com.sap.sql.log.OpenSQLException: Cannot assign an empty string to host variable 2.
         at com.sap.sql.log.Syslog.createAndLogOpenSQLException(Syslog.java:85)
         at com.sap.sql.log.Syslog.createAndLogOpenSQLException(Syslog.java:124)
         at com.sap.sql.types.VarcharResultColumn.setString(VarcharResultColumn.java:57)
         at com.sap.sql.jdbc.common.CommonPreparedStatement.setString(CommonPreparedStatement.java:511)
         at com.sap.engine.services.dbpool.wrappers.PreparedStatementWrapper.setString(PreparedStatementWrapper.java:355)
         at com.virsa.cscext.dao.CSCDAO.updateIgnoredUserData(CSCDAO.java:1388)
         at com.virsa.cscext.dao.CSCDAO.populateGenObjUser(CSCDAO.java:1169)
         at com.virsa.cc.xsys.bg.BatchRiskAnalysis.populateGenObj(BatchRiskAnalysis.java:868)
         at com.virsa.cc.xsys.bg.BatchRiskAnalysis.insertBAPIUserData(BatchRiskAnalysis.java:142)
         at com.virsa.cc.xsys.bg.BatchRiskAnalysis.loadUserData(BatchRiskAnalysis.java:390)
         at com.virsa.cc.xsys.bg.BatchRiskAnalysis.performBatchSyncAndAnalysis(BatchRiskAnalysis.java:1275)
         at com.virsa.cc.xsys.bg.BgJob.runJob(BgJob.java:402)
         at com.virsa.cc.xsys.bg.BgJob.run(BgJob.java:264)
         at com.virsa.cc.xsys.riskanalysis.AnalysisDaemonBgJob.scheduleJob(AnalysisDaemonBgJob.java:240)
         at com.virsa.cc.xsys.riskanalysis.AnalysisDaemonBgJob.start(AnalysisDaemonBgJob.java:80)
         at com.virsa.cc.comp.BgJobInvokerView.wdDoModifyView(BgJobInvokerView.java:436)
         at com.virsa.cc.comp.wdp.InternalBgJobInvokerView.wdDoModifyView(InternalBgJobInvokerView.java:1225)
         at com.sap.tc.webdynpro.progmodel.generation.DelegatingView.doModifyView(DelegatingView.java:78)
         at com.sap.tc.webdynpro.progmodel.view.View.modifyView(View.java:337)
         at com.sap.tc.webdynpro.clientserver.cal.ClientComponent.doModifyView(ClientComponent.java:481)
         at com.sap.tc.webdynpro.clientserver.window.WindowPhaseModel.doModifyView(WindowPhaseModel.java:551)
         at com.sap.tc.webdynpro.clientserver.window.WindowPhaseModel.processRequest(WindowPhaseModel.java:148)
         at com.sap.tc.webdynpro.clientserver.window.WebDynproWindow.processRequest(WebDynproWindow.java:335)
         at com.sap.tc.webdynpro.clientserver.cal.AbstractClient.executeTasks(AbstractClient.java:143)
         at com.sap.tc.webdynpro.clientserver.session.ApplicationSession.doProcessing(ApplicationSession.java:319)
         at com.sap.tc.webdynpro.clientserver.session.ClientSession.doApplicationProcessingStandalone(ClientSession.java:713)
         at com.sap.tc.webdynpro.clientserver.session.ClientSession.doApplicationProcessing(ClientSession.java:666)
         at com.sap.tc.webdynpro.clientserver.session.ClientSession.doProcessing(ClientSession.java:250)
         at com.sap.tc.webdynpro.clientserver.session.RequestManager.doProcessing(RequestManager.java:149)
         at com.sap.tc.webdynpro.serverimpl.defaultimpl.DispatcherServlet.doContent(DispatcherServlet.java:62)
         at com.sap.tc.webdynpro.serverimpl.defaultimpl.DispatcherServlet.doGet(DispatcherServlet.java:46)
         at javax.servlet.http.HttpServlet.service(HttpServlet.java:740)
         at javax.servlet.http.HttpServlet.service(HttpServlet.java:853)
         at com.sap.engine.services.servlets_jsp.server.HttpHandlerImpl.runServlet(HttpHandlerImpl.java:401)
         at com.sap.engine.services.servlets_jsp.server.HttpHandlerImpl.handleRequest(HttpHandlerImpl.java:266)
         at com.sap.engine.services.httpserver.server.RequestAnalizer.startServlet(RequestAnalizer.java:386)
         at com.sap.engine.services.httpserver.server.RequestAnalizer.startServlet(RequestAnalizer.java:364)
         at com.sap.engine.services.httpserver.server.RequestAnalizer.invokeWebContainer(RequestAnalizer.java:1039)
         at com.sap.engine.services.httpserver.server.RequestAnalizer.handle(RequestAnalizer.java:265)
         at com.sap.engine.services.httpserver.server.Client.handle(Client.java:95)
         at com.sap.engine.services.httpserver.server.Processor.request(Processor.java:175)
         at com.sap.engine.core.service630.context.cluster.session.ApplicationSessionMessageListener.process(ApplicationSessionMessageListener.java:33)
         at com.sap.engine.core.cluster.impl6.session.MessageRunner.run(MessageRunner.java:41)
         at com.sap.engine.core.thread.impl3.ActionObject.run(ActionObject.java:37)
         at java.security.AccessController.doPrivileged(Native Method)
         at com.sap.engine.core.thread.impl3.SingleThread.execute(SingleThread.java:102)
         at com.sap.engine.core.thread.impl3.SingleThread.run(SingleThread.java:172)
    Jan 13, 2009 12:34:27 AM com.virsa.cc.xsys.bg.BgJob setStatus
    INFO: Job ID: 13 Status: Error
    Jan 13, 2009 12:34:27 AM com.virsa.cc.xsys.bg.BgJob updateJobHistory
    FINEST: --- @@@@@@@@@@@ Updating the Job History -
    2@@Msg is Error while executing the Job:Cannot assign an empty string to host variable 2.
    Jan 13, 2009 12:34:27 AM com.virsa.cc.xsys.bg.dao.BgJobHistoryDAO insert
    INFO: -
    Background Job History: job id=13, status=2, message=Error while executing the Job:Cannot assign an empty string to host variable 2.
    Jan 13, 2009 12:34:27 AM com.virsa.cc.xsys.riskanalysis.AnalysisDaemonBgJob scheduleJob
    INFO: -
    Complted Job =>13----
    Please let us know how to resolve this error
    Thanks and Best Regards,
    Srihari.K

Maybe you are looking for

  • Can't print over network with WinXP.

    I have a HP LaserJet M1120 MPF and it's connected to a Windows XP desktop via USB. My MacBook uses the shared internet connection on the desktop through a wireless router, but I cannot set up the printer. I can see it, when I go to add a new printer,

  • How to use stored Procedure in PLD

    Hi All, I have create a procedure for converting number to words in SQL. I want to call this procedure in PLD. Is this possible? Thanks & Regards, Sheetal

  • Table is multiplying itself

    I set up a table in a new file and find that it's repeating itself. Although I should have at most 2 pages, I have 18. How can I get rid of the 16 repeat pages and keep from making this mistake again? TIA

  • Bex reporting issue

    Hi gurus I m facing a typical error in Bex Reporting. This report displays the details of consumer address details. The data is successfully browsed from data tgt browser in ODS.while creating the reporting and query it gives me these 3 errors. Note:

  • Webgate installation - not able to find .cgi file in bin directory

    Hi friends, I am trying to install webgate on ohs server (after webpass installation). But as told in installation document for webgate, we need to configure the webgate by giving relative path to dll or cgi file in bin directory. But when I tried to