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

Similar Messages

  • 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

  • Internal error occurs in background job scheduling

    Hi Experts,
    We are facing an error message "Internal error occurs in background job scheduling" while trying to execute a custom report(Z report) in background in SA38.
    Please find the following observation on our side on this message.
    1) This message is not coming for only one report not for others.
    2) SU53 screen shot shows that SE38 check is failed, but the weird thing is not happening for other report.
    3) Persons having SE38 auhtorization are able to run this report.
    Please advise.
    Thanks in advance,
    Viven

    What is the message ID and number? Have you tried OSS search and debugging?
    What does this program do, in a nutshell?

  • BWREMOTE background job canceled in sap r/3 system

    Hi my friends,
    Thanks for your help ahead.
    Today I checked the background job in SAP R/3 created by BWREMOTE via SM37. It showed me some jobs had been canceled.
    I displayed its log, the detail message is:
    ==========================================
    Step 001 started (program SBIE0001, variant &0000000083494, user name BWREMOTE)
    DATASOURCE = ZQM_NOT_SHFGRP
    Call up of customer enhancement BW_BTE_CALL_BW204010_E (BTE) with 1,593 records
    Result of customer enhancement: 1,593 records
    Call up of customer enhancement EXIT_SAPLRSAP_001 (CMOD) with 1,593 records
    ABAP/4 processor: SAPSQL_INVALID_FIELDNAME
    Job cancelled
    ==========================================
    Then I displayed the "Long Text" of the job log. It is
    One of the field names in the SELECT clause was not recognized.
    Error analysis
    The SELECT clause was specified in an internal table at runtime.
    It contains the field name "TPR00", but this does not occur in any of
    the database tables listed in the FROM clause.
    Information on where termination occurred
    The termination occurred in the ABAP/4 program "SAPLXRSA " in
    "EXIT_SAPLRSAP_001".
    The main program was "SBIE0001 ".
    Source code extract
    008840 concatenate 'TPR'
    008850 day_temp+6(2)
    008860 ' = '
    008870 ' ''' zshift '''' into
    008880 cond .
    008890 append cond to itab .
    008900 select schkz into i_not_shfgrp-zzschkz from t552a
    008910 where zeity = '2'
    008920 and mofid = 'CN'
    008930 and mosid = '28'
    008940 and ( schkz = 'SFTA' or
    008950 schkz = 'SFTB' or
    008960 schkz = 'SFTC' or
    008970 schkz = 'SFTD' )
    008980 and kjahr = day_temp+0(4)
    008990 and monat = day_temp+4(2)
    > and (itab) .
    009010 endselect.
    I guess that there is not a field named TPR00 in table t552a.
    Next, I opened the 'project management of sap enhancement' via CMOD, entering the project name and chosing 'Display'.
    Then Double click the Components 'EXIT_SAPLRSAP_001', we can see the function module 'EXIT_SAPLRSAP_001'. In the source codes, there is an include program, it is 'INCLUDE ZXRSAU01.'.
    Then, I double clicked the Include program and find the position program terminated. The source codes are:
    ZQM_NOT_SHFGRP *
    when 'ZQM_NOT_SHFGRP'.
    loop at c_t_data into i_not_shfgrp .
    l_tabix = sy-tabix .
    clear :mbatch ,zshift,cond ,zfield, zcharg, day_temp .
    refresh itab.
    if i_not_shfgrp-ausvn is initial.
    else.
    aa = '080000'.
    bb = '160000'.
    cc = '235959'.
    day_temp = i_not_shfgrp-ausvn.
    if i_not_shfgrp-auztv ge aa and
    i_not_shfgrp-auztv lt bb .
    zshift = 'MSHF' .
    elseif i_not_shfgrp-auztv ge bb and
    i_not_shfgrp-auztv le cc .
    zshift = 'LSHF'.
    else .
    zshift = 'NSHF'.
    day_temp = i_not_shfgrp-ausvn - 1.
    endif.
    concatenate 'TPR'
    day_temp+6(2)
    ' = '
    ' ''' zshift '''' into
    cond .
    append cond to itab .
    select schkz into i_not_shfgrp-zzschkz from t552a
    where zeity = '2'
    and mofid = 'CN'
    and mosid = '28'
    and ( schkz = 'SFTA' or
    schkz = 'SFTB' or
    schkz = 'SFTC' or
    schkz = 'SFTD' )
    and kjahr = day_temp+0(4)
    and monat = day_temp+4(2)
    and (itab) .
    endselect.
    endif.
    I found that we got a TPR00 during concatenation. In other words, day_temp+6(2) = 00. But I think it is impossible. I can not explain this.
    Any ideas, my friends. Many thanks.

    select schkz into i_not_shfgrp-zzschkz from t552a
    where zeity = '2'
    and mofid = 'CN'
    and mosid = '28'
    and ( schkz = 'SFTA' or
    schkz = 'SFTB' or
    schkz = 'SFTC' or
    schkz = 'SFTD' )
    and kjahr = day_temp+0(4)
    and monat = day_temp+4(2)
    <b>and (itab) .</b>  => doesn't make sense?!
    endselect.
    endif.
    it seems something got deleted between 'and' and '(itab)'... so, you'll have to recheck the requirements for your select to fill the 'and' statement further.
    so, it should look like
    and monat = day_temp+4(2)
    and <b><some kind of condition that needs to be fulfilled></b>.
    endselect.
    <b><some logic to fill a line in your internal table></b>.
    append cond to itab.
    endif.
    obviously <some kind of condition that needs to be fulfilled> needs to be replaced by a real condition
    and <some logic to fill a line in your internal table> needs to be replaced by some kind of formula
    I assume something like (otherwise it would be really weird to select that field):
    cond = i_not_shfgrp-zzschkz.
    or a formula using the i_not_shfgrp-zzschkz field.
    It would also be a lot better to replace your select ... endselect by a select single as you'll be selecting 1 record only anyways.
    Message was edited by:
            RafB

  • How to find Spool number for a 2 steps background job.

    Hi All,
    How to find spool number (and also the background job name ) for a 2 steps background job.
    in the table TBTCO i can see step numbers but i dont get the spool number. Is there any link between TBTCO and TSP01.
    Also after getting the spool number i need to drill down on ALV report. I hard coded the spool number and was able to drill down using BDC and call transaction but when i press back button it is not returning to the ALV report.
    Thanks,
    Shiva.

    Which one creates the spool? (first one I guess)
    What kind of spool? (WRITE, sapscript, smartform, pdf...)
    Do you use special statements like NEW-PAGE, or other things?
    Are you sure that the spools are generated by these jobs? (did you compare the spool generation times and job run dates to be sure...)

  • System exception while deleting the file from app server in background job

    Hi All,
    I have a issue while the deleting the file from application server.
    I am using the statement DELETE DATASET in my program to delete the file from app server.
    I am able to delete the file from the app server when i run the program from app server.
    When i run the same report from background job i am getting the message called System exception.
    Is there any secuirity which i need to get the issue.
    Thank You,
    Taragini

    Hi All,
    I get all the authorization sto delete the file from application serever.
    Thing is i am able to run the program sucessfully in foreground but not in the background .
    It i snot giving any short dump also just JOB is cancelled with the exception 'Job cancelled after system exception ERROR_MESSAGE'.
    Can anybody please give me suggestion
    Thanks,
    Taragini

  • How to avoid use of function module in case of background jobs?

    Hi ,
           I am working a file tranfer interface .Functionality is to extract file either apllication or presentation server , and process the file  through bapi , send the  result in their respective server. This program should run through batch jobs in background mode.
    I am using following function module :
      SUBST_GET_FILE_LIS : Get the file list from application server
    TMP_GUI_DIRECTORY_LIST_FILES : Get the file list from presentation server
    GUI_UPLOad : to extract file data   from presentation server
    GUI_downLOAD : to download data  to presentation server
    in case of background job these function modules will not work.... so how to resolve this issue...
    what are the methods we can apply?
    Thanks & Regards
    Sandeep

    Hi,
    This FM is used to get list of files from Application server (will work in Background). This cannot be used to list files from presentation server.  There is no way , by which you can process presentation server files in background mode.
    Regards
    Vinod

  • HOw to find out a report name when you know only the name of background job

    Hi experts ,
    my question is i need to find out teh report name for which i knew only the background job name of the report .
    thanx
    Venky.

    Go to tcode SM37->Give job name and execute->choose tool bar button STEPS (Disply Steps list) ->Then you will get program or command

  • RE: Report for Background jobs

    Hi SAP Guru's,
    I need to create a report on Background Job status , please tell me is there any standard reports ? or How to create a report on Background Jobs Status?
    Thanks in Advance,
    Krishna.

    Dear Raja,
    In std report this is not possible, talk to ur ABAPer to fetch the feild PLNUM from AFPO table with respect to the AUFNR field. This can be added to the std report itself. use this logic it will work
    sree

  • HRALXSYNC Background job is cancelled

    Hi,
    I scheduled HRALXSYNC report in background but it is executed for some time and then it is Canceled and the job type is execute immediately. 
    Here am pasting the details of scheduled job.
    Date            Time           Message text                                                                               
    08/30/2011 07:09:52    Job started                                                                               
    08/30/2011 07:09:52    Step 001 started (program HRALXSYNC, variant SAP&DEFAULT, user ID SHAIKSJ)
    08/30/2011 07:17:34    Enter at least one number for the business partner
    08/30/2011 07:17:34    Job cancelled after system exception ERROR_MESSAGE
    Note:  Here this background job run as "changes since".
    Can any suggest me how to solve this issue.
    Thanks in advance
    Saleem

    Hi Saleem,
    Not sure if you already solved your issue.
    But I have one remark regarding the value of "Changes Since":
    The program HRALXSYNC stores the date of last successful runtime in table T77ZZ (REPID=HRALXSYNC).
    "01.01.1900" is the inital default date. Please start HRALXSYNC in dialog mode and select "Changes Since" and execute the program. Then select all lines of the result list and press on the 'Repair' button. Errors in the result need to be investigated.
    I am actually as well 'fighting' in the area of HR data Integration into CRM.
    Kind Regards,
    Bjoern

  • Background job getting CANCELLED

    hello,
    i have  a background job scheduled for a report program.it is getting cancelled and giving the following error:
    "TABLE_ILLEGAL_STATEMENT"
    You attempted to change, delete or create a line in the       
    internal table "???", but no valid cursor exists              
    for the table.                                                
    Possible reasons:                                             
    1. The relevent ABAP/4 statement does not include the addition
       "...INDEX...", although the statement is not               
       inside a "LOOP...ENDLOOP" loop processing this table.      
    2. The relevent ABAP/4 statement was called from within a     
       "LOOP...ENDLOOP" loop after a DELETE "???".                                                                               
    what could be the reason?

    it is also giving following error message:
    Caution: Program has changed
    Caution: At time of termination,  Active source code no longer available  and after above two statements its giving sign "?" before every statement in below manner:
    024300 ?     lit_ekpo_dummy1[] = it_ekpo[].                     
    024310 ?     DELETE lit_ekpo_dummy1 WHERE ebeln NE tab1-ebeln.  
    024320 ?     DESCRIBE TABLE lit_ekpo_dummy1 LINES count01.      
    024330 ?                                                        
    024340 ?     REFRESH lit_ematn_dummy[].                         
    024350 ?     lit_ematn_dummy[] = lit_ematn[].

Maybe you are looking for

  • Satellite C855D-S5302 problem with win8

    I recently bought new Satellite C855D-S5302 after retiring my 12 year old Satellite after excellent service. BUT this new one comes with Windows 8 installed and that is just not cutting it for me. Often when moving the cursor to the left, the charms

  • Itunes/AppleMobileDeivce not responding when syncing large files..

    As stated above, Itunes or apple mobile device not responding everytime i sync a large file. for exmaple.. 1 or 2 songs i will nt encounter this error, but syncing an 400mb abv item, itune/apple mobile device will just appear not responding and crash

  • I would like to see targets have "fly-in" animation capabilities...

    I would like to see targets have "fly-in" animation capabilities to be used with menus, panels, etc. I would be great to click on a trigger and have a menu fly in from left, right, top or bottom  - control it the way you do with scrolling effects.

  • Problem to open VISIO in workflow table

    Hi All, I opened the workflow table by getting by going to view -> select table-> workflow as i was not able to open it in drop down list. Once opening the workflow when I am trying to open the Visio document in workflow field, i cannot open I got th

  • Adobe PDF 8 will not "print". It pauses instead.

    I upgraded to Leopard. Now when I attempt to create a PDF file by printing using the Adobe PDF 8 printer, the file will process into the printer job list, and then the printer will PAUSE. No amount of Resuming or restarting the print queue will get t