SUBMIT ......WITH SELECTION-TABLE

Dear All,
I am using the following statement to send report to spool:
SUBMIT riafvc20  TO SAP-SPOOL
      SPOOL PARAMETERS K_PARAMS
      WITHOUT SPOOL DYNPRO AND RETURN WITH SELECTION-TABLE seltab.
When I read the contents from the spool, I get the records only pertaining to first record in seltab. Any insights on why this is happening.
Note: seltab is an internal table without a header line.
Thanks in Advance,
Rajesh

seltab was populated using the following statement.
LOOP AT i_order.
  MOVE: 'AUFNR'  TO seltab_wa-selname,
        'S'      TO seltab_wa-kind,      " SELECT-OPTION
        'I'      TO seltab_wa-sign,
        'EQ'     TO seltab_wa-option,
        i_order-aufnr  TO seltab_wa-low,
        ' '     TO seltab_wa-high.
  APPEND seltab_wa TO seltab.
  ENDLOOP.
Below is the code of the program. Please note that there are 2 submit statements, the first one is working fine, but not the second submit statement.
FUNCTION Z_TEST_REPAIR.
""Local interface:
*"  IMPORTING
*"     VALUE(P_AUART) LIKE  DIAUFK-AUART
*"  TABLES
*"      T_OUTPUT STRUCTURE  ZLINE
DATA: i_list LIKE abaplist OCCURS 0 WITH HEADER LINE.
  DATA: BEGIN OF i_list_conv OCCURS 1,
          line(256),
        END OF i_list_conv.
DATA : BEGIN OF I_SPOOL OCCURS 0,
          RQIDENT LIKE TSP01-RQIDENT,
       END OF I_SPOOL.
DATA : I_ACTUAL      LIKE SOLI OCCURS 0 WITH HEADER LINE.
  DATA: BEGIN OF i_order OCCURS 0,
          aufnr LIKE aufk-aufnr,
        END OF i_order.
  DATA: seltab     TYPE TABLE OF rsparams,
        seltab_wa  LIKE LINE OF seltab.
  RANGES: r_aufnr FOR aufk-aufnr.
  DATA: v_lines TYPE i.
  DATA : K_PARAMS      LIKE PRI_PARAMS,
         V_JOBCOUNT LIKE TBTCM-JOBCOUNT,
         V_SPOOL_NO LIKE  TSP01-RQIDENT,    "SPOOL NO.
         V_LIST LIKE PRI_PARAMS-PLIST.
  MOVE: 'AUART'  TO seltab_wa-selname,
        'S'      TO seltab_wa-kind,      " SELECT-OPTION
        'I'      TO seltab_wa-sign,
        'EQ'     TO seltab_wa-option,
        p_auart  TO seltab_wa-low,
        ' '      TO seltab_wa-high.
  APPEND seltab_wa TO seltab.
MOVE: 'AUART'  TO seltab_wa-selname,
       'S'      TO seltab_wa-kind,      " SELECT-OPTION
       'I'      TO seltab_wa-sign,
       'EQ'     TO seltab_wa-option,
       'Z001'  TO seltab_wa-low,
       ' '      TO seltab_wa-high.
APPEND seltab_wa TO seltab.
    CALL FUNCTION 'GET_JOB_RUNTIME_INFO'
         IMPORTING
              JOBCOUNT        = V_JOBCOUNT
         EXCEPTIONS
              NO_RUNTIME_INFO = 1
              OTHERS          = 2.
    IF SY-SUBRC <> 0.
    ENDIF.
    CONCATENATE 'ACT' V_JOBCOUNT INTO V_LIST.
  CALL FUNCTION 'GET_PRINT_PARAMETERS'
     EXPORTING
          LIST_NAME      = V_LIST
          NO_DIALOG      = 'X'
     IMPORTING
          OUT_PARAMETERS = K_PARAMS.
   SUBMIT riaufk20 TO SAP-SPOOL
                  SPOOL PARAMETERS K_PARAMS
                  WITHOUT SPOOL DYNPRO AND RETURN WITH SELECTION-TABLE seltab.
This select neither goes by primary nor any index as we are passing
rq2name which is not a part of primary or any index
  SELECT RQIDENT FROM TSP01 INTO TABLE I_SPOOL WHERE RQ2NAME = V_LIST.
  IF SY-SUBRC = 0.
    SORT I_SPOOL BY RQIDENT DESCENDING.
    READ TABLE I_SPOOL INDEX 1.
    V_SPOOL_NO = I_SPOOL-RQIDENT.
  ENDIF.
  CALL FUNCTION 'RSPO_RETURN_SPOOLJOB'
       EXPORTING
            RQIDENT              = V_SPOOL_NO
            DESIRED_TYPE         = 'RAW'
       TABLES
            BUFFER               = I_ACTUAL
       EXCEPTIONS
            NO_SUCH_JOB          = 1
            JOB_CONTAINS_NO_DATA = 2
            SELECTION_EMPTY      = 3
            NO_PERMISSION        = 4
            CAN_NOT_ACCESS       = 5
            READ_ERROR           = 6
            TYPE_NO_MATCH        = 7
            OTHERS               = 8.
  IF SY-SUBRC <> 0.
  ENDIF.
*====================================================================
  DATA: v_text1(20).
  LOOP AT I_ACTUAL.
    IF sy-tabix GT 3.
      SPLIT I_ACTUAL-line AT '|' INTO v_text1 I_ACTUAL-line.
      SPLIT I_ACTUAL-line AT '|' INTO v_text1 I_ACTUAL-line.
      SPLIT I_ACTUAL-line AT '|' INTO i_order-aufnr I_ACTUAL-line.
      APPEND i_order.
      CLEAR  i_order.
    ENDIF.
  ENDLOOP.
IF NOT I_ORDER[] IS INITIAL.
  DESCRIBE TABLE i_order LINES v_lines.
  DELETE i_order INDEX v_lines.
ENDIF.
  REFRESH seltab.
  CLEAR   seltab_wa.
  REFRESH i_list.
  REFRESH i_list_conv.
  SORT i_order.
  LOOP AT i_order.
  MOVE: 'AUFNR'  TO seltab_wa-selname,
        'S'      TO seltab_wa-kind,      " SELECT-OPTION
        'I'      TO seltab_wa-sign,
        'EQ'     TO seltab_wa-option,
        i_order-aufnr  TO seltab_wa-low,
        ' '     TO seltab_wa-high.
  APPEND seltab_wa TO seltab.
  ENDLOOP.
*========================================================================
  Refresh: I_SPOOL, I_ACTUAL.
  clear:   V_JOBCOUNT, V_LIST, V_SPOOL_NO, K_PARAMS.
   CALL FUNCTION 'GET_JOB_RUNTIME_INFO'
         IMPORTING
              JOBCOUNT        = V_JOBCOUNT
         EXCEPTIONS
              NO_RUNTIME_INFO = 1
              OTHERS          = 2.
    IF SY-SUBRC <> 0.
    ENDIF.
    CONCATENATE 'ACT' V_JOBCOUNT INTO V_LIST.
  CALL FUNCTION 'GET_PRINT_PARAMETERS'
     EXPORTING
          LIST_NAME      = V_LIST
          NO_DIALOG      = 'X'
     IMPORTING
          OUT_PARAMETERS = K_PARAMS.
*DATA: RANGE_LANGU    TYPE RANGE OF aufk-aufnr,
     RANGE_LANGU_WA LIKE lINE OF RANGE_LANGU.
LOOP AT i_order.
MOVE:
       'I'      TO RANGE_LANGU_WA-sign,
       'EQ'     TO RANGE_LANGU_WA-option,
       i_order-aufnr  TO RANGE_LANGU_WA-low,
       ' '     TO RANGE_LANGU_WA-high.
APPEND RANGE_LANGU_WA TO RANGE_LANGU.
endloop.
   SUBMIT riafvc20  TO SAP-SPOOL
                  SPOOL PARAMETERS K_PARAMS
                  WITHOUT SPOOL DYNPRO AND RETURN WITH SELECTION-TABLE seltab.
                 via selection-screen.
This select neither goes by primary nor any index as we are passing
rq2name which is not a part of primary or any index
  SELECT RQIDENT FROM TSP01 INTO TABLE I_SPOOL WHERE RQ2NAME = V_LIST.
  IF SY-SUBRC = 0.
    SORT I_SPOOL BY RQIDENT DESCENDING.
    READ TABLE I_SPOOL INDEX 1.
    V_SPOOL_NO = I_SPOOL-RQIDENT.
  ENDIF.
  CALL FUNCTION 'RSPO_RETURN_SPOOLJOB'
       EXPORTING
            RQIDENT              = V_SPOOL_NO
            DESIRED_TYPE         = 'RAW'
       TABLES
            BUFFER               = I_ACTUAL
       EXCEPTIONS
            NO_SUCH_JOB          = 1
            JOB_CONTAINS_NO_DATA = 2
            SELECTION_EMPTY      = 3
            NO_PERMISSION        = 4
            CAN_NOT_ACCESS       = 5
            READ_ERROR           = 6
            TYPE_NO_MATCH        = 7
            OTHERS               = 8.
  IF SY-SUBRC <> 0.
  ENDIF.
  t_output[] = I_ACTUAL[].
ENDFUNCTION.

Similar Messages

  • Problem with SUBMIT report [ WITH SELECTION-TABLE ] or [ IN range ]

    Hello Everybody,
    I am trying to call transaction F.80 for mass reversal of FI documents by using SUBMIT sentence and its parameters like this:
      LOOP AT i_zfi013 INTO wa_zfi013.
        PERFORM llena_params USING 'BR_BELNR' 'S' 'I' 'EQ' wa_zfi013-num_doc ''.
    range_line-sign   = 'I'.
    range_line-option = 'EQ'.
    range_line-low    = wa_zfi013-num_doc.
    APPEND range_line TO range_tab.
    endloop.
    Line: -
          SUBMIT sapf080
            WITH br_bukrs-low = p_bukrs
            WITH SELECTION-TABLE it_params  [ same  problem with -  WITH BR_BELNR IN range_tab]
            WITH br_gjahr-low = p_an1
            WITH stogrd = '05'
            WITH testlauf = ''
            AND RETURN.
    My problem is that  when the report is executed the BR_BELNR only delete one document of the all the inputs in the selection criteria from the loop. if I add the statement [ VIA SELECTION-SCREEN] in the SUBMIT if open the multiple selection criteria in the screen I can check that all the documents are set in it from the ABAP code in the loop from it I just need to push F8 to copy them and run the program processing all the documents normally .
    Can some one help me with this? is there a way to execute the transaction BY the SUBMIT with the multiple selection criteria for the Document Number working well?
    Thank for you time and help.

    This is my code:
      TYPES: BEGIN OF T_ZFI013,
              BUKRS     TYPE BUKRS,
              GJAHR     TYPE GJAHR,
              MONAT     TYPE MONAT,
              ANLN1     TYPE ANLN1,
              ANLN2     TYPE ANLN2,
              NUM_DOC     TYPE BELNR_D,
              DATE     TYPE DATUM,
              TIME  TYPE UZEIT,
              USER     TYPE SYUNAME,
             END OF T_ZFI013.
       DATA: I_ZFI013  TYPE STANDARD TABLE OF T_ZFI013,
             WA_ZFI013 TYPE T_ZFI013,
      DATA: br_belnr       TYPE BELNR_D,
            rspar_tab  TYPE TABLE OF rsparams,
            rspar_line LIKE LINE OF rspar_tab,
            range_tab  LIKE RANGE OF br_belnr,
            range_line LIKE LINE OF range_tab."range_tab.
      LOOP AT i_zfi013 INTO wa_zfi013.
        range_line-sign   = 'I'.
        range_line-option = 'EQ'.
        range_line-low    = wa_zfi013-num_doc.
        APPEND range_line TO range_tab.
      ENDLOOP.
      SUBMIT sapf080
        WITH br_bukrs-low = p_bukrs
        WITH br_belnr IN range_tab
        WITH br_gjahr-low = p_an1
        WITH stogrd = '05'
        WITH testlauf = ''.
    This is the RANGE_TAB table before submit:
    1     I     EQ     1001xxxxxx
    2     I     EQ     1002xxxxxx
    3     I     EQ     1003xxxxxx
    4     I     EQ     1004xxxxxx
    5     I     EQ     1005xxxxxx
    6     I     EQ     1006xxxxxx
    7     I     EQ     1007xxxxxx
    8     I     EQ     1008xxxxxx
    I think this wont work for some reason so I will start to do this by a BDC.
    Many thanks for your help.

  • USING WITH SELECTION-TABLE rspar

    Hi,
    I want to Submit a report via selection screen filling the selection screen values.
    Do let me know how to fill the selection-table and pass it.
    Thanks & Regards,
    SP

    Hi,
    SAP keyword docu explains it clearly.......
    ... WITH SELECTION-TABLE rspar
    Effect
    If you specify this addition, parameters and selection criteria on the selection screen are supplied from an internal table rspar. You must specify an internal table with the row type RSPARAMS for rspar. The structured data type RSPARAMS is defined in the ABAP Dictionary and has the following components, all of which are data type CHAR:
    SELNAME (length 8),
    KIND (length 1),
    SIGN (length 1),
    OPTION (length 2),
    LOW (length 45),
    HIGH (length 45).
    To supply parameters and selection criteria for the selection screen with specific values, the lines in the internal table rspar must contain the following values:
    SELNAME must contain the name of a parameter or selection criterion for the selection screen in block capitals
    KIND must contain the type of selection screen component (P for parameters, S for selection criteria)
    SIGN, OPTION, LOW, and HIGH must contain the values specified for the selection table columns that have the same names as the selection criteria; in the case of parameters, the value must be specified in LOW and all other components are ignored.
    If the name of a selection criterion is repeated in rspar, this defines a selection table containing several lines and passes it on to the selection criterion. If parameter names occur several times, the last value is passed on to the parameter.
    The contents of the parameters or selection tables for the current program can be entered in the table by the function module RS_REFRESH_FROM_SELECTOPTIONS.
    Cheers,
    jose.

  • Problems using WITH SELECTION-TABLE

    I am trying to call rfrecpsfa140 using:
      SUBMIT rfrecpsfa140
      "VIA SELECTION-SCREEN
      WITH SELECTION-TABLE gt_rsparams. "parameter table
    I am setting up the table gt_rsparams like this
      "Company Code
      wa_rsparams-selname = 'S_BUKRS'.
      wa_rsparams-kind    = 'S'.
      wa_rsparams-low     = '1000'.
      wa_rsparams-sign    = 'I'.
      wa_rsparams-option  = 'EQ'.
      APPEND wa_rsparams TO gt_rsparams.
      "Land Record
      wa_rsparams-selname = 'S_SGRNR'.
      wa_rsparams-kind    = 'S'.
      wa_rsparams-low     = '287'.
      wa_rsparams-sign    = 'I'.
      wa_rsparams-option  = 'EQ'.
      APPEND wa_rsparams TO gt_rsparams.
    "Land Record
      wa_rsparams-selname = 'S_SGRNR'.
      wa_rsparams-kind    = 'S'.
      wa_rsparams-low     = '392'.
      wa_rsparams-sign    = 'I'.
      wa_rsparams-option  = 'EQ'.
      APPEND wa_rsparams TO gt_rsparams.
    Table is defined like this
           gt_rsparams            TYPE STANDARD TABLE OF rsparams,            "parameter table
           wa_rsparams            like line of gt_rsparams.                   "Work area for gt_rsparams
    The problem I am having is that I am only seeing the results for the first land record, if I uncomment the VIA SELECTION SCREEN and run it, the Multiple Selections is Active, when I go into the multiple selections I can see both land records, however, if I close out of that window I get a message "The entered selections were not copied". If I select Copy from that screen, then run it I get info for both land records.
    Seems like I am setting up the gt_rsparams table wrong, or maybe calling the program incorrectly.
    Any ideas??

    try this way..
    data: r_bukrs type range of bukrs,
            wa_bukrs like line of r_bukrs,
            r_sgrnr type range of sgrnr,
            w_sgrnr like line of r_sgrnr.
    *wa_bukrs-selname = 'S_BUKRS'.
    wa_bukrs-low = '1000'.
    wa_bukrs-sign = 'I'.
    wa_bukrs-option = 'EQ'.
    APPEND wa_bukrs TO r_bukrs.
    *w_sgrnr-selname = 'S_SGRNR'.
    w_sgrnr-low = '287'.
    w_sgrnr-sign = 'I'.
    w_sgrnr-option = 'EQ'.
    APPEND w_sgrnr TO r_sgrnr.
    *w_sgrnr-selname = 'S_SGRNR'.
    w_sgrnr-low = '392'.
    w_sgrnr-sign = 'I'.
    w_sgrnr-option = 'EQ'.
    APPEND w_sgrnr TO r_sgrnr.
    SUBMIT rfrecpsfa140
      with s_bukrs in r_bukrs
      with s_rgrnr in r_sgrnr
      and return.

  • Ago Function with Select Table--HELP!

    When my physical layer was setup using all 'Physical Table' types, my time series functions were working.
    I had to modify my fact table to be of a 'Select' type (using SQL). When I remap my data, my time series functions fail with the following message:
    "[nQSError: 22038] Function AGO requires at least one measure attribute in its first argument."
    We have to be able to use select tables with time serious functions--what am I missing!?
    Thanks!!

    does your new 'select table' contain the same number of columns with same datatypes?
    did you restart the services (if developing in online mode- which is not recommended)
    Lastly, if all fails,can you create those views on the database rather than in the physical layer?

  • Submit with internal table

    Hi.
      I have a function module with a internal table. This internal table has 30 fields and i have to it to a program vis SUBMIT, furthemore this program will be executed inside a job. Im trying to pass tha internal table with export and import but it doesn´t go.
      Anybody can help me???
      Thanks.

    Hi Jorge
       Will try to answer basing on what i can understand
    from you query.
       I guess you have an internal table in your FM with
    some data. You are submitting a program within the FM
    and you need the data in the internal table to be used
    in the program.
       If my understanding is right, you can do it via
    EXPORT/IMPORT statements.
       EXPORT <int_tab> TO MEMORY ID 'MID'. --> In FM.
       IMPORT <int_tab> FROM MEMORY ID 'MID". --> In Program
       Note that the internal table declaration should be
    the same in FM and Program like name of the internal
    table, all field names, data type everything should be
    the same.
       Check if you are handling the same way.
    Kind Regards
    Eswar

  • Submit with select-option

    Hi all.
    I have a strange problem in which I'm asctivating an abap program with parameters.
    The parameters are being passed fine but the select-option is being passed wrong.
    so_vbeln-sign = 'I'.
    so_vbeln-option = 'EQ'.
    so_vbeln-low = 'IEQL'.
    Although before the submit command its source range includes the following:
    gr_vbeln-sign = 'I'.
    gr_vbeln-option = 'EQ'.
    gr_vbeln-low = '4500000988'.
    Why's that? What am I missing??
    Thanks in advance,
    Rebeka

    Hi,
    Try this for select-options:
    SUBMIT PROGRAM_B
    WITH S_MATNR *IN* S_MATNR ->pass all the values from a select option.
    WITH P_WERKS EQ P_WERKS ->pass a single value from a parameter.
    AND RETURN
    Hope it helps.
    Regards,
    Gilberto Li
    Edited by: Gilberto Li on Feb 2, 2009 10:24 PM
    Edited by: Gilberto Li on Feb 2, 2009 10:33 PM
    Edited by: Gilberto Li on Feb 2, 2009 10:33 PM

  • Submit report using selection-table to report 'RKAEP000'(Tcode ksb1)

    Hi,
    I am calling report "RKAEP000'(This is the report for tcode KSB1) using submit statement in my program to import the ksb1 output in my program. For time being I am calling this report using selection-set 'variant'.
    The selection screen of ksb1 is designed with modulepool program (screen 100).
    The selection screen of my program is similar to ksb1 initial screen, except layout option and controlling area is on the screen itself instead of calling it through menu.
    Please tell me how to post the selction criteria of my report to the calling program 'RKAEP000'.
    Thanks,
    suresh

    You can use WITH addition of SUBMIT statement.
    SUBMIT report1 USING SELECTION-SCREEN '1100'
                   WITH SELECTION-TABLE rspar_tab
                   WITH selcrit2 BETWEEN 'H' AND 'K'
                   WITH selcrit2 IN range_tab
                   AND RETURN.
    Regards,
    Premal

  • SUBMIT report using selection-table issue

    Hi Experts,
    Actually I am calling report2 from report1.
    In report1 i have  select-options field WERKS.
    In report2 I have parameters field WERKS.
    Please let m know how to call report2 using SUBMIT button selection-table concept.
    How to insert records in selection-table and how to use this values to submit for parameter field.
    Please help me.

    Hello,
    For selct options create a range same as tha of plant type,fill the data and submit as follow.
    submit XYZ report
    with s_werks in r_werks
             p_bukrs eq lv_bukrs,
    and return.
    Hope it helps.
    Pleas e let me know in case of any problem.
    Regards,
    Nabheet Madan

  • Module Pool with select options

    Hi,
    I have created select-option and radio button in Module pool. My req is that I when the user enters any value and click on the radio button the respective programs should be executed.
    Thanks
    Hari

    Hi Hariharan,
    I would recommend you to use primarily use push button and then after SUBMIT statement, and also the example for the same is provided below:
    *Code used to execute a report
    SUBMIT Zreport.
    *Code used to populate 'select-options' & execute report
    DATA: seltab type table of rsparams,
          seltab_wa like line of seltab.
      seltab_wa-selname = 'PNPPERNR'.
      seltab_wa-sign    = 'I'.
      seltab_wa-option  = 'EQ'.
    * load each personnel number accessed from the structure into
    * parameters to be used in the report
      loop at pnppernr.
        seltab_wa-low = pnppernr-low.
        append seltab_wa to seltab.
      endloop.
      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'.
    Please validate the same at your end as well, please come back, if inputs are required.
    BR/Thanks
    Pranav Agrawal

  • Call program using submit with variant that changing value

    Hi All,
    I need to call a report with variant and abstract the data back to my current program.
    so far,
    i use following method
    SUBMIT RFITEMAR USING SELECTION-SET 'XXX'
           EXPORTING LIST TO MEMORY
           AND RETURN.
    DATA list_tab TYPE TABLE OF abaplist.
    CALL FUNCTION 'LIST_FROM_MEMORY'
      TABLES
        listobject = list_tab
      EXCEPTIONS
        not_found  = 1
        OTHERS     = 2.
      DATA: L_ABAPLIST LIKE ABAPLIST OCCURS 0.
      DATA: BEGIN OF L_ASCITAB OCCURS 0, 
                LINE(2048),
              END OF L_ASCITAB.
      CALL FUNCTION 'LIST_TO_ASCI'
           EXPORTING
                LIST_INDEX         = -1
           TABLES
                LISTASCI           = L_ASCITAB
                LISTOBJECT         = list_tab
           EXCEPTIONS
                EMPTY_LIST         = 1
                LIST_INDEX_INVALID = 2
                OTHERS             = 3.
    However, the problem is that i need to get some value from variant 'XXX' and keep changing it.
    I have try function module "RS_VARIANT_VALUES_TECH_DATA" to get the variant details.
    But, it just doesn't get me back all the details of the variants.
    Are there any way i could read the variants in detail? i even try to read LRAW data from table vari. but there are no function module to convert the LRAW to either char or STRING.
    Thanks.
    Edited by: simplekx on Jun 20, 2011 4:43 PM

    You can use the FM "RS_CHANGE_CREATED_VARIANT" to change the variant values for already created variant and the FM "RS_VARIANT_CONTENTS" to get the variant values. Instead of changing the variant values and then passing to the Submit, you can directly pass the values to the Submit through..WITH SELECTION-TABLE seltab or ... WITH p IN sel variant of the Submit.

  • Selection table

    hi all,
    can anyone tell me how to use selection table with option of NE?
    I wrote a code like
    L_t_RANGE-SIGN = 'I'.
    L_t_RANGE-option = 'NE'.
    L_t_RANGE-low = 'Y'.
    But the error message says SIGN 'I' with option 'NE' is not allowed. Neigher does 'E'.
    Thanks.
    Linda

    I actually don't have a problem with either.  This program works really well.  Run it and check the selection screen, check material,  you can see the fields there in multiple selection.
    report zrich_0002 .
    data: iSEL TYPE TABLE OF RSPARAMS.
    data: xsel type rsparams.
    xsel-SELNAME = 'MATNR'.
    xsel-KIND    = 'S'.
    xsel-SIGN    = 'I'.
    xsel-OPTION  = 'EQ'.
    xsel-LOW     = '000000000040000692'.
    append xsel to isel.
    xsel-SELNAME = 'MATNR'.
    xsel-KIND    = 'S'.
    xsel-SIGN    = 'I'.
    xsel-OPTION  = 'NE'.
    xsel-LOW     = '000000000040000693'.
    append xsel to isel.
    xsel-SELNAME = 'MATNR'.
    xsel-KIND    = 'S'.
    xsel-SIGN    = 'E'.
    xsel-OPTION  = 'EQ'.
    xsel-LOW     = '000000000040000694'.
    append xsel to isel.
    submit RM07DOCS
            via selection-screen
                    with selection-table isel
                              and return.
    This program runs transaction MB51
    Regards,
    Rich Heilman

  • How to bind internal table values with RootUIElement(Table) from select Que

    Hello Friends,
           In my view Layout,there r two Input fields ,Submit button and Table... My concept is when user posting values in two input fields and clicking submit button means the result(more than one values) should be displayed in Table...
         I written coding also but i dont know to bind internal table values with Table... My code as follows,
    method onactionsearch .
       data:
         Node_Node_Flight                    type ref to If_Wd_Context_Node,
         Elem_Node_Flight                    type ref to If_Wd_Context_Element,
         Stru_Node_Flight                    type If_View1=>Element_Node_Flight ,
         itab TYPE STANDARD TABLE OF sflight.
    navigate from <CONTEXT> to <NODE_FLIGHT> via lead selection
       Node_Node_Flight = wd_Context->get_Child_Node( Name = IF_VIEW1=>wdctx_Node_Flight ).
    @TODO handle not set lead selection
       if ( Node_Node_Flight is initial ).
       endif.
    get element via lead selection
       Elem_Node_Flight = Node_Node_Flight->get_Element(  ).
    @TODO handle not set lead selection
       if ( Elem_Node_Flight is initial ).
       endif.
    alternative access  via index
    Elem_Node_Flight = Node_Node_Flight->get_Element( Index = 1 ).
    @TODO handle non existant child
    if ( Elem_Node_Flight is initial ).
    endif.
    get all declared attributes
       Elem_Node_Flight->get_Static_Attributes(
         importing
           Static_Attributes = Stru_Node_Flight ).
    select * from sflight into CORRESPONDING FIELDS OF TABLE itab
      WHERE carrid = Stru_Node_Flight-carrid and connid = Stru_Node_Flight-connid.
    Node_Node_Flight->bind_table( new_items = itab ).
    endmethod.
    Plz reply me asap...!

    Hi,
    What I understood from your coding is...
    * navigate from <CONTEXT> to <NODE_FLIGHT> via lead selection
    Node_Node_Flight = wd_Context->get_Child_Node( Name = IF_VIEW1=>wdctx_Node_Flight ).
    You are reading values from the above node and binding the values to the same node.Am i right?
    Did you take seperate context node for your input fields or binded the above context to the fields.If not then read the context attribute values which are binded to the carrid and connid then pass these values to select query.
    One more thing is select cardinality 1..n for node NODE_FLIGHT since you are displaying more than one record.
    Go through the some basic tutorials.Search in sdn you will it get.Already there is a tutorial in sdn which explains exactly what do you require.
    Go throgh this link
    Web Dynpro for ABAP: Tutorials for Beginners
    Web Dynpro for ABAP: Tutorials for Beginners [original link is broken]
    Edited by: suman kumar chinnam on Mar 26, 2009 10:50 AM

  • How can I fill a table of objects from cursor with select * bulk collect???

    Hi All, I have a TYPE as OBJECT
    create or replace type dept2_o as object (
    deptno NUMBER(2),
    dname VARCHAR2(14),
    loc VARCHAR2(13));
    I can fill a table of objects from cursor with out select * bulk collect...., row by row
    declare
    TYPE dept2_t IS TABLE of dept2_o;
    dept_o_tab dept2_t:=dept2_t();
    i integer;
    begin
    i:=0;
    dept_o_tab.extend(20);
    for rec in (select * from dept) loop
    i:=i+1;
    dept_o_tab(i):=dept2_o(
    deptno => rec.deptno,
    dname => rec.dname,
    loc =>rec.loc
    end loop;
    for k IN 1..i loop
    dbms_output.put_line(dept_o_tab(k).deptno||' '||dept_o_tab(k).dname||' '||dept_o_tab(k).loc);
    end loop;
    end;
    RESULT
    10 ACCOUNTING NEW YORK
    20 RESEARCH DALLAS
    30 SALES CHICAGO
    40 OPERATIONS BOSTON
    But I can't fill a table of objects from cursor with select * bulk collect construction ...
    declare
    TYPE dept2_t IS TABLE of dept2_o;
    dept_o_tab dept2_t:=dept2_t();
    begin
    dept_o_tab.extend(20);
    select * bulk collect into dept_o_tab from dept;
    end;
    RESULT
    ORA-06550: line 6, column 39;
    PL/SQL: ORA-00947: not enough values ....
    How can I fill a table of objects from cursor with select * bulk collect???

    create or replace type dept_ot as object (
    deptno NUMBER(2),
    dname VARCHAR2(14),
    loc VARCHAR2(13));
    create table dept
    (deptno number
    ,dname varchar2(14)
    ,loc varchar2(13)
    insert into dept values (10, 'x', 'xx');
    insert into dept values (20, 'y', 'yy');
    insert into dept values (30, 'z', 'zz');
    select dept_ot (deptno, dname, loc)
      from dept
    create type dept_nt is table of dept_ot
    declare
       l_depts dept_nt;
    begin
       select dept_ot (deptno, dname, loc)
         bulk collect
         into l_depts
         from dept
       for i in l_depts.first .. l_depts.last
       loop
          dbms_output.put_line (l_depts(i).deptno);
          dbms_output.put_line (l_depts(i).dname);
          dbms_output.put_line (l_depts(i).loc);    
       end loop;
    end;
    /

  • Adf Table with selection as set to NONE

    Hi,
    I having a scenario as explained below:
    I am populating records in to the adf Table
    After that I am using checkbox for selecting multiple records in the table and delete them.
    So I set selection property to None for the table. Because I want user to edit only that record which is checked.
    My multiple delete is working fine.
    Now if i selected one checkbox and and click on edit(which I have placed in the panal collection toolbar) it should show me the record in the which I have selected by check box. But it is showing me the first row.
    Can anybody help me to set the current row of the adf table manually which is having selection property as none. so that I can populate in popup.
    If some other way is available please explain.
    I am using jdeveloper 11.1.2.1
    Thanks,
    Sandeep.

    I don't see why you can't set selection property to "single"? (and don't forget to restore table SelectionListener property - if deleted)
    This will set current row when you click on it.
    If you programmatically iterate through RowSet to find rows with selected checkbox, this will work regardless of value in "selection" property.
    Dario
    Edited by: kdario on Nov 7, 2012 5:20 AM
    Edited by: kdario on Nov 7, 2012 5:22 AM

Maybe you are looking for