Call transaction mode 'A' and mode 'N'

Hi all
In my below mentioned code statement bdc call transaction eg33 mode 'A' is working fine in both programs main program and called(submit) program (highlighted here). But if I give mode 'N' in both called and calling program call transaction  the called program using submit is not at all called. Suggest me what to do if i want to run it in background.Write now its runing in foreground and user has to press enter many times which i want to avoid.
REPORT  zac_eg33 NO STANDARD PAGE HEADING
                 LINE-SIZE 100.
TABLES: EABL,
        BUT000,
        ZISUH0003.
DATA: IT_STATUS TYPE ZISUH0003.
DATA: G_INDEX TYPE I,
      G_START_COL TYPE I VALUE '1',      "start column
      G_START_ROW TYPE I VALUE '14',      "start row
      G_END_COL   TYPE I VALUE '18',     "maximum column
      G_END_ROW   TYPE I VALUE '75',  "maximum row
      G_TEXT(20),                         "stores error messages
      G_PAGES        TYPE I,
      G_CURRENT_PAGE TYPE I,
      G_COUNT LIKE SY-DBCNT.
data: l_file   type file_table,
      file1    type string,
      l_title  type string,
      LENGTH   TYPE I,
      FILES    type filetable,
      SUBRC    type i,
      STR_FILE type STRING,
      D_FILE   type RLGRAP-FILENAME,
      filename TYPE String,
      L_itab_date(10).
FIELD-SYMBOLS : <FS>.
DATA msgtext(80).
DATA: IT_EXCEL LIKE STANDARD TABLE OF ALSMEX_TABLINE WITH HEADER LINE,
      IT_MESS TYPE STANDARD TABLE OF BDCMSGCOLL WITH HEADER LINE.
TYPES: BEGIN OF TY_OPEN,
        HAUS LIKE REG30-HAUS,
        EADAT(10),
        GERAETNEU LIKE REG30-GERAETNEU,
        MESSDRCK LIKE REG30-MESSDRCK,
        ZWSTANDCE LIKE REG30-ZWSTANDCE,
        XYZ LIKE EGPLD-DEVLOC,
      END OF TY_OPEN.
DATA : T_ANLAGE LIKE EANLD-ANLAGE,
       VSTELLE LIKE EVBS-VSTELLE,
       S_ANLAGE LIKE EANLD-ANLAGE,
       temp_c(7).
DATA: IT_OPEN TYPE STANDARD TABLE OF TY_OPEN WITH HEADER LINE.
DATA: BDCDATA1 TYPE STANDARD TABLE OF BDCDATA WITH HEADER LINE.
SELECTION-SCREEN BEGIN OF BLOCK 1 WITH FRAME TITLE TEXT-001.
SELECTION-SCREEN SKIP 2.
PARAMETERS: P_FILE like RLGRAP-FILENAME OBLIGATORY.
SELECTION-SCREEN SKIP 2.
SELECTION-SCREEN END OF BLOCK 1.
AT SELECTION-SCREEN ON VALUE-REQUEST FOR P_FILE  .
  PERFORM GET_FILE_NAME.
  MOVE FILENAME TO P_FILE.
*START-OF-SELECTION.
*CLEAR IT_EXCEL.
START-OF-SELECTION.
CALL FUNCTION 'ALSM_EXCEL_TO_INTERNAL_TABLE'
  EXPORTING
    FILENAME                      = p_file
    I_BEGIN_COL                   = 1  "VF_START_COL
    I_BEGIN_ROW                   = 2  "VF_START_ROW
    I_END_COL                     = 5  "VF_END_COL
    I_END_ROW                     = 10000  "VF_END_ROW
  TABLES
    INTERN                        = IT_EXCEL
  EXCEPTIONS
    INCONSISTENT_PARAMETERS       = 1
    UPLOAD_OLE                    = 2
    OTHERS                        = 3
IF SY-SUBRC <> 0.
MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
        WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
ENDIF.
IF IT_EXCEL[] IS INITIAL.
  G_TEXT = 'No Data Uploaded'.
ELSE.
  SORT IT_EXCEL BY ROW COL.
  LOOP AT IT_EXCEL.
    MOVE : IT_EXCEL-COL TO G_INDEX.
    ASSIGN COMPONENT G_INDEX OF STRUCTURE IT_OPEN TO <FS>.
    MOVE IT_EXCEL-VALUE TO <FS>.
    AT END OF ROW.
      IF NOT IT_OPEN IS INITIAL.
      APPEND IT_OPEN." TO IT_LINE.
      CLEAR IT_OPEN.
      CLEAR IT_EXCEL.
      ENDIF.
    ENDAT.
  ENDLOOP.
ENDIF.
REFRESH IT_EXCEL.
ULINE.
FORMAT COLOR 3 ON.
WRITE: /1 sy-vline ,
       2 'Material No.' ,
       25 sy-vline,
        2 'Logs' ,
        100 sy-vline.
uline.
FORMAT COLOR OFF.
LOOP AT IT_OPEN.
REFRESH BDCDATA1.
clear : temp_c.
move it_open-MESSDRCK to temp_c.
condense : temp_c.
PERFORM MAP1.
*CALL TRANSACTION 'EG33' USING BDCDATA1 MODE 'A' MESSAGES INTO IT_MESS.
GET PARAMETER ID 'GEP' FIELD it_open-XYZ.
SET PARAMETER ID 'IFL' FIELD it_open-XYZ.
*MESSAGE X003(IA) INTO msgtext.
*IF MSGTEXT = 'Only single installation is allowed at functional location &'.
*EXIT.
*ELSE.
SUBMIT ZIL02_BDC and return.*
ENDIF.
DATA: G_INSNO LIKE IT_OPEN-HAUS.
IF NOT IT_MESS[] IS INITIAL.
  G_INSNO = IT_OPEN-HAUS.
  PERFORM GET_MESSAGES  TABLES IT_MESS USING G_INSNO." IT_LINE.
ENDIF.
READ TABLE IT_MESS WITH KEY MSGTYP = 'E'.
IF SY-SUBRC NE 0.
READ TABLE IT_MESS WITH KEY MSGTYP = 'S'  MSGNR = '622'.
IF SY-SUBRC EQ 0.
SELECT SINGLE VSTELLE FROM EVBS INTO VSTELLE WHERE HAUS = IT_OPEN-HAUS.
SELECT SINGLE ANLAGE FROM EANL INTO T_ANLAGE WHERE VSTELLE = VSTELLE.
MOVE T_ANLAGE TO IT_STATUS-ANLAGE.
MOVE 'X' TO IT_STATUS-RFC.
*perform get_date_format using IT_OPEN-EADAT.
MOVE IT_OPEN-EADAT TO IT_STATUS-ADATE.
SELECT SINGLE ANLAGE FROM ZISUH0003 INTO  S_ANLAGE WHERE ANLAGE =
T_ANLAGE.
  IF SY-SUBRC EQ 4.
    INSERT ZISUH0003 FROM IT_STATUS.
  ELSE.
    UPDATE ZISUH0003 FROM IT_STATUS.
  ENDIF.
  ENDIF.
  ENDIF.
  REFRESH IT_MESS.
  CLEAR   IT_MESS.
ENDLOOP.
*PERFORM BDC_OPEN_READING.
MESSAGE S013(ZPS).
*&      Form  GET_FILE_NAME
      text
-->  p1        text
<--  p2        text
FORM GET_FILE_NAME .
REFRESH FILES.
call method cl_gui_frontend_services=>file_open_dialog
            exporting
              window_title            = l_title
            changing
              file_table              = files
              rc                      = subrc
            exceptions
              file_open_dialog_failed = 1
              cntl_error              = 2
              error_no_gui            = 3
              others                  = 4.
          check sy-subrc = 0.
          loop at files into l_file.
            str_file = l_file.
            move str_file to filename.
            exit.
          endloop.
ENDFORM.                    " GET_FILE_NAME
*&      Form  BDC_OPEN_READING
      text
-->  p1        text
<--  p2        text
FORM BDC_OPEN_READING .
*DATA: G_INSNO LIKE IT_OPEN-HAUS.
*IF NOT IT_MESS[] IS INITIAL.
G_INSNO = IT_OPEN-HAUS.
PERFORM GET_MESSAGES  TABLES IT_MESS USING G_INSNO." IT_LINE.
*ENDIF.
*READ TABLE IT_MESS WITH KEY MSGTYP = 'E'.
*IF SY-SUBRC NE 0.
*READ TABLE IT_MESS WITH KEY MSGTYP = 'S'  MSGNR = '622'.
*IF SY-SUBRC EQ 0.
*SELECT SINGLE VSTELLE FROM EVBS INTO VSTELLE WHERE HAUS = IT_OPEN-HAUS.
*SELECT SINGLE ANLAGE FROM EANL INTO T_ANLAGE WHERE VSTELLE = VSTELLE.
*MOVE T_ANLAGE TO IT_STATUS-ANLAGE.
*MOVE 'X' TO IT_STATUS-RFC.
**perform get_date_format using IT_OPEN-EADAT.
*MOVE IT_OPEN-EADAT TO IT_STATUS-ADATE.
*SELECT SINGLE ANLAGE FROM ZISUH0003 INTO  S_ANLAGE WHERE ANLAGE =
*T_ANLAGE.
IF SY-SUBRC EQ 4.
   INSERT ZISUH0003 FROM IT_STATUS.
ELSE.
   UPDATE ZISUH0003 FROM IT_STATUS.
ENDIF.
ENDIF.
ENDIF.
REFRESH IT_MESS.
CLEAR   IT_MESS.
*ENDLOOP.
ENDFORM.                    " BDC_OPEN_READING
       Start new screen                                              *
FORM BDC_DYNPRO USING PROGRAM DYNPRO.
  CLEAR BDCDATA1.
  BDCDATA1-PROGRAM  = PROGRAM.
  BDCDATA1-DYNPRO   = DYNPRO.
  BDCDATA1-DYNBEGIN = 'X'.
  APPEND BDCDATA1.
ENDFORM.
       Insert field                                                  *
FORM BDC_FIELD USING FNAM FVAL.
  IF FVAL <> SPACE.
    CLEAR BDCDATA1.
    BDCDATA1-FNAM = FNAM.
    BDCDATA1-FVAL = FVAL.
    APPEND BDCDATA1.
  ENDIF.
ENDFORM.
*&      Form  MAP1
      text
-->  p1        text
<--  p2        text
FORM MAP1 .
perform bdc_dynpro      using 'SAPLE30D' '0100'.
perform bdc_field       using 'BDC_CURSOR'
                              'REG30-GERAETNEU'.
perform bdc_field       using 'BDC_OKCODE'
                              '/00'.
perform bdc_field       using 'REG30-HAUS'
                              IT_OPEN-HAUS.  "'100000000033'.
perform bdc_field       using 'REG30-EADAT'
                              IT_OPEN-EADAT.  "'18.02.2006'.
perform bdc_field       using 'REG30-GERAETNEU'
                              IT_OPEN-GERAETNEU.  "'66a'.
perform bdc_dynpro      using 'SAPLE30D' '0220'.
perform bdc_field       using 'BDC_CURSOR'
                              'REG30-TEMP_AREA(02)'.
perform bdc_field       using 'BDC_OKCODE'
                              '=SAVE'.
perform bdc_field       using 'REG30-MESSDRCK'
                               temp_c. "IT_OPEN-MESSDRCK'0.0125'.
perform bdc_field       using 'REG30-GERWECHS'
                              '05'.
perform bdc_field       using 'REG30-ANZDAYSOFPERIOD(01)'
                              '30'.
perform bdc_field       using 'REG30-ZWSTANDCE(01)'
                              IT_OPEN-ZWSTANDCE.  "'10'.
perform bdc_field       using 'REG30-ZWSTANDCE(02)'
                              '0'.
perform bdc_field       using 'REG30-PERVERBR(01)'
                              '0'.
perform bdc_field       using 'REG30-PERVERBR(02)'
                              '0'.
perform bdc_field       using 'REG30-TEMP_AREA(01)'
                              '0001'.
perform bdc_field       using 'REG30-TEMP_AREA(02)'
                              '0001'.
perform bdc_field       using 'REG30-PR_AREA_AI(01)'
                              '0001'.
perform bdc_field       using 'REG30-PR_AREA_AI(02)'
                              '0001'.
ENDFORM.                    " MAP1
*&      Form  get_date_format
      text
     -->P_IT_ORDER_TABLE_C_DATE  text
FORM get_date_format USING L_ITAB_DATE." LIKE SY-DATUM.
data: d_temp(4),
      m_temp(2),
      y_temp(4).
*move L_ITAB_DATE to L_ITAB_DATE.
y_temp = L_ITAB_DATE(4).
m_temp = L_ITAB_DATE+4(2).
d_temp = L_ITAB_DATE+6(2).
CONCATENATE d_temp '.' m_temp '.' y_temp into L_ITAB_DATE.
ENDFORM.                    " get_date_format
*&      Form  GET_MESSAGES
      text
     -->P_IT_MESS  text
     -->P_G_INSNO  text
FORM GET_MESSAGES  TABLES IT_MESS STRUCTURE BDCMSGCOLL USING G_INSNO .
  TABLES T100.
DATA: L_MSTRING(255).
LOOP AT IT_MESS WHERE MSGTYP = 'E'   OR MSGTYP = 'S'.
      SELECT SINGLE * FROM T100 WHERE SPRSL = IT_MESS-MSGSPRA
                                AND   ARBGB = IT_MESS-MSGID
                                AND   MSGNR = IT_MESS-MSGNR.
      IF SY-SUBRC = 0.
        L_MSTRING = T100-TEXT.
        IF L_MSTRING CS '&1'.
          REPLACE '&1' WITH IT_MESS-MSGV1 INTO L_MSTRING.
          REPLACE '&2' WITH IT_MESS-MSGV2 INTO L_MSTRING.
          REPLACE '&3' WITH IT_MESS-MSGV3 INTO L_MSTRING.
          REPLACE '&4' WITH IT_MESS-MSGV4 INTO L_MSTRING.
        ELSE.
          REPLACE '&' WITH IT_MESS-MSGV1 INTO L_MSTRING.
          REPLACE '&' WITH IT_MESS-MSGV2 INTO L_MSTRING.
          REPLACE '&' WITH IT_MESS-MSGV3 INTO L_MSTRING.
          REPLACE '&' WITH IT_MESS-MSGV4 INTO L_MSTRING.
        ENDIF.
        CONDENSE L_MSTRING.
      ENDIF.
      CONDENSE G_INSNO.
      CONCATENATE 'For' ' ' G_INSNO ',' L_MSTRING INTO L_MSTRING SEPARATED BY SPACE.
FORMAT COLOR 2 ON.
*IF IT_MESS-MSGTYP = 'S' AND IT_MESS-MSGNR = '622'.
*WRITE: 1 sy-vline,
        L_MSTRING    under 'Error Messages',
       100 sy-vline.
*ULINE.
*ELSEIF IT_MESS-MSGTYP = 'E'.
WRITE: 1 sy-vline,
         L_MSTRING    under 'Logs',
        100 sy-vline.
ULINE.
*ENDIF.
ENDLOOP.
ENDFORM.                    " GET_MESSAGES
code for ZIL02_BDC    
.report ZIL02_BDC
       no standard page heading line-size 255.
*data : XYZ LIKE EGPLD-DEVLOC.
TYPES: BEGIN OF TY_OPEN,
        HAUS LIKE REG30-HAUS,
        EADAT(10),
        GERAETNEU LIKE REG30-GERAETNEU,
        MESSDRCK LIKE REG30-MESSDRCK,
        ZWSTANDCE LIKE REG30-ZWSTANDCE,
        XYZ LIKE EGPLD-DEVLOC,
      END OF TY_OPEN.
DATA: IT_OPEN TYPE STANDARD TABLE OF TY_OPEN WITH HEADER LINE.
DATA: BDCDATA TYPE STANDARD TABLE OF BDCDATA WITH HEADER LINE.
GET PARAMETER ID 'GEP' FIELD it_open-XYZ.
DATA :  IT_MESS TYPE STANDARD TABLE OF BDCMSGCOLL WITH HEADER LINE.
*include bdcrecx1.
start-of-selection.
perform bdc_dynpro      using 'SAPMILO0' '1110'.
perform bdc_field       using 'BDC_CURSOR'
                              'IFLO-TPLNR'.
perform bdc_field       using 'BDC_OKCODE'
                              '/00'.
perform bdc_field       using 'IFLO-TPLNR'
                              it_open-xyz.
perform bdc_field       using 'RILO0-TPLKZ'
                              'AO_GP'.
perform bdc_dynpro      using 'SAPMILO0' '2100'.
perform bdc_field       using 'BDC_CURSOR'
                              'IFLO-PLTXT'.
perform bdc_field       using 'BDC_OKCODE'
                              '=T\04'.
perform bdc_field       using 'IFLO-PLTXT'
                              'DEVICE LOCATION'.
perform bdc_dynpro      using 'SAPMILO0' '2100'.
perform bdc_field       using 'BDC_OKCODE'
                              '/00'.
perform bdc_field       using 'IFLO-PLTXT'
                              'DEVICE LOCATION'.
perform bdc_field       using 'BDC_CURSOR'
                              'ITOBATTR-EINZL'.
perform bdc_field       using 'ITOBATTR-IEQUI'
                              'X'.
perform bdc_field       using 'ITOBATTR-EINZL'
                              'X'.
perform bdc_dynpro      using 'SAPMILO0' '2100'.
perform bdc_field       using 'BDC_OKCODE'
                              '=BU'.
perform bdc_field       using 'IFLO-PLTXT'
                              'DEVICE LOCATION'.
perform bdc_field       using 'BDC_CURSOR'
                              'ITOBATTR-EINZL'.
perform bdc_field       using 'ITOBATTR-IEQUI'
                              'X'.
perform bdc_field       using 'ITOBATTR-EINZL'
                         'X'.
CALL TRANSACTION 'IL02' USING BDCDATA MODE 'A' MESSAGES INTO IT_MESS.
       Start new screen                                              *
FORM BDC_DYNPRO USING PROGRAM DYNPRO.
  CLEAR BDCDATA.
  BDCDATA-PROGRAM  = PROGRAM.
  BDCDATA-DYNPRO   = DYNPRO.
  BDCDATA-DYNBEGIN = 'X'.
  APPEND BDCDATA.
ENDFORM.                    "BDC_DYNPRO
       Insert field                                                  *
FORM BDC_FIELD USING FNAM FVAL.
  IF FVAL <> SPACE.
    CLEAR BDCDATA.
    BDCDATA-FNAM = FNAM.
    BDCDATA-FVAL = FVAL.
    APPEND BDCDATA.
  ENDIF.
ENDFORM.                    "BDC_FIELD

Hi Michelle,
No I havent tried this way. How to do that can you tell me ?
Regards
Anu

Similar Messages

  • Type of error in the log file while using using call transaction mode u2018Eu2019

    Hi Gurus,
    Please Answer for this qusetion urgently
    what type of error exactly  you will be seeing in the log file while using call transaction mode u2018Eu2019?
    Thanks/
    Radha.

    Hi,
    Can you be clear.
    In call transaction , no error logs  are created, you have to handle the errors explicitly using the structure BDCMSGCOLL.
    Whenever you use E mode then if the transaction encounters any of the errors i.e. data type mismatching or invalid values etc, it will stop at that screen.
    You can handle the errors in call transaction in the following method.
    create a table using the structure BDCMSGCOLL.
    then
    loop at ......
          CALL TRANSACTION 'XK01' USING I_BDCDATA MODE 'N' UPDATE 'S' MESSAGES INTO I_MESGTAB.
    endloop.
      SORT I_MESGTAB BY MSGID MSGV1 ASCENDING.
      DELETE ADJACENT DUPLICATES FROM I_MESGTAB.
      LOOP AT I_MESGTAB.
        CALL FUNCTION 'FORMAT_MESSAGE'
          EXPORTING
            ID   = I_MESGTAB-MSGID
            LANG = I_MESGTAB-MSGSPRA
            NO   = I_MESGTAB-MSGNR
            V1   = I_MESGTAB-MSGV1
            V2   = I_MESGTAB-MSGV2
            V3   = I_MESGTAB-MSGV3
            V4   = I_MESGTAB-MSGV4
          IMPORTING
            MSG  = MESG1.
        IF I_MESGTAB-MSGTYP = 'S' .
          WA_SUCCMESG-MESG = MESG1.
          APPEND WA_SUCCMESG TO I_SUCCMESG.
    else     IF I_MESGTAB-MSGTYP = 'E' .
          WA_ERRMESG-MESG = MESG1.
          APPEND WA_ERRMESG TO I_ERRMESG.
        ENDIF.
      ENDLOOP.
    Hope this is clear.
    Thanks and Regards.

  • Error msgs in call transaction mode using RFBIBL00

    Hi Gurus,
    I am using FRBIBL00 program in call transaction mode to post FI documents and i am getting the below msgs:
    FB012                    Session 1 : Special character for 'empty field' is /
    F5201                    Posting period 008 0831 is not open
    FB012                    Session 1 : Special character for 'empty field' is /
    FB007                    Session 1 session name TEST1 was opened
    FB008                    Session 1 session name TEST1 was created
    Please help me in resolving this.
    Regards'
    Madan.

    Hi Prabhu/Vishwa,
    Thanks for your quick response.
    I am calling RFBIBL00 in "call transaction" mode to post FI ocs.
    here is the format of the file written on to the application server.
    Session - 0TEST1       100KBQ9FCEC    00000000X/
    Header - 1FB01                20080816SAYBP120080831/ CHF  /         /         20080831/               /               /                        /   /
    Item level - 2BBSEG                         50/         //   79378           /               /               /               IU//               /
    2BBSEG                         40/         //   79378           /               /               /               IU//               /
    2BBSEG                         50/         //   42266           /               /               /               IU//               /
    2BBSEG                         40/         //   42266           /               /               /               IU//               /
    The file format is correct, it is working fine in case of Batch session method.
    I want it to work for both Batch session and Call transaction.
    Please help me to reslove call transaction mode.
    Regards'
    Madan.

  • Call transaction mode A

    Hi guys,
    I am executing Tx code Me11 with paramater mode A and when i execute my report it does not show the dynpros that shouuld appear.
    Bdc_data parameter is filled with the record of tx me11.
    Any idea?
    Best regards
    Jon

    Hi,
    Can you show the code how you are calling the transaction ? and how you are passing the parameter in ctuparams ?
    And Currently have you checked what message it is giving in messtab after the call transaction ?
    Regards,
    Madhukar Shetty

  • Regarding fetching multiple records in a BDC call transaction mode

    hi experts,
    well the scenario is that i hv made a bdc report in which the values concerning purchase orders are stored in a text file in the form of records.(rows) and i want to upload these values into the transaction me21n.
    i hv been able to do that by marking a recording nd then using GUI UPLOAD fm and then fetching the values from an internal table,(which had all the row values)
    but now the problem is that i want to fetch multiple rowws at one go.
    as in different purcahse quantity , net price etc under teh same purchase order.
    that is i want to upload various rows for the same purchase order.
    could u guys plz help me with this.
    points will be rewarded generously.
    take care all.

    Hi,
    First you sort the internal table by PO number before sending to BDC. Then loop at this internal table. For each new PO number build BDC tables.
    I am giving pseudo code below.
    Loop at potable.
    at new potable-ponumber.
      bdctable-ponumber = potable-ponumber.
    endat.
    fill item data like matnr,quantity....
    at end of potable-ponumber.
      call transaction.
    endat.
    endloop.
    Hope this helps.
    Ramesh.

  • Calling transaction MB03, ME53N and ME23N in SRM (Suppliers Relationship M)

    Hi Experts,
    I would like to ask if there are any ways or possibilities that I can call the transactions MB03, ME53N and ME23N in SRM system?
    Those transactions mentioned are in ERP and there's a report program that displays the list of PO/GR/PR numbers in SRM and once the user doubled-click in one of those doc. numbers.. those transaction should be called..
    How can I satisfy this criteria? Is it possible even if those transactions are not found in SRM system? Do we have the equivalent of those transactions in SRM?
    Thanks in advance!

    Hi,
    I propose you to learn from this easy weblog.
    I have tested it and it works.
    /people/durairaj.athavanraja/blog/2005/08/21/running-your-first-its-webgui-application-in-sap-netweaver-04-abap-edition--nsp
    The only variant here is that you will have to doit in ECC or R/3 and then add this to a transction directly in SRM PFCG.
    Be careful, webgui transaction requires 10 times more bandwitch than sapgui.
    Kind regards,
    Yann

  • RFBIBL00 - call transaction - Restart Mechanism

    Hi Gurus,
    I am using program RFBIBL00 thru call transaction mode.
    I have gone through the Documentation of the program regarding Restart Mechanism.
    Can any one pls help to understand/implement regarding Restart mechanism.
    Regards'
    Madan.

    Hello Madan,
    Were you able to obtain more information about this? I'm having the same issue right now, and I would appreciate some help.
    Can you please inform me if you found something?
    Thanks,
    Yusuf

  • Call transaction for less than 10,000 records

    Hi all
    Is call transaction advisable for processing less than 10,000 records.
    I want to use call transaction for each record and if it fails, pass it to an opened bdc session for manual processing by functional consultants. At the same time, I have to write a report with successful and errored records. Is my approach the only way? Any other ideas are welcome and appreciated
    Thanks
    ricky

    Its completely safe.
    Check the return table for all message type E and then recreate your Error table and pass it to BDC open session and can be executed from SM35 in foreground mode. But what happen if there are more say 100 or 200 error records are there.Its not feasible to go and run each record in Foreground mode.Instead Display the error records in an editable ALV with the error message trap from the CALL Transaction return table and let the consultant correct then on the screen and download it, modify it to suit the upload procedure of your report. Then reprocess the file.
    Also, display the audit report based on that table.
    Regards,
    Amit

  • Call transaction doubt?

    hi experts,
    I want to call a transaction and to invoke a function code in the called transaction without any user interaction. Is it possible to use <b>call transaction "Tcode" </b>statement and pass a fuction code along with it. else suggest me how to over come this problem.
    with regards,
    James....
    valuable answers will be rewarded..........

    this is one more addtion of the CALL TRANSACTION statement
    ... <b>USING bdc_tab [bdc_options]</b>
    Effect
    Use this addition to pass an internal table bdc_tab of row type BDCDATA from the ABAP Dictionary to a dialog transaction. The additions bdc_options control the batch input processing. When a transaction with addition USING is called, the system field sy-binpt is set to value "X" in the called program - while this transaction is running, no other transaction can be called with this addition.
    The internal table bdc_tab is the program-internal representation of a batch input session and must be filled accordingly. The structure BDCDATA has the components shown in the table below.
    Component Description
    PROGRAM Name of the program of the called transaction
    DYNPRO Number of the dynpro to be processed
    DYNBEGIN Flag for the beginning of a new dynpro (possible values are "X" and " ")
    FNAM Name of a dynpro field to be filled or batch input control statement, for example, to position the cursor
    FVAL Value to be passed to the dynpro field or to the control statement
    Using the internal table bdc_tab, you can provide any number of screens of the called transaction with input and user actions.
    System Fields
    sy-subrc Description
    0 The batch input processing of the called transaction was successful.
    < 1000 Error in the called transaction. If within the transaction a message was sent, you can receive it using the addition MESSAGES.
    1001 Error in batch input processing.
    Note
    Outside of ABAP Objects you can specify the additions AND SKIP FIRST SCREEN and USING together. However, this does not make sense, because the addition AND SKIP FIRST SCREEN is desigend only to fill the mandatory input fields using SPA/GPA parameters, while the batch input table specified with USING controls the entire transaction flow including the display of the screens.
    Example
    Call of the Class Builder (transaction SE24) and display of class CL_SPFLI_PERSISTENT. The internal table bdcdata_tab contains the input for the batch input processing of the first dynpro (1000) of the transaction. Using structure opt, the batch input processing is set to suppress the first screen and to display the next screen in the standard size.
    DATA class_name(30) TYPE c VALUE 'CL_SPFLI_PERSISTENT'.
    DATA: bdcdata_wa  TYPE bdcdata,
          bdcdata_tab TYPE TABLE OF bdcdata.
    DATA opt TYPE ctu_params.
    CLEAR bdcdata_wa.
    bdcdata_wa-program  = 'SAPLSEOD'.
    bdcdata_wa-dynpro   = '1000'.
    bdcdata_wa-dynbegin = 'X'.
    APPEND bdcdata_wa TO bdcdata_tab.
    CLEAR bdcdata_wa.
    bdcdata_wa-fnam = 'BDC_CURSOR'.
    bdcdata_wa-fval = 'SEOCLASS-CLSNAME'.
    APPEND bdcdata_wa TO bdcdata_tab.
    CLEAR bdcdata_wa.
    bdcdata_wa-fnam = 'SEOCLASS-CLSNAME'.
    bdcdata_wa-fval = class_name.
    APPEND bdcdata_wa TO bdcdata_tab.
    CLEAR bdcdata_wa.
    bdcdata_wa-fnam = 'BDC_OKCODE'.
    bdcdata_wa-fval = '=CIDI'.
    APPEND bdcdata_wa TO bdcdata_tab.
    opt-dismode = 'E'.
    opt-defsize = 'X'.
    CALL TRANSACTION 'SE24' USING bdcdata_tab OPTIONS FROM opt.

  • No locks realease with CALL TRANSACTION

    Hi all,
    I have a problem. I have a call transaction statement inside of a Loop. The problem is that it brings in the messtab a message that says that the product that I'm trying to modify is locked after each loop pass. I've tried to correc it using COMMIT WORK AND WAIT, WAIT UP TO 5 seconds, DEQUEUE ALL and modifying the update technique of the call transaction to S and L....but nothing helps.
    In addition, I have the same problem but instead of using a call transaction statement I used a BAPI ( BAPI_PRDSRVAPS_SAVEMULTI2)
    I use the BAPI in this way.
    CALL FUNCTION 'BAPI_PRDSRVAPS_SAVEMULTI2'
      EXPORTING
        logical_system                    = wl_logsis
      SAVE_OPTIONS                      =
       COMMIT_CONTROL                     =  ''
      BUSINESS_SYSTEM_GROUP             =
    TABLES
       PRODUCT_LOCATION_VERSION          = t_location_ver
       PRODUCT_LOCATION_VERSION_X        = t_location_verx
       RETURN                            = t_return1.
    Please some ideas...
    Thanks.

    Hi guys,
    I've been trying in the way you said but I've not be able to solve the problem. This is part of the code I wrote before calling BAPI in order to get success.
    wl_tabix = 1.
      WHILE wl_tabix ne 1.
        CALL FUNCTION 'ENQUEUE_/SAPAPO/E_MATKEY'
          EXPORTING
            MODE_/SAPAPO/MATKEY_LOCK       = 'E'
            MANDT                          = SY-MANDT
            MATNR                          = gt_outtab-matnr
         EXCEPTIONS
           FOREIGN_LOCK                   = 1
           SYSTEM_FAILURE                 = 2
           OTHERS                         = 3.
         MOVE sy-subrc TO wl_tabix.
         IF wl_tabix ne 1.
           CALL FUNCTION 'DEQUEUE_/SAPAPO/E_MATKEY'
            EXPORTING
               MODE_/SAPAPO/MATKEY_LOCK       = 'E'
               MANDT                          = SY-MANDT
               MATNR                          = gt_outtab-matnr.
         ENDIF.
      ENDWHILE.
    Please, some ideas for this because I'm still stuck on it.
    Thanks.

  • Call transaction ME23N

    Hi There!
    I'm doing a call transaction of ME23n and it's working fine, the problem is, and after googling it lots, I couldn't fine the answer, that the Help panel appears always and the user does not want that!.
    It there any thick that I'm missing to call the transaction without displaying the Help?
    Thanks in advance.

    Thanks Chen! This is what I was after.
    For better details on the problem My first screen looks like this.
      PERFORM bdc_dynpro TABLES lt_bdcdata USING 'SAPLMEGUI'  '0014'.
      PERFORM bdc_field  TABLES lt_bdcdata USING 'BDC_OKCODE'     '=MECHOB'.
      PERFORM bdc_field  TABLES lt_bdcdata USING 'BDC_OKCODE' '=MEHELP'.
    Thanks again!

  • Call transaction KB21N processed by a program in background mode

    Hi to all,
    I call transaction KB21N using BDCDATA in a custom program. If I process this program in foreground mode all it's OK, but if I process the program in background mode, I have a runtime error with DUMP: RAISE EXCEPTION with exception condition CNTL_ERROR. This program has to be executed in background so a bapi exist to use instead of call transaction or something else?
    Thank you very much,
    regards
    Antonio

    HI Antonio,
    The transaction you are dealing with is an SAP Enjoy transaction and for such transactions it is not recommended to do a BDC. YOu should search for  a BAPI for the same as you have already identified. Basically the enjoy transactions uses GUI controls which cannot be handled by BDC.
    BAPI_ACC_ACTIVITY_ALLOC_POST may serve your purpose.
    Regards,
    ravi
    Message was edited by:
            Ravi Kanth Talagana

  • Call Transaction in background mode

    Hi everyone,
    What I am currently trying to do is to perform a 'call transaction' while forcing the 'background processing' mode even when the user is running the program in online mode; this allows me to retrieve a lot more messages that are useful to the user than the messages generated in online mode.
    As long as I have seen there is no field for that in the options table that can be passed to the 'call transaction' sentence. The only way to see that behavior while in online mode is by 'playing back' a recording thru the SHDB transaction and checking the 'Simulate background' option.
    My first attempt was to set the SY-BATCH flag before doing the call transaction but it doesn't work, the flag seems to reset itself with the correct value during the call.
    Any comments on this would be greatly appreciated.
    Regards,
    Sergio

    You would have to create a job on the fly to do this.  This example shows how to kick off a background job via an ABAP program.
    report zrich_0004 .
    data:   sdate type sy-datum,
            stime type sy-uzeit,
            l_valid,
            ls_params like pri_params,
            l_jobcount like tbtcjob-jobcount,
            l_jobname  like tbtcjob-jobname.
    start-of-selection.
    * Get Print Parameters
      call function 'GET_PRINT_PARAMETERS'
           exporting
                no_dialog      = 'X'
           importing
                valid          = l_valid
                out_parameters = ls_params.
    * Open Job
      l_jobname = 'ZRICH_0005'.
      call function 'JOB_OPEN'
           exporting
                jobname  = l_jobname
           importing
                jobcount = l_jobcount.
    * Submit report to job
      submit zrich_0005   
           via job     l_jobname
               number  l_jobcount
           to sap-spool without spool dynpro
               spool parameters ls_params
                  and return.
    * Schedule and close job.
      call function 'JOB_CLOSE'
           exporting
                jobcount  = l_jobcount
                jobname   = l_jobname
                strtimmed = 'X'

  • Call transaction in mode N fro transaction F-02

    Hi,
    The call transaction for F-02 work well in mode 'A' and it creates the FI posting. But when I execute it in mode 'N' it does not post.
    Any ideas?
    Thanks in advance.

    Hi Abel Isaac Polo,
    Welcome to SCN, as per your issue I do't thing that should happend... Can you paste wht all paramenters which you are passing to CALL Transaction statement.
    Regards,
    Suneel G

  • Call transaction in N mode

    Hi,
    I have used BDC Call transaction method in N(background) mode from my report.
    But when the report itself,  is run in background, then the BDC is not working.
    Please help. I must run the report in background as well.
    Thanks&Regards
    Ananya Mukherjee

    I faced the same issue while running a BDC for a custom transaction. It was working fine in foreground, but not in background with error log message "Object Reference Not Assigned". Later, we found out that, it was due to some HTML text editors and inplace excel displays, which interact with foreground processes and can't run in background.
    Kindly check the error log of the BDC. Write the errors in application server or in report output using WRITE statement, so that you can check it in spool.
    In your custom dialog program check for any inplace document displays, HTML text editors or GUI functionalities. If it's due to GUI functionalities only, run the piece of code responsible for the GUI , only when sy-batch NE X in your main dialog program.

Maybe you are looking for

  • Problem with preview PDF files on Windows 7 32bit

    Hello, in my office I have a problem with preview PDF files on my computers. The files are allright, but if I select a file and click on preview mode after ~ 10sec operation system write something "Preview this file is corrupt for PDF Preview Handler

  • Adobe AIR will not Install

    I am having trouble running the packaged adobe Air installer (downloaded from http://get.adobe.com/air). The .dmg image mounts fine, then when I double-click or select the package nothing runs. I even tried to run the installer inside the package (fr

  • Wierd noise when Using the XP partition

    Hey guys, When I'm using the XP partition I would also plug in another monitor while working. I would get this weird sound (like a robot) followed by pauses or short freezes when in the middle of my work. It doesn't happen all the time but only when

  • What are the routines available in abap

    hi all, I have found 2 routines so far widely used in abap. They are conversion routines in data element and user defined routines in lswm.Can anyone let me know is there any other routines apart from the above 2 routines specified. thanxs hari

  • RMAN Catalog - Identify session for a specific SID

    Dear all, is it possible to identify the rman session on the recovery-catalog database that is currently backing up a specific SID? Or in other words: Is the SID of the target database visible somewhere in the V$-Views on the catalog database when a