Selection OPTION: Date input problem in Module POOL through Subscreen

Dear ALL,
Being new to ABAP, I am struck in a Problem.
Requirement:
I want an option on the Screen( My Screen 9000) for Date Range. Through this Date-Range I want to filter and pull some data from
Database.
As Date Range Selection option is possible only through Sub-Screen integration. Hence I integrated a Sub-Screen 400 (as below) and named the Sub-Screen area as SEL on my screen.
Problem: As soon as I enter the dates on the screen, then those dates are not taken up by the code.
During debugging I saw the the S_datum-low and S_datum-high are empty (in fact 00000000)
The code follows:
PROCESS BEFORE OUTPUT.
MODULE STATUS_9000.
  Call SUBSCREEN SEL  INCLUDING sy-repid '400'.
PROCESS AFTER INPUT.
  MODULE USER_COMMAND_9000.
DATA:  gv_datum     Type   dats,
SELECTION-SCREEN BEGIN OF SCREEN 400 AS SUBSCREEN.
    SELECT-OPTIONS: s_datum FOR gv_datum.
SELECTION-SCREEN END OF SCREEN 400 .
Plz help where I am missing something.
Regards
Chandan

Call the subscreen during the AT SELECTION-SCREEN event.
SELECTION-SCREEN BEGIN OF SCREEN 400 AS SUBSCREEN.
SELECT-OPTIONS: s_datum FOR gv_datum.
SELECTION-SCREEN END OF SCREEN 400 .
AT SELECTION-SCREEN.
   CALL SCREEN 100.
*&      Module  STATUS_0100  OUTPUT
*       text
MODULE status_0100 OUTPUT.
   SET PF-STATUS '0100'.
*  SET TITLEBAR 'xxx'.
ENDMODULE.                 " STATUS_0100  OUTPUT
*&      Module  USER_COMMAND_0100  INPUT
*       text
MODULE user_command_0100 INPUT.
   CASE sy-ucomm.
     WHEN 'BACK' OR 'EXIT' OR 'CANCEL'.
       LEAVE TO SCREEN 0.
   ENDCASE.
ENDMODULE.                 " USER_COMMAND_0100  INPUT

Similar Messages

  • Problem in Module Pool Program

    Hi All,
    I got one problem in Module pool program.Im using table control.when selected multiple coloms by table control option left top.
    when I want to de-select one by one,unable to de-select. Please suggest me.
    thank you,
    Anu.

    Thank You All.
    Solved my self.
    The coding as below.
    PROCESS BEFORE OUTPUT.
      CALL SUBSCREEN SUB INCLUDING SY-REPID '110'.
      LOOP AT GT_ITAB INTO WA WITH CONTROL VCONTROL.
        MODULE SET.
        MODULE STATUS_0100.
      ENDLOOP.
    PROCESS AFTER INPUT.
       CALL SUBSCREEN SUB.
      LOOP AT GT_ITAB .
        CHAIN.
          FIELD WA-EBELN.
          FIELD WA-EMATN.
          FIELD WA-EBELP.
          FIELD WA-MATNR.
          FIELD WA-MARK.
          MODULE MODIFY ON CHAIN-REQUEST.
        ENDCHAIN.
      ENDLOOP.
        MODULE USER_COMMAND_0100.
    MODULE USER_COMMAND_0100 INPUT.
    CASE SY-UCOMM.
        WHEN 'SAVE'.
          PERFORM SAVE_VARIANT.
          PERFORM VARIANT_EXISTS.
        WHEN 'SEL'.
          LOOP AT GT_ITAB INTO WA.
            WA-MARK = 'X'.
            MODIFY GT_ITAB FROM WA .
          ENDLOOP.
    endmodule.
    MODULE STATUS_0100 OUTPUT.
      SET PF-STATUS 'ZTESTING'.
      SET TITLEBAR 'ZTEST'.
      SET PF-STATUS  'ZTESTING' EXCLUDING IT_EXTAB.
      MOVE:WA-EBELN TO EKKO-EBELN,
           WA-EBELP TO EKPO-EBELP,
           WA-MATNR TO WA-MATNR.
      MOVE:WA-EMATN TO WA-EMATN.
    MODIFY GT_ITAB FROM WA INDEX VCONTROL-CURRENT_LINE.
      VCONTROL-LINES = SY-DBCNT.
    ENDMODULE.                 " STATUS_0100  OUTPUT
    MODULE SET OUTPUT.
      SET CURSOR FIELD CURSORFIELD OFFSET POS.
    ENDMODULE.                 " SET  OUTPUT
    Thank You,
    Anu.

  • SELECT OPTIONS DATE.

    Hello , I need your help ,  to access to  every date in an interval of the select option , in order to execute a function module that use date in one of its parameters .
    select-options : dat for sy-datum .
       CALL FUNCTION 'ZPRUEBA''
         EXPORTING
           offic                =
           chdsk                =
           inicio_periodo       =
         FIM_PERIODO          =  dat  "but i need here every date of the interval
         NO_UPDATE            =
       IMPORTING
         NR_COBRANCAS         =
       ENDSELECT.
    How can I do that ? , tnhx.

    hi
    put the function module in the loop.
    data : date like sy-datum.
    select-options : s_date for date.
    while ( s_date-low LE s_date-high ).
    CALL FUNCTION 'ZPRUEBA''
    EXPORTING
    offic =
    chdsk =
    inicio_periodo =
    FIM_PERIODO = s_date-low
    NO_UPDATE =
    IMPORTING
    NR_COBRANCAS =
    add 1 to s_date-low.
    endwhile.
    reward if helpful
    prasanth

  • How to do ICON_EXPAND and ICON_COLLAPSE input fields in module pool screen?

    hi frnds.
    My problem is in module pool screen how to do ICON_EXPAND and ICON_COLLAPSE input fields in module pool screen?And how to do GUI STATUS and GUI TITLE? IN SE80.
      ITS URGENT.POINTS WILL BE REWADED.THANKS  IN ADVANCE.

    Hi,
    Go through this thread.
    [expand and collapse|expand and collapse]
    Cheers,
    Simha.

  • Select options values pass to function module

    Hi all,
            I want to pass the values entered in the select options to the function module. How should my function module interface be declared for passing the select options
    I tried declaring like
    t_range type data in the tables tab.  But this throws error. 
    Please let me know how to pass select option values back to function modules.
    Thanks,

    Hi,
    Check this code.
    data: node_flights type ref to if_wd_context_node.
    data: rt_carrid type ref to data.
    data: rt_connid type ref to data.
    data: isflight type table of sflight.
    data: wsflight type sflight.
    field-symbols: <fs_carrid> type table,
    <fs_connid> type table.
    Retrieve the data from the select option
    rt_carrid = wd_this->m_handler->get_range_table_of_sel_field(
    i_id = 'S_CARR_ID' ).
    if rs_carrid is not initial.   Here you can check that if rs_carrid is no initial then assign value of field symbol
    Assign it to a field symbol
    assign rt_carrid->* to <fs_carrid>.
    endif.
    Retrieve the data from the select option
    rt_connid = wd_this->m_handler->get_range_table_of_sel_field(
    i_id = 'S_CONN_ID' ).
    if rt_connid is not initial. Here you can check that if  rt_connid is no initial then assign value of field symbol
    Assign it to a field symbol
    assign rt_connid->* to <fs_connid>.
    endif.
    if  <fs_connid> is not initial and <fs_carrid> is not initial.
    Retrieve that data from the database. Normally it is suggested to
    encapsulate the data retrieval in a separate class.
    For simplicity, the SELECT statement has been implemented here.
    clear isflight. refresh isflight.
    select * into corresponding fields of table isflight from sflight
    where carrid in <fs_carrid>
    and connid in <fs_connid>.
    endif.
    Bind the data to the context
    node_flights = wd_context->get_child_node( name = `FLIGHTS` ).
    node_flights->bind_elements( isflight ).
    Hopes this will helps you.
    Regard
    Manoj Kumar
    Edited by: Manoj Kumar on Mar 16, 2009 10:41 AM

  • HOW  TO PASS SELECT-OPTIONS PARAMETER TO A FUNCTION MODULE.

    Hi friends.
    HOW DO U PASS A SELECT-OPTIONS PARAMTER TO A FUNCTION MODULE AS ITS IMPORT PARAMETER(IN MY CASE rfc fM) .
    Really urgent!!!
    thanks to one and all

    Hi,
    If you are passing a single value, its better you take it from s_option-low or s_option-high (select options).
    Else if you are passing values to the FM in a loop for all select option values, then better you declare an internal table with type <b>WSELKUNNR</b>.
    get low & high fields from each row & pass them.
    It will make you clear when you check out your select options in debug mode by entering different combinations of inputs.

  • How to remove timestamp,when i select calendar date(input Controls)

    Hi everyone
    I am using webi 4.0
    My problem is when i select calendar date(input Controls) i am able to display time stamp along with date in input Controls(MM/dd/yyyy 12:00:00 AM)
    i want to change (MM/dd/yyyy 12:00:00 AM) to (yyyy-MM-dd ), when i select calendar date(input Controls)
    where is the calendar date(input Controls)' format setting??
    i dont want to show the time stamp in calendar date(input Controls) as my users dislike to see that timestamp .
    Thanks & regards

    Hello,
    Can you show us the declaration of the internal table rec?
    Vikranth

  • Select-options Problem in module pool

    Hi,
         I have created select-options in a seperate program and i have called the subscreen in module pool program.
    I dont have any problem with the display of select-options but whatever the value given is not getting in to the program. Hw to solve this problem
    Assured Points
    Thanks in Advance
    Jai

    hi,
    did you declare that in top include?
    if not declare it globally.
    In stead of subscreen, try to do with screen itself.
    Create screen like this.
    selection-screen begin of screen 300.
    selection-screen begin of block b1 with frame title text-000.
    select-options : so_ebeln for v_ebeln modif id g1,
                     so_vbeln for v_vbeln modif id g2.
    selection-screen end of block b1.
    selection-screen end of screen 300.
    Call this screen : in PAI of ur another screen.
    call selection-screen 300.
    Regards
    Sandeep REddy

  • Selection screen problem in module pool

    Hi friends,
    I am working on module pool programming, I need to put select screen on the screen of the module pool porgramming. I used Input/Output field to do that and activated. But I am getting message invalid field format (screen error) can any one tell me why I am not able to run the seletion screen when I am using input/output field, also please let me know how to solve this problem.
    Regards,
    Line

    Hello,
    Think that this is useful for u/
    SELECTION-SCREEN - Defining selection screens
    Variants:
    1a. SELECTION-SCREEN BEGIN OF SCREEN scr.
    1b. SELECTION-SCREEN END   OF SCREEN scr.
    2. SELECTION-SCREEN BEGIN OF SCREEN scr AS SUBSCREEN.
    Effect
    Defines a selection screen with the number scr. scr may be up to 4 digits.
    SELECTION-SCREEN BEGIN OF SCREEN scr.
    Additions:
    (zu SELECTION-SCREEN BEGIN OF SCREEN scr) 1. ... TITLE title
    2. ... AS WINDOW
    Notes
    In reports (type 1 programs), a selection screen with number 1000 is created automatically when you use the SELECT-OPTIONS, PARAMETERS and SELECTION-SCREEN statments. This selection screen appears when you SUBMIT the report.
    In any type of program (apart from subroutine pools - type S), you can define further selection screens using SELECT-OPTIONS, PARAMETERS and SELECTION-SCREEN. You enclose these statements between the SELECTION-SCREEN BEGIN OF SCREEN and SELECTION-SCREEN END OF SCREEN statements.
    You call these screens using the CALL SELECTION-SCREEN statement.
    Screen number 1000 is not allowed (reserved for standard selection screen).
    When you generate the program, all user-defined selection screens are also generated.
    Within a report (type 1 program), all SELECT-OPTIONS, PARAMETERS and SELECTION-SCREEN statements outside a SELECTION-SCREEN BEGIN/END OF SCREEN block form part of selection screen 100 (standard selection screen)
    Regards,
    LIJO JOHN.

  • Problem in Passing the select-options data in smartforms

    Dear ABAPers,
    I have developed new layout for Delivery Chellan using smartforms.
    using parameters i am getting document no, corresponding all details getting print.
    but the client wants to use multiple document no.
    in function module also i am passing only one import parameter (i.e. doc.no).
    my requirement is how to pass multiple data in smartfroms.
    Thanks & Regards,
    Ashok

    Dear ABAPers,
    Here i give my code Please check it out and tell me where i am going wrong.
    *& Report  ZMM_DC_FORM                                                 *
    REPORT  ZMM_DC_FORM                            .
           Data Declaration
    tables : mseg,
             mkpf,
             ekpo,
             ekko,
             objk,
             mbew,
             ser03,
             twlad,
             makt,
             adrc.
    data : begin of struct_mblnr,
           mblnr type mblnr,
           end of struct_mblnr.
    data : it_mblnr like table of struct_mblnr with header line.
    data : begin of i_struct,
           mblnr like mseg-mblnr,
           mjahr like mseg-mjahr,
           matnr like mseg-matnr,
           erfmg like mseg-erfmg,
           werks like mseg-werks,
           lgort like mseg-lgort,
           ebeln like mseg-ebeln,
           ebelp like mseg-ebelp,
           umwrk like mseg-umwrk,
           end of i_struct.
    data : begin of bednr_struct,
           matnr type ekpo-matnr,
           bednr type ekpo-bednr,
           end of bednr_struct.
    data : begin of price_struct,
           matnr type mseg-matnr,
           verpr type mbew-verpr,
           stprs type mbew-stprs,
           end of price_struct.
    data : begin of serial_struct,
           matnr like objk-matnr,
           sernr like objk-sernr,
           end of serial_struct.
    data : begin of fi_struct,
           matnr type mseg-matnr,
           maktx type makt-maktx,
           bednr type ekpo-bednr,
           erfmg type mseg-erfmg,
           verpr type mbew-verpr,
           val_p type mbew-verpr,
           end of fi_struct.
    data : it_tab like table of i_struct with header line.
    data : it_add1 type table of adrc with header line,
           it_add2 type table of adrc with header line.
    data : it_bednr like table of bednr_struct with header line.
    data : it_price like table of price_struct with header line.
    data : it_ser type table of ZMM_DC_SERIAL with header line.
    data : it_final like table of fi_struct with header line.
    data : s_date like mkpf-budat.
    data : s_ebeln like ekpo-ebeln.
    DATA : FM_NAME TYPE RS38L_FNAM.
            Selection Screen Variables
    selection-screen : begin of block b1 with frame title text-001.
    select-options : s_mblnr for mseg-mblnr.
    parameters : s_mjahr type mseg-mjahr.
    selection-screen : end of block b1.
              Start of Selection
    start-of-selection.
    select mblnr from mseg into table it_mblnr where mblnr ge s_mblnr-low
                                     and   mblnr le s_mblnr-high.
    delete adjacent Duplicates  from it_mblnr.
    *loop at it_mblnr.
    *write : it_mblnr-mblnr.
    *endloop.
    loop at it_mblnr.
    select mblnr
           mjahr
           matnr
           erfmg
           werks
           lgort
           ebeln
           ebelp
           umwrk from mseg into table it_tab where mblnr = it_mblnr-mblnr
                                           and   mjahr = s_mjahr
                                           and   xauto <> 'X'.
    read table it_tab index 1.
    *code for PO Number
    s_ebeln = it_tab-ebeln.
    *code for Supplying plant address
    select single adrnr from twlad into twlad-adrnr where werks = it_tab-werks
                                                    and   lgort = it_tab-lgort.
    select single * from adrc into it_add1 where addrnumber = twlad-adrnr.
    clear twlad-adrnr.
    *code for receiving plant address
    select single lgort from ekpo into ekpo-lgort where ebeln = it_tab-ebeln
                                                  and   ebelp = it_tab-ebelp.
    select single adrnr from twlad into twlad-adrnr where werks = it_tab-umwrk
                                                    and   lgort = ekpo-lgort.
    select single * from adrc into it_add2 where addrnumber = twlad-adrnr.
    clear : twlad-adrnr,
            ekpo-lgort.
    *code for the Material Document Date
    select single budat from mkpf into s_date where mblnr = it_mblnr-mblnr
                                                  and   mjahr = s_mjahr.
    loop at it_tab.
    it_final-matnr = it_tab-matnr.
    it_final-erfmg = it_tab-erfmg.
    *Code for Material Description
    select single maktx from makt into makt-maktx where matnr = it_tab-matnr.
    it_final-maktx = makt-maktx.
    clear makt-maktx.
    *Code for Service order Number
    select single matnr
                  bednr from ekpo into it_bednr where ebeln = it_tab-ebeln
                                         and   ebelp = it_tab-ebelp
                                         and   matnr = it_tab-matnr.
    it_final-bednr = it_bednr-bednr.
    *Code for Price for the Material
    select single matnr
                  verpr
                  stprs from mbew into it_price where matnr = it_tab-matnr
                                                and   bwkey = it_tab-werks.
    if it_price-verpr <> 0.
    it_final-verpr = it_price-verpr.
    else.
    it_final-verpr = it_price-stprs.
    endif.
    it_final-val_p = it_final-erfmg * it_price-stprs.
    append it_final.
    clear it_final.
    endloop.
    *Code for Serial Number
    select single obknr from ser03 into ser03-obknr where mblnr = it_mblnr-mblnr
                                                    and   vorgang = 'MMSL'.
    select matnr
           sernr from objk into table it_ser where obknr = ser03-obknr.
    clear ser03-obknr.
    *Calling Function Module for Smartform
    CALL FUNCTION 'SSF_FUNCTION_MODULE_NAME'
      EXPORTING
        FORMNAME                 = 'ZMM_DC_FORM'
      VARIANT                  = ' '
      DIRECT_CALL              = ' '
    IMPORTING
       FM_NAME                  = FM_NAME
    EXCEPTIONS
      NO_FORM                  = 1
      NO_FUNCTION_MODULE       = 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.
    CALL FUNCTION FM_NAME
    EXPORTING
    L_MBLNR = it_mblnr-mblnr
    L_DATE = S_DATE
    L_EBELN = S_EBELN
    IT_ADD1 = IT_ADD1
    IT_ADD2 = IT_ADD2
    TABLES
    IT_FINAL = IT_FINAL
    IT_SER = IT_SER.
    endloop.
    Please help me to solve this problem.It is very urgent.
    Thanks & Regards,
    Ashok.

  • Problem is Module pool custom F4 help

    In module pool selection screen . I have defined vendor field as a select option and attached a custom search help to it . Now the problem is that when i press F4 on that field and select a value from the help , that value is not populated in the input field .
    The other problem is that if we keep this vendor select option as blank , then in the select statement using " IN S_lifnr " gives a dump as it treats the field as blank .( does not function as standard) . does this have anything to do with the custom search help .
    any help would be appreciated .

    Do you mean that u created a custom cearch help using se11 and attached that using F4IF_INT_TABLE_VALUE_REQUEST.
    I dont think that is possible. 
    F4IF_INT_TABLE_VALUE_REQUEST is used to programmatically create an f4 help, fetching data from an internal table.
    here is an eg.
    DATA: BEGIN OF VALUE_ITAB OCCURS 0,
          moldno TYPE zqmrr-zzmoldno,
          END OF VALUE_ITAB.
    DATA: FIELD_TAB LIKE DFIES OCCURS 0 WITH HEADER LINE.
    DATA: RETURN_TAB LIKE DDSHRETVAL OCCURS 0 WITH HEADER LINE.
    select-options :           s_moldno  for zqmrr-zzmoldno,
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR S_MOLDNO-LOW.
      REFRESH VALUE_ITAB[].
      REFRESH FIELD_TAB[].
      REFRESH RETURN_TAB[].
      SELECT ZZMOLDNO FROM ZQMRR INTO table VALUE_ITAB.
      FIELD_TAB-FIELDNAME = 'ZZMOLDNO'.
      FIELD_TAB-TABNAME   = 'ZQMRR'.
      APPEND FIELD_TAB.
      CALL FUNCTION 'F4IF_INT_TABLE_VALUE_REQUEST'
        EXPORTING
       DDIC_STRUCTURE         = ' '
          RETFIELD               =  FIELD_TAB-FIELDNAME
        TABLES
          VALUE_TAB              = VALUE_ITAB
         FIELD_TAB              = FIELD_TAB
         RETURN_TAB             = RETURN_TAB
       DYNPFLD_MAPPING        =
    EXCEPTIONS
       PARAMETER_ERROR        = 1
       NO_VALUES_FOUND        = 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 SY-SUBRC = 0.
        S_MOLDNO-LOW = RETURN_TAB-FIELDVAL.
      ENDIF.
    compare and try to find  what u are doing wrong,

  • Select-options for input field

    hi,
    Is it possible to use 'Select-options' in web dynpro for the input field like we use in abap?
    Ex. material is the input field. i want to select range also for this input field using 'Select-options'
    I have tried only with ovs(f4 help) for the input field. can u pls tel me how to use if it is possible ?
    Thanks,
    Aishwarya.

    DATA: LT_RANGE_TABLE TYPE REF TO DATA,
            RT_RANGE_TABLE TYPE REF TO DATA,
            READ_ONLY TYPE ABAP_BOOL,
            TYPENAME TYPE STRING.  DATA: LR_COMPONENTCONTROLLER TYPE REF
    TO IG_COMPONENTCONTROLLER,
            L_REF_CMP_USAGE TYPE REF TO IF_WD_COMPONENT_USAGE.
    create the  used component
      L_REF_CMP_USAGE = WD_THIS->WD_CPUSE_SELECT_OPTIONS( ).
      IF L_REF_CMP_USAGE->HAS_ACTIVE_COMPONENT( ) IS INITIAL.
        L_REF_CMP_USAGE->CREATE_COMPONENT( ).
      ENDIF.
      WD_THIS->M_WD_SELECT_OPTIONS = WD_THIS->WD_CPIFC_SELECT_OPTIONS( ).
    init the select screen
      WD_THIS->M_HANDLER =
    WD_THIS->M_WD_SELECT_OPTIONS->INIT_SELECTION_SCREEN( ). 
    WD_THIS->M_HANDLER->SET_GLOBAL_OPTIONS(
                                  I_DISPLAY_BTN_CANCEL  = ABAP_FALSE
                                  I_DISPLAY_BTN_CHECK   = ABAP_FALSE
                                  I_DISPLAY_BTN_RESET   = ABAP_FALSE
                                  I_DISPLAY_BTN_EXECUTE = ABAP_FALSE ).
    *create a range table that consists of this new data element
      LT_RANGE_TABLE = WD_THIS->M_HANDLER->CREATE_RANGE_TABLE(
      I_TYPENAME = 'matnr' ).
    add a new field to the selection
      WD_THIS->M_HANDLER->ADD_SELECTION_FIELD(
      I_ID = 'matnr'
      IT_RESULT = LT_RANGE_TABLE
      I_READ_ONLY = READ_ONLY ).
    This is my code followed by saptechnical. but when i exec, am getting err like the type matnr is invalid.

  • Passing Select-options as parameter to function module

    I need to pass a select-option as a parameter to a function module. Is this possible?
    There is an option of passing all the values of the select-option to an internal table, passing that internal table as parameter to the function module, and then adding it manually again to a select-option in the function module.
    But is there any direct way to do this?

    Hi,
    I have a similar problem: I have RFC function module to which I want to pass select options. Therefore I defined table parameters as follows:
    IT_RUNID     TYPE     EFG_TAB_RANGES
    IT_PERNR      TYPE     EFG_TAB_RANGES
    IT_REINR     TYPE     EFG_TAB_RANGES
    I can successfully pass my values to the module, but if I try to check these parameters
    using
    CHECK IT_TRIPS-RUNID IN IT_RUNID.
        CHECK IT_TRIPS-PERNR IN IT_PERNR.
        CHECK IT_TRIPS-REINR IN IT_REINR.
    the check always fails, I guess because there are leading zeros in the ranges. Is there a way to solve this problem?
    Thanks and regards,
    Martin

  • How to create selections-screens to display PO using module pool program

    All,
    I'm new to module pool programming. Can any one please provide me where to create selections screens to display existing purchase orders using the below selection criteria in thr module pool program.,
    SELECT-OPTIONS : S_LIFNR FOR EKKO-LIFNR,
                     S_BSART FOR EKKO-BSART,
                     S_BUKRS FOR EKKO-BUKRS,
                     S_WERKS FOR EKPO-WERKS OBLIGATORY,
                     S_BEDAT FOR SY-DATUM,
                     S_EINDT FOR EKET-EINDT,
                     S_EBELN FOR EKKO-EBELN,
                     S_MATNR FOR EKPO-MATNR.
    provide me step by step to do this.

    Hi,
    Thanks for the reply can you please let me know.
    How can I create the ranges
    like low and high in the selection.
    Using se51 i was able to do only one i,e
    example I need
    purchase order number----
    f4 -
    f4
    Can please tell me how to do this

  • Making input select option or input field mandatory....

    Hello Gurus,
    I have been through some material to create select options in web dynpro ABAP. Now I want to make one of the fields mandatory so that if user executes it without filling data in that filed, it gives error message or enforces user to input in the manadtory field.
    I know how to do this in ABAP but how do I achieve the same in ABAP webdynpro ?
    Please help.
    Regards,
    Jainam.

    Hi ,
    Set i_obligatory parameter as X. This will set the select options as mandatory and standard error message will popup in case it is not filled.
    wd_this->m_handler->add_selection_field(
      i_id = 'S_CARR_ID'
      it_result = lt_range_table
    *  i_obligatory = 'X'   ,  " To make it mandatory

Maybe you are looking for