Call Transaction / Submit Program

Hello All,
I have two ABAP reports : Report A & Report B.
Report A has selection screen similar to Report B, where report A needs to send data to selection screen of Report B.
Report B should be processed displaying its list display & should return its control back to Report B.
This can be easily achieved by using SUBMIT program(Report B) with values from Report A.
But my report B is made to run only via a TCode(ZEXECUTE) & hence when i submit program it is not executed
as sy-tcode value in such case comes as SE38 .
Further , Call Transaction (ZEXECUTE) using bdc_tab helps in passing the TCode & respective selection screen values
correctly to Report B , but i am not able to see the outputs of the same.
Please Note : I am not authorized to do any changes in Report B , so whatever i can try is from Report A itself.
Kindly Help,
Sudeep

HI Suhas ,
Firstly thanks for replying.
1) Do you mean there is a hardcoding in Report B to check the t-code?
    Yes.
2) What is the display mode you're using when doing via CALL TRANSACTION?
    Currently i am passing it as "A" , but still not able to get any output.
Report A provides report B all the required values along with 'BDC_OKCODE'   '=ONLI'
for executing the same. The report gets processed , but i am not able to see any list display.
Thanks,
Sudeep

Similar Messages

  • Call Transaction from Program by Skipping Initial Screen & Pass the Value

    Hi All,
    Can anybody help me to call a transaction from my program. I do not want to display the initial screen of the transaction but that TCODE should get opened by passing the values to the parameter of the initial screen.
    For Example, in my program I want to call 'SE38' and in that, my Program of Name 'ZTEST' should get opened. So I need to call Transaction SE38, but I donot want to display initial screen of that. Instead of that, I want to put the value of Program 'ZTEST' and thus my program should get opened.
    Sandip

    Hello Sandip,
    Since you have not made any references to Batch Processing, I shall tell you the normal way to do it. First look at the code below and execute it.
    set parameter id 'DTB' field 'VBAK'.
    call transaction 'SE16' and skip first screen.
    There are a few things that you need to keep in mind before you use this statement:
    1. All mandatory input fields of the initial dynpro must be filled completely and with the correct values by the SPA/GPA parameters.
    2. For the initial dynpro, in the Screen Painter the own dynpro number must not be specified as the next screen number. However, if the next screen can be reached from the first screen by just hitting the Enter key, this will work.
    The following will not work as you expect, because the next screen in the transaction cannot be reached by just hitting the Enter Key.
    set parameter id 'RID' field 'ZTEST'.
    call transaction 'SE38' and skip first screen.
    Regards,
    Anand Mandalika.
    Please reward points if this helps.

  • Writing a Batch Input or Call Transaction program for transaction code MMAM

    Hi All,
    I'm writing a Batch Input or Call Transaction program for transaction code MMAM (Changing Material Type). The program was able to run but somehow I was not able to capture the log of the output after running MMAM. The log was not part of the SY-MESSAGE so adding in MESSTAB into call transaction doesn't help while BDC session logs shows only the transaction was processed.
    Anyone has encounter such problems before?
    Regards,
    Ramu.

    Hi
    Overview of Batch Input Session
    The first batch input method is to create a batch input session. It is the processing of this batch input session that updates the database, not the execution of the batch input program. i am giving you example for Change Vendor you practice for ur tcode
    For our example, we will use the “Change Vendor” transaction (“FK02”) to add a street address to an already existing vendor.
    Step #1
    Use “SystemStatus” menu path to determine online program name (SAPMF02K), screen number (0110)
    Step #2
    Use “F1” key and “Technical Info” pushbutton in each screen field to be filled to determine the field name.
    Step #3
    Determine how to proceed in the transaction
    (save the record by clicking on the ‘Save’ pushbutton or pressing the ‘F11’ key).
    The process flow of CALL TRANSACTION
    A program that uses CALL TRANSACTION USING to process legacy data should execute thefollowing steps:
    Prepare a BDCDATA structure for the transaction that you wish to run.
    Prepare a internal table to store error messages Tab_Mess like structure of BDCMSGCOLL.
    With a CALL TRANSACTION USING statement, call the transaction and prepare the BDCDATA structure. For example:
    CALL TRANSACTION ‘MM01' USING BDCDATA MODE 'A' UPDATE 'S'. MESSAGES INTO TAB_MESS.
    IF SY-SUBRC <> 0.
    <Error_handling>.
    ENDIF.
    Overview of Batch Input Session
    The first batch input method is to create a batch input session. It is the processing of this batch input session that updates the database, not the execution of the batch input program

  • Import internal table in submit program via job

    Hi,
    I'm submitting in a backgroudn job a program wich does a CALL TRANSACTION, this program submited reads ITBDC table importing table from memory ID 'itbdc' but this is empty, why in background job processing it can´t read data from memory because It seems it reads from another place or it's not reading anything!
    Thanks!!

    REPORT report2.
    DATA: text       TYPE c LENGTH 10,
          rspar_tab  TYPE TABLE OF rsparams,
          rspar_line LIKE LINE OF rspar_tab,
          range_tab  LIKE RANGE OF text,
          range_line LIKE LINE OF range_tab.
    rspar_line-selname = 'SELCRIT1'.
    rspar_line-kind    = 'S'.
    rspar_line-sign    = 'I'.
    rspar_line-option  = 'EQ'.
    rspar_line-low     = 'ABAP'.
    APPEND rspar_line TO rspar_tab.
    range_line-sign   = 'E'.
    range_line-option = 'EQ'.
    range_line-low    = 'H'.
    APPEND range_line TO range_tab.
    range_line-sign   = 'E'.
    range_line-option = 'EQ'.
    range_line-low    = 'K'.
    APPEND range_line TO range_tab.
    SUBMIT report1 USING SELECTION-SCREEN '1100'
                   WITH SELECTION-TABLE rspar_tab
                   WITH selcrit2 BETWEEN 'H' AND 'K'
                   WITH selcrit2 IN range_tab
                   AND RETURN.

  • Statement "CALL TRANSACTION" is not allowed in this form.

    Hi
    I have a form in which i want to call a transaction:
      CALL TRANSACTION 'VL32N'  USING bdc_tab
                                                       MODE    'E'
                                                       UPDATE  'S'
                                                       MESSAGES INTO mestab.
    I call this report from within a message and when reaching this statement it fails.
    Now i get this error in ST22:
    POSTING_ILLEGAL_STATEMENT
    Statement "CALL TRANSACTION" is not allowed in this form.
    and afterwards this error:
    DYNPRO_SEND_IN_BACKGROUND
    Screen output without connection to user.
    As i read,it is not allowed to call this kind of statement from within a form and we should use something like:
    RECEIVE RESULTS FROM FUNCTION but i do not know how because i have never before used such call statements.
    thanks

    Hi,
    The bdc table is filled correctly but the CALL TRANSACTION is not alllowed.I think it is because of the call from the Form ENTRY which is called when issuing an message from my transaction.I have read that it is not allowed to have any call transaction,submit or any other statements like these in a function call,and i think that my form ENTRY is seen as a sort of function module.
    Any other opinions?
    With my "call transaction" statement i wanted to open the VL32N Transaction and post a goods receipt.Is there any other way to do this?
    I get this message in the ST22 Transaction:
    This program is triggered in the update task. There, the   
    following ABAP/4 statements are not allowed:                                                                               
    -  CALL SCREEN                                             
    -  CALL DIALOG                                             
    -  CALL TRANSACTION                                        
    -  SUBMIT                                                  
    But i do not know what is ment by update task.All i use are some "export to memory"  statements and this is all.
    Any ideas?
    thanks.
    Edited by: seba seba on Jul 28, 2009 11:22 AM

  • Alternatine to call Transaction.

    Hi All,
    Need a Solution to call se38 with a program name 'ZTEST' which skips the first screen.
    I tried using
      SET PARAMETER ID 'RID' FIELD 'ZTEST'
      CALL transaction 'SE38' AND SKIP FIRST SCREEN .
    But unable to skip the first screen and display the report.
    Thanks & Regards,
    Santosh

    HI ,
    i think for call transaction alternative is SUBMIT so
    y can;t u try using SUBMIT if any doubt let me know .
    SUBMIT
    Basic forms:
    1. SUBMIT rep.
    2. SUBMIT (name).
    Extras:
    1. ... LINE-SIZE col
    2. ... LINE-COUNT line
    3. ... TO SAP-SPOOL List output to the SAP spool database
    4. ... USING SELECTION-SCREEN scr
    5. ... VIA SELECTION-SCREEN
    6. ... AND RETURN
    7. ... EXPORTING LIST TO MEMORY
    8. ... USER user VIA JOB job NUMBER n
    9. ...Various additions for passing parameters to rep
    10. ... USING SELECTION-SETS OF PROGRAM prog
    Effect
    Calls report rep.
    The system leaves the active program and starts the new report rep. In basic form 2, you can specify the name of the report in the field name. You must specify the name in uppercase, otherwise a runtime error occurs.
    Note
    ·     You can only start programs with type '1' using SUBMIT. If the program has a different type, the system triggers a runtime error.
    Please consult Data Area and Modularization Unit Organization documentation as well.
    Addition 1
    ... LINE-SIZE col
    Effect
    The list generated by the report has the line width col.
    Addition 2
    ... LINE-COUNT line
    Effect
    The list generated by the report has line lines per page.
    Addition 4
    ... USING SELECTION-SCREEN scr
    Effect
    When you execute the report, the system uses the selection screen number that you specify in the scr field. This must be a selection screen defined using the SELECT-OPTIONS, PARAMETERS and SELECTION-SCREEN statements.If you omit the addition, the system uses the standard selection screen 1000.
    This addition allows you to start the same report in different situations, using a different selection screen each time.
    Notes
    1.     The addition VIA SELECTION SCREEN determines whether the report is processed in the foreground or the background.
    2.     What happens if the required screen does not exist or is not a selection screen?
    Screen 1000:
    If you want to use the standard selection screen (... USING SELECTION-SCREEN 1000 or do not specify a ... USING SELECTION-SCREEN) addition, the system does not process a selection screen.
    Other selection screens:
    The system triggers a runtime error.
    Addition 5
    ... VIA SELECTION-SCREEN
    Effect
    The selection screen is displayed. In this case, the selection screen is displayed again after the report list has been displayed. The values entered by the user remain displayed.
    Addition 6
    ... AND RETURN
    Effect
    Returns to the calling transaction or program after the called program has been executed. SUBMIT ... AND RETURN creates a new internal session.
    Addition 7
    ... EXPORTING LIST TO MEMORY
    Effect
    Does not display the output list of the called report, but saves it in ABAP memory and leaves the called report immediately. Since the calling program can read the list from memory and process it further, you need to use the addition ... AND RETURN . Also, since the called report cannot be requested for printing, the addition ... TO SAP-SPOOL is not allowed here. In addition, you must not assign a function code to the ENTER key in the current GUI status. The saved list is read from the SAP memory using the function module 'LIST_FROM_MEMORY' and can then be saved to the database using EXPORT, for example. You can process this list further with the function modules 'WRITE_LIST', 'DISPLAY_LIST' ... of the function group "SLST".
    Addition 8
    ... USER user VIA JOB job NUMBER n
    Effect
    Schedules the specified report in the job specified by the job name job and the job number n. The job runs under the user name user and you can omit the addition USER user. The assignment of the job number occurs via the function module JOB_OPEN (see also the documentation for the function modules JOB_CLOSE and JOB_SUBMIT). This addition can only be used with the addition ...AND RETURN.
    Note
    When scheduling a report with the SUBMIT ... VIA JOB job NUMBER n statement, you should always use the addition ...TO SAP-SPOOL to pass print and/or archive parameters. Otherwise, default values are used to generate the list and this disturbs operations in a production environment.
    SY-SUBRC = 0:
    Job scheduled successfully
    SY-SUBRC = 4:
    Job scheduling terminated by user
    SY-SUBRC = 8:
    Error in job scheduling (JOB_SUBMIT)
    SY-SUBRC = 12:
    Error in internal number assignment
    Addition 10
    ... USING SELECTION-SETS OF PROGRAM prog
    Effect
    Uses variants of the program prog when executing the program rep.
    Note
    Important
    The programs prog and rep must have the same SELECT-OPTIONS and PARAMETERs. Otherwise, variants of the program prog may be destroyed.
    Note
    When using this addition, the specified variant vari of the program prog is taken in USING SELECTION-SET vari. On the other hand, all variant-related actions on the selection screen of rep (Get, Save as variant, Display, Delete) refer to the variants of prog.
    Example
    SUBMIT REPORT01
           VIA SELECTION-SCREEN
           USING SELECTION-SET 'VARIANT1'
           USING SELECTION-SETS OF PROGRAM 'REPORT00'
           AND RETURN.
    Effect
    Executes the program REPORT01 with the variant VARIANT1 of the program REPORT00.
    Exceptions
    Non-Catchable Exceptions
    ·     Cause: The specified program was not found.
    Runtime Error: LOAD_PROGRAM_NOT_FOUND
    ·     Cause: Invalid value passed to a selection with SIGN.
    Runtime Error: SUBMIT_WRONG_SIGN
    ·     Cause: The specified program is not a report.
    Runtime Error: SUBMIT_WRONG_TYPE
    ·     Cause: More than one value passed to a report parameter.
    Runtime Error: SUBMIT_IMPORT_ONLY_PARAMETER
    ·     Cause: Table passed to a selection with WITH sel IN itab that has an unexpected structure.
    Runtime Error: SUBMIT_IN_ITAB_ILL_STRUCTURE
    Additional help
    Starting Executable Programs (Reports)
    THx

  • CALL TRANSACTION won't execute report, keeps returning to program

    Good day to you!
    I have the following code:
      CALL TRANSACTION 'FPO4' USING bdcdata
                              MODE   'A'.
    The last line in my bdcdata is to simulate pressing the Execute button (OK_CODE = '=ONLI').  However, instead of running the report that FPO4 is supposed to generate, it just comes back to my program and its selection screen.
    Please note that although I am populating data on FPO4's native Selection Screen, I am also populating data on a special "predefined selection," so using a simple SUBMIT has never been an option to me.
    Does anyone know how I can get FPO4 to actually execute vs. coming back to my program?
    Thanks -- as always, points for all helpful answers!

    Before calling the call transaction, put a dummy screen of the report output
    ' ' 'OK_CODE' '=ONLY'.
    *This screen name nad number should come in the SHDB recording..
    *Don't assing any OK_CODE to that screen
    Perform screen 'X' 'SAPMSSY0' '0120'.   "<< it should be your reports screen
    CALL TRANSACTION 'FPO4' USING bdcdata
    MODE 'A'.
    Actually, I dont' have this transaction in my systm otherwise I should able to give you exact screen name and number.
    Regards,
    Naimesh Patel

  • CALL TRANSACTION or SUBMIT

    Hi guys,
    I have a problem with calling a program(or transaction code).
    I want to call a program with a variant by "CALL TRANSACTION" or "SUBMIT".
    I checked that "SUBMIT" is possible by using "SELECTION-SET" but I can't use it because it doesn't allow calling a program with a variable which has the program name like below.
    'SUBMIT gv_program SELECTION-SET gv_variant.'
    Is there a solution for this?
    Thanks.

    No, it is not possible to call a program/transaction using a variable in place of program name.
    As SUBMIT statement executes a report. Can only execute reports of type '1'.And the  ways that it could be used are :-
    *Code used to execute a report
    SUBMIT Zreport.
    *Code used to populate 'select-options' & execute report
    SUBMIT zreport with selection-table seltab
                     via selection-screen.
    *Code used to populate 'parameters' & execute report
    SUBMIT zreport with p_param1 = 'value'
                    with p_param2 = 'value'.
    *Submit report and return to current program afterwards
    SUBMIT zreport AND RETURN.
    *Submit report via its own selection screen
    SUBMIT zreport VIA SELECTION-SCREEN.
    *Submit report using selection screen variant
    SUBMIT zreport USING SELECTION-SET 'VARIANT1'.
    *Submit report but export resultant list to memory, rather than
    *it being displayed on screen
    SUBMIT zreport EXPORTING LIST TO MEMORY.
    And CALL TRANSACTION statement calls the transaction whose transaction code is contained in data object ta.
    CALL TRANSACTION ta
    { [AND SKIP FIRST SCREEN]  ---- suppresses the display of a screen of the initial dynpro
    | [USING bdc_tab [bdc_options]] }. -----  enables the transaction to be executed using a batch input table. This requires an internal table bdc_tab of row type BDCDATA to be passed from ABAP Dictionary to a dialog transaction
    Wish this helps you...
    Regards,
    Bishwajit

  • Call transaction LM05 from Z program

    Hi,
    I need to call transaction LM05 from a Z program, and when LM05 finishes then continue with the process in Z program. But when i use CALL TRANSACTION 'LM05' the process does not return to program Z, when LM05 finishes,it returns to main screen of 'LM05' but not Z program.
    I change CALL TRANSACTION by SUBMIT zrlmob001 AND RETURN, but it happens the same, because transaction 'LM05' continuosly evaluates the system variable SY-TCODE, and therefore SY-TCODE contains code transaction 'ZXX'.
    it exists a way to call a LM05 transaction from Z program, and then continue in z program after LM05 finishes?
    can i create a user exit screen for transaction LM05 and use the user exit to continue with the process that i wish in Z program after call transaction 'LM05'?
    I'm in SAP version ECC 6.0.
    Thanks in advance
    Alejandro

    Hi,
    I want to share how i resolved this topic:
    I searched for user exit, badi and did'nt find a correct way to solved this issue. Also, i tried to create a screen exit for transaction LM05, but the dynpro 2100 of program SAPLLMOB is used for transaction LM02, LM03, LM05 and for each one show a diferent initial screen, this logic cannot be suplied with my custom screen.
    Finally, how the final option, i used a enhancement implementation to add code in SAP standard program RLMOB001, and the problem was resolved. i am in version SAP ECC6.0, in this version is posible to create enhancement implementation, and for support package and upgrade, SAP will not overwrite your custom code.
    Regards,
    Alejandro.

  • How to set the BDC Call transaction Program in Background

    Hi All,
            I have a requirement. If i execute a BDC Call Transaction Program in Background it is showing 0 seconds means it is not executing. Normally it is working properly. If execute in background it is not executing. But my client wnats to execute in background. How can i overcome this could you please suggest me?
    Thanks in Advance

    hi
    To schedule the processing of session in backgroud you can use report RSBDCSUB.
    You can do in two ways -
    Ist Method
    Define a batch job in SM36 with two steps -
    First Step - Your Custom Program ( with a variant )
    Second Step - RSBDCSUB ( With a variant having
    the session name ).
    2nd Method
    In your program after BDC_CLOSE_GROUP add a line.
    SUBMIT RSBDCSUB WITH MAPPE EQ <SESSION_NAME>.
    Scedule you program as a batch job in SM36 ( Single Step ). ( You can also test the program by running in online mode . After your programs executes , go and see in SM35. You will see that your session created in being processed or has been processed in background).
    In Both ways the session created by BDC_OPEN_GROUP will be processed in background
    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.
    regards
    Satish

  • Use call transaction or submit statement

    Hi, i have a complex transaction, it has two control programs, a Z program and a standard program. I need execute it by call transaction or submit statement. In this transaction there are some select-options that i want fill with specific values.
    Can you help me with it?

    Hi Robin, the SHDB transaction was very useful. Now i have other problem. This transaction execute a jobs set.I already have filled all of fields in the transaction, i saved the parameters for the execution by SAVE button (BDC_OKCODE=SAVE), but the transaction don't release the jobs and  must do it. The last action (to release the jobs set) is executed by the OK button(BDC_OKCODE=OK).
    This is the code that i'm implementing:
    REPORT  ZPRUEBA_SALDOS_ANTERIORES     .
    DATA: BDCDATA TYPE TABLE OF BDCDATA.
    DATA: ITAB TYPE TABLE OF BDCMSGCOLL.
    DATA: WA_ITAB TYPE BDCMSGCOLL.
    DATA: PROGRAM LIKE SY-REPID ,
          WA_BDCDATA TYPE BDCDATA.
    DATA: DATE_ID(10).
    DATA: DATE_CONV(11).
    DATA: T_ID(6).
    DATA: DES_ERROR(500).
    *"parametro zdo(para tipo de documentos)
    *RANGES: R_BLART FOR DFKKOP-BLART,
    *        R_VKONT FOR FKKVKP-VKONT.
    *INITIALIZATION.
    START-OF-SELECTION.
      CALL FUNCTION 'CONVERSION_EXIT_SDATE_OUTPUT'
           EXPORTING
                INPUT  = SY-DATUM
           IMPORTING
                OUTPUT = DATE_CONV.
      DATE_ID = SY-DATUM.
    CONCATENATE DATE_ID+6(2) '.' DATE_ID+4(2) '.' DATE_ID+0(4) INTO DATE_ID.
      CONCATENATE DATE_CONV+3(3) '_' DATE_CONV+0(2) INTO T_ID.
      WA_BDCDATA-PROGRAM = 'SAPLFKKAKTIV2'.
      WA_BDCDATA-DYNPRO  = '1000'.
      WA_BDCDATA-DYNBEGIN = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-FNAM = 'FKKAKTIV2_DYNP_1000-LAUFD'.
      WA_BDCDATA-FVAL = '11.06.2008'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'FKKAKTIV2_DYNP_1000-LAUFI'.
      WA_BDCDATA-FVAL = 'MAR_38'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
    *  WA_BDCDATA-PROGRAM = 'SAPLZ_CL_PROCESOS_EN_MASA'.
      WA_BDCDATA-PROGRAM = 'SAPLFKKAKTIV2'.
    *  WA_BDCDATA-DYNPRO  = '1001'.
      WA_BDCDATA-DYNPRO  = '1000'.
      WA_BDCDATA-DYNBEGIN = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'P_STICHT'.
      WA_BDCDATA-FVAL = DATE_ID.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'S_BUKRS-LOW'.
      WA_BDCDATA-FVAL = 'PCS'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'S_VKONT-LOW'.
      WA_BDCDATA-FVAL = '0'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'S_VKONT-HIGH'.
      WA_BDCDATA-FVAL = '999999999999'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=%01410010001580545'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-PROGRAM = 'SAPLALDB'.
      WA_BDCDATA-DYNPRO  = '3000'.
      WA_BDCDATA-DYNBEGIN = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
    *  CLEAR WA_BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(01)'.
      WA_BDCDATA-FVAL = 'BS'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(02)'.
      WA_BDCDATA-FVAL = 'FS'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(03)'.
      WA_BDCDATA-FVAL = 'CD'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(04)'.
      WA_BDCDATA-FVAL = 'EF'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(05)'.
      WA_BDCDATA-FVAL = 'TR'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(06)'.
      WA_BDCDATA-FVAL = 'TF'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(07)'.
      WA_BDCDATA-FVAL = 'TC'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(08)'.
      WA_BDCDATA-FVAL = 'LP'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'RSCSEL-SLOW_I(09)'.
      WA_BDCDATA-FVAL = 'NC'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=ACPT'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
    *  WA_BDCDATA-PROGRAM = 'SAPLZ_CL_PROCESOS_EN_MASA'.
      WA_BDCDATA-PROGRAM = 'SAPLFKKAKTIV2'.
    *  WA_BDCDATA-DYNPRO  = '1001'.
      WA_BDCDATA-DYNPRO  = '1000'.
      WA_BDCDATA-DYNBEGIN = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=TAB03'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=PRPRN'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-PROGRAM = 'SAPLSPRI'.
      WA_BDCDATA-DYNPRO  = '0100'.
      WA_BDCDATA-DYNBEGIN = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-FNAM = 'PRI_PARAMS-PDEST'.
      WA_BDCDATA-FVAL = 'LOCAL'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'PRI_PARAMS-PLIST'.
      WA_BDCDATA-FVAL = '1604_SA_16'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=SAVE'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-PROGRAM = 'SAPLFKKAKTIV2'.
      WA_BDCDATA-DYNPRO  = '1000'.
      WA_BDCDATA-DYNBEGIN = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
    *  CLEAR WA_BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=TAB04'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'FKKAKTIV2_DYNP_1190-VARI'.
      WA_BDCDATA-FVAL = 'INTERES'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'FKKAKTIV2_DYNP_1200-JOBS_LOAD_BALA'.
      WA_BDCDATA-FVAL = '6'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=SAVE'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=DISP'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-PROGRAM = 'SAPLFKJO_JOB'.
      WA_BDCDATA-DYNPRO  = '0100'.
      WA_BDCDATA-DYNBEGIN = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
      CLEAR WA_BDCDATA.
      WA_BDCDATA-FNAM = 'D100_FIELDS-XBACKGR'.
      WA_BDCDATA-FVAL = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'D100_FIELDS-XIMMEDIATE'.
      WA_BDCDATA-FVAL = 'X'.
      APPEND WA_BDCDATA TO BDCDATA.
      WA_BDCDATA-FNAM = 'BDC_OKCODE'.
      WA_BDCDATA-FVAL = '=OK'.
      APPEND WA_BDCDATA TO BDCDATA.
      CALL TRANSACTION 'ZPSA' USING BDCDATA  MODE 'A'
                               MESSAGES INTO ITAB.
    Edited by: Marcel ochoa on Jun 12, 2008 5:01 PM
    Edited by: Marcel ochoa on Jun 12, 2008 5:03 PM
    Edited by: Marcel ochoa on Jun 12, 2008 5:06 PM
    Edited by: Marcel ochoa on Jun 12, 2008 10:43 PM
    Edited by: Marcel ochoa on Jun 12, 2008 10:45 PM
    Edited by: Marcel ochoa on Jun 12, 2008 11:37 PM

  • Calling Transaction Import Concurrent Program in PL/SQl program

    Hi,
    I am trying to run Transaction Import process by calling the concurrent program in my pl/sql program.I think I am passing all the right paramters which are necessary.But the actual PAXTRTRX is never being called and I am not getting any request ID back.No exception is being thrown.Following is how I am calling the concurrent program...
    p_tran_imp_request_id := fnd_request.submit_request
         ( application => 'PA'     
              , program => 'PAXTRTRX'
              , sub_request => FALSE
              , argument1 => 'My Transaction Source name here'
              , argument2 => 'My batch name here'
    ,argument3 => 'my TXN_INTERFACE_ID here'
    If I run the PRC: Transaction Import from front end...the process is run and import was completed just fine.But I am not able to call concurrent program from my program.Is there anything I am missing...Is there any thing I need to do before I call the concurrent program...
    Any help in this issue is greatly appreciated.
    Thanks

    Hi,
    Thanks for the advise. Yes I was calling the initialize function but I was passing wrong application id and responsibility id to that.Now that is taken care of.
    Thanks

  • 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

  • Calling a Report Program In Web Dynpro Using Submit statment

    Hi all,
             Can any one suggest how can i call a report program form Web Dynpro using Submit statment. I tried to call it its showing Field symbols not defined error. Is their any other ways to call Report in a Web Dynpro?. I have posted the error message when i tried using SUBMIT ZRR AND RETURN CONTROL
    Field symbol has not yet been assigned.
    The error occurred on the application server mnghcmsap_HRS_00 and in the work process 1 .
    The termination type was: RABAX_STATE
    The ABAP call stack was:
    Form: CHECKBOX_OUT of program SAPLKKBL
    Form: GEN_LINE_OUT of program SAPLKKBL
    Form: DATA_OUT_SIMPLE of program SAPLKKBL
    Form: LIST_OUTPUT_NEW of program SAPLKKBL
    Form: FIRST_LIST_DISPLAY of program SAPLKKBL
    Module: LIST_DISPLAY of program SAPLKKBL
    Function: K_KKB_LIST_DISPLAY of program SAPLKKBL
    Method: PRINT_BACKEND of program CL_GUI_ALV_GRID===============CP
    Method: SET_TABLE_FOR_FIRST_DISPLAY of program CL_GUI_ALV_GRID===============CP
    Form: PBO of program SAPLSLVC_FULLSCREEN
    Edited by: VINMANO on Jul 22, 2009 2:54 PM

    HI,
    Its possible to call report program from Web dunpro...
    chk out dis link,
    calling report(se38) in webdynpro abap
    By the way are using field symbol anywhere and left it unassigned?
    Thanks,
    Divya.S

  • Call transaction in a BDC program...

    Hi,
    I can see in one of the BDC program, the call transaction command is used. This BDC program updates the Vendor master table.
    CALL TRANSACTION BLF00-TCODE USING  FT
                                     MODE   ANZ_MODE
                                     UPDATE UPDATE.
    Now, I am trying to know what transaction code it is using in above call transaction to update vendor master.
    Regards,
    Rajesh.

    Put a break point on that statement in that program and run your program using MODE 'A', step thru the screens, when you get to that statement in debug mode, simply click on the BLF00-TCODE and see the value. 
    Regards,
    Rich Heilman

Maybe you are looking for

  • How to preview a whole portrait picture in pan zoom mode?

    Hi I'm new. Currently, I'm trying to create a slide show for my website, and I want to make some motion(zoom in zoom out fade in and fade out) in my pictures. In pan zoom mode, I can preview a whole landscape oriented picture, but portrait oriented p

  • COPA exit COPA0007 for external data transfer

    Hello all, Have anyone already used COPA0007 Enhancement? Is ther any customizing that is needed in order to SAP stop execution with a break-point in the FM's associated. I'm trying to change data in external data transfer and I can not stop executio

  • Meta Tags inserted using menu

    The <head> of my template has four editable regions. One is for the title, one for meta-tags, one for styles, and one for scripts. If one of my web-editors uses the following menu: Insert -> HTML -> Head tags -> Meta The tag is placed in the last edi

  • Issues with integrating third party search engine

    hi, I have two issues. 1. my integration with Stellent verity search engine is working for the first time, but when I search again, nothing return, even on the same search criteria. I wonder something wrong with session object, please explain how ses

  • Copy writed material in a podcast

    Would it be legal or "ok" to pull songs from itunes that have been downloaded from the store or imported from a cd, and use them in a podcast, like a top 40 radio show?