Help needed in selection screen - Urgent

Hi Experts,
I have a selection screen. I have three radi buttons in that selection screen. Based on the selection of the radio buttons I need to activate corresponding selection screen parameters.
e.g : if radiobutton1 is selected, njo activation needed,
       if radiobutton2 is selected, activate selection screen parameter p_one,
       if radiobutton3 is selected, activate selection screen parameter p_two.
All three radiobuttons are attached to the same radio button group.
I have assigned the parameters p_one, p_two, p_three to MODIF ID as follows.
p_one - NULL
p_two - t01
p_three - t02.
on the selection of a radio button I want the corresponding parameter to get activated.
please help me.
Regards,
Arul jothi A.

hi
jothi
AT SELECTION-SCREEN OUTPUT.                                      
  CASE SY-TCODE.                                                 
    WHEN 'ZEDI6'.                                                
      LOOP AT SCREEN.                                             
        CASE SCREEN-GROUP4.                                      
          WHEN '001'.                  "Sales order select       
            SCREEN-ACTIVE = '1'.       "1=Active, 0=Don't display
            MODIFY SCREEN.                                       
          WHEN '002'.                  "Delivery select          
            SCREEN-ACTIVE = '0'.       "1=Active, 0=Don't display
            MODIFY SCREEN.                                        
          WHEN '003'.                  "Invoice select           
            SCREEN-ACTIVE = '0'.       "1=Active, 0=Don't display
            MODIFY SCREEN.                                       
          WHEN '004'.                  "PO Select                
            SCREEN-ACTIVE = '0'.       "1=Active, 0=Don't display
            MODIFY SCREEN.                                       
regards
praveen

Similar Messages

  • Help Needed for selection screen

    Hi Experts
    I'm doing one report of pm module using one standard program called me RIQMEL10
                 my query is if u execute this stand.prog u'll get one selection screen ,and having three selction-screen blocks.  first sel-scr block name is Notification status this selection screen is calling dynamically by using sap stand.prog SAPDBQMI
                    SCR NO : 1000
    can any one send me the default code of this selection screen block ( Notification status ) which sap is providing .

    INCLUDE DBQMISEL
    It will be automatically included into the database program.
    If the source code is automatically generated,
    please perform the following steps:
    1. Replace ? by suitable names (at most 8 characters).
    2. Activate SELECT-OPTIONS and PARAMTERS (delete stars).
    3. Save source code.
    4. Edit database program
    Hint: Syntax-Check is not possible within this Include!
    It will be checked during syntax-check of database program.
    SELECTION-SCREEN BEGIN OF BLOCK block1 WITH FRAME TITLE text-011.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS dy_ofn LIKE rihea-dy_ofn FOR TABLE diqmel.
    SELECTION-SCREEN COMMENT 3(11) text-001
                                          FOR FIELD dy_ofn ID 001.
    PARAMETERS dy_rst LIKE rihea-dy_rst FOR TABLE diqmel.
    SELECTION-SCREEN COMMENT 16(10) text-002
                                           FOR FIELD dy_rst ID 002.
    PARAMETERS dy_iar LIKE rihea-dy_iar FOR TABLE diqmel.
    SELECTION-SCREEN COMMENT 29(10) text-003
                                           FOR FIELD dy_iar ID 003.
    PARAMETERS dy_mab LIKE rihea-dy_mab FOR TABLE diqmel.
    SELECTION-SCREEN COMMENT 42(10) text-004
                                           FOR FIELD dy_mab ID 004.
    SELECTION-SCREEN COMMENT 52(10) text-005
                                           FOR FIELD selschem ID 005.
    PARAMETERS: selschem LIKE tj48t-selid FOR TABLE diqmel.
    SELECTION-SCREEN PUSHBUTTON 73(5) p_addr USER-COMMAND addr
    FOR TABLE diqmel ID 006.
    PARAMETERS dy_adrfl NO-DISPLAY FOR TABLE diqmel.
    SELECTION-SCREEN COMMENT 79(30) ad_icon FOR TABLE diqmel ID ic1.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK block1.
    SELECTION-SCREEN BEGIN OF BLOCK block2 WITH FRAME TITLE text-012.
    SELECT-OPTIONS:
      qmnum                  FOR diqmel-qmnum MATCHCODE OBJECT qmeg,
      qmart                  FOR diqmel-qmart,
      tplnr                  FOR diqmel-tplnr NO-DISPLAY,
      strno                  FOR diqmel-strno MATCHCODE OBJECT iflm,
      equnr                  FOR diqmel-equnr MATCHCODE OBJECT equi,
      matnr                  FOR diqmel-matnr MATCHCODE OBJECT mat1,
      serialnr               FOR diqmel-serialnr,
      deviceid               FOR diqmel-deviceid,
      aufnr                  FOR diqmel-aufnr MATCHCODE OBJECT orde.
    *--- date from - until
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 1(28) text-009 FOR FIELD datuv.
    SELECTION-SCREEN POSITION 33 FOR TABLE diqmel.
    PARAMETERS datuv LIKE rihea-termab FOR TABLE diqmel DEFAULT sy-datum.
    SELECTION-SCREEN COMMENT 51(6) text-010 FOR FIELD datub.
    PARAMETERS datub LIKE rihea-termbi FOR TABLE diqmel DEFAULT sy-datum.
    SELECTION-SCREEN END OF LINE.
    *--- partner function, partner
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 1(9) text-006 FOR FIELD dy_parvw.
    SELECTION-SCREEN POSITION 10 FOR TABLE diqmel.
    PARAMETERS  dy_parvw LIKE ihpa-parvw FOR TABLE diqmel
                AS LISTBOX VISIBLE LENGTH 22.
    SELECTION-SCREEN POSITION 33 FOR TABLE diqmel.
    PARAMETERS  dy_parnr LIKE ihpa-parnr FOR TABLE diqmel VALUE-REQUEST.
    *--- button classification
    SELECTION-SCREEN PUSHBUTTON 73(5) text-013 USER-COMMAND clse
    FOR TABLE diqmel.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK block2.
    *--- freie Abgrenzungen für log.Datenbankselektion -
    SELECTION-SCREEN DYNAMIC SELECTIONS FOR TABLE diqmel ID 010.
    SELECTION-SCREEN BEGIN OF VERSION 001 text-v01.
    SELECTION-SCREEN EXCLUDE PARAMETERS: dy_mab, dy_ofn, dy_rst, dy_iar,
                                         selschem, dy_adrfl.
    SELECTION-SCREEN EXCLUDE IDS: 001, 002, 003, 004, 005, 006, 010, ic1.
    SELECTION-SCREEN END   OF VERSION 001.
    SELECTION-SCREEN BEGIN OF VERSION 002 text-v02.
    SELECTION-SCREEN EXCLUDE IDS: 010.
    SELECTION-SCREEN END   OF VERSION 002.
    *--- Parameter für Selektionssteuerung -> es sollen nicht     -
    *--- automatisch alle Segmente der log.DB selektiert werden   -
    *--- neu mit P30K047900                                       -
    PARAMETERS: ldb_ihpa NO-DISPLAY DEFAULT 'X' FOR TABLE diihpa,
                ldb_iflo NO-DISPLAY DEFAULT 'X' FOR TABLE diiflo,
                ldb_equi NO-DISPLAY DEFAULT 'X' FOR TABLE diequi,
                ldb_qmfe NO-DISPLAY DEFAULT 'X' FOR TABLE diqmfe,
                ldb_qmma NO-DISPLAY DEFAULT 'X' FOR TABLE diqmma,
                ldb_qmmx NO-DISPLAY DEFAULT 'X' FOR TABLE diqmmax,
                ldb_clas NO-DISPLAY DEFAULT 'X' FOR TABLE diclass,
                ldb_clda NO-DISPLAY DEFAULT 'X' FOR TABLE dicldat,
                ldb_qmsm NO-DISPLAY DEFAULT 'X' FOR TABLE diqmsm,
                ldb_qmsx NO-DISPLAY DEFAULT 'X' FOR TABLE diqmsmx,
                ldb_aufk NO-DISPLAY DEFAULT 'X' FOR TABLE diaufk.
    regards
    vinod

  • F4 Help for the selection screen field

    Hi Gurus,
    I have to display F4 help for a selection screen field. i am using following code:
        CALL FUNCTION 'F4IF_INT_TABLE_VALUE_REQUEST'
             EXPORTING
                  retfield        = 'CODE'
                  dynpprog        = lw_repid
                  dynpnr          = sy-dynnr
                  VALUE_ORG       = 'S'
             TABLES
                  value_tab       = gi_text
                 field_tab       = li_fields_tab
                  return_tab      = pi_return_tab
             EXCEPTIONS
                  parameter_error = 1
                  no_values_found = 2
                  OTHERS          = 3.
    My internal table gi_emp has two fields CODE & TEXT. When i select 1 particular value, it returns the CODE value in the pi_return_tab table.
    But my requirement is i have to capture the corresponding TEXT value for the Returned CODE. Ex: following is the F4 help being displayed: -
    001    test
    001    test1
    but is i select code 001(First Value), i also need to capture it's corresponding Text value. In return table pi_return_tab i have only Code value.
    Please help me out.
    Note: Based on return code i can't search into the internal table gi_code, because as shown in the example, code has multiple text.

    Sachin,
    I think this is what you need. The following code will return the key and the text (OR any other columns), if both columns are in the selection screen the selected values (both columns) will also be passed to the corresponding parameters. If you only need the text to be in the return table and not passed to the selection screen then set the parameter for text with NO-DISPLAY option.
    REPORT zktest01 .
    DATA :
      BEGIN OF value_tab OCCURS 0,
        field  LIKE e070-trkorr,
        text   LIKE e07t-as4text,
      END OF value_tab.
    DATA: t_fldtab LIKE dfies OCCURS 0 WITH HEADER LINE,
          t_rettab LIKE ddshretval OCCURS 0 WITH HEADER LINE,
          t_dynmap LIKE dselc OCCURS 0 WITH HEADER LINE.
    PARAMETERS : p_field  LIKE value_tab-field,
                 p_text   LIKE value_tab-text. "NO-DISPLAY.
    INITIALIZATION.
      t_fldtab-tabname   = 'VALUE_TAB'.
      t_fldtab-fieldname = 'FIELD'.
      t_fldtab-langu     = 'E'.
      t_fldtab-position  = 1.
      t_fldtab-offset    = 0.
      t_fldtab-fieldtext = 'Key'.
      t_fldtab-reptext   = 'Key'.
      t_fldtab-leng      = 20.
      t_fldtab-intlen    = 20.
      t_fldtab-outputlen = 20.
      t_fldtab-datatype  = 'CHAR'.
      t_fldtab-inttype   = 'C'.
      t_fldtab-headlen   = 20.
      t_fldtab-keyflag   = 'X'.
      t_fldtab-lowercase = ' '.
      APPEND t_fldtab.
      t_fldtab-tabname   = 'VALUE_TAB'.
      t_fldtab-fieldname = 'TEXT'.
      t_fldtab-position  = 2.
      t_fldtab-offset    = 20.
      t_fldtab-fieldtext = 'Text'.
      t_fldtab-reptext   = 'Text'.
      t_fldtab-leng      = 60.
      t_fldtab-intlen    = 60.
      t_fldtab-outputlen = 60.
      t_fldtab-headlen   = 60.
      t_fldtab-keyflag   = ' '.
      t_fldtab-lowercase = ' '.
      APPEND t_fldtab.
      value_tab-field = '101'.
      value_tab-text = 'dddd'.
      APPEND value_tab.
      value_tab-field = '202'.
      value_tab-text = 'aaaa'.
      APPEND value_tab.
      t_dynmap-fldname = 'FIELD'.
      t_dynmap-dyfldname = 'P_FIELD'.
      APPEND t_dynmap.
      t_dynmap-fldname = 'TEXT'.
      t_dynmap-dyfldname = 'P_TEXT'.
      APPEND t_dynmap.
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_field.
      CALL FUNCTION 'F4IF_INT_TABLE_VALUE_REQUEST'
           EXPORTING
                retfield        = 'FIELD'
                dynpprog        = 'ZKTEST01'
                dynpnr          = '1000'
                dynprofield     = 'P_FIELD'
                value_org       = 'S'
           TABLES
                field_tab       = t_fldtab
                value_tab       = value_tab
                return_tab      = t_rettab
                dynpfld_mapping = t_dynmap
           EXCEPTIONS
                parameter_error = 1
                no_values_found = 2
                OTHERS          = 3.
      IF sy-subrc EQ 0.
      ENDIF.
    START-OF-SELECTION.
    Jeffrey Satriadi

  • Help on a selection screen

    I need some help on a selection screen.  I have the following:
    SELECTION-SCREEN: BEGIN OF BLOCK a1 WITH FRAME TITLE text-001.
    PARAMETERS:       p_bldat TYPE bkpf-bldat OBLIGATORY DEFAULT sy-datum,
                      p_budat TYPE bkpf-budat OBLIGATORY DEFAULT sy-datum,
                      p_xref1 TYPE proj-pspid OBLIGATORY,
                      p_bktxt TYPE bkpf-bktxt,
                      p_bukrs TYPE bkpf-bukrs OBLIGATORY DEFAULT '1100',
                      p_waers TYPE bkpf-waers OBLIGATORY DEFAULT 'USD'.
    SELECTION-SCREEN: END OF BLOCK a1.
    SELECTION-SCREEN: BEGIN OF BLOCK b1 WITH FRAME TITLE text-002.
    PARAMETERS:       p_lifnr TYPE ekko-lifnr OBLIGATORY,
                      p_ebeln TYPE ekko-ebeln OBLIGATORY.
    SELECTION-SCREEN: END OF BLOCK b1.
    SELECTION-SCREEN: BEGIN OF BLOCK c1 WITH FRAME TITLE text-003.
    PARAMETERS:       p_amt TYPE wrbtr,
                      p_ret  TYPE wrbtr.
    SELECTION-SCREEN: END OF BLOCK c1.
    SELECTION-SCREEN: BEGIN OF BLOCK d1 WITH FRAME TITLE text-004.
    PARAMETERS:       p_cmode  TYPE callmode DEFAULT 'N' OBLIGATORY.
    SELECTION-SCREEN: END OF BLOCK d1.
    AT SELECTION-SCREEN ON p_ebeln.
      SELECT SINGLE kwert INTO p_ret FROM zretention WHERE ebeln = p_ebeln AND ebelp = '00000' AND TYPE = 'C'.
      IF NOT sy-subrc = 0 OR p_ret IS INITIAL.
        CONCATENATE 'Purchase Order' p_ebeln 'does not have any retention available for release!' INTO d_string.
        MESSAGE d_string TYPE 'E'.
      ENDIF.
    AT SELECTION-SCREEN.
      check p_ret is not INITIAL.
      IF p_amt > p_ret.
        MESSAGE 'Amt. To Be Released is more than the remaining retention. Please check your input.' TYPE 'E'.
      ELSEIF p_amt IS INITIAL.
        MESSAGE 'Amt. To Be Released is required. Please check your input.' TYPE 'E'.
      ENDIF.
    What I want is for the parameter p_ret to be populated when the user inputs a PO (p_ebeln).  This seems to work except I want this to be brought in without running through the other checks (AT SELECTION-SCREEN).  In order to bring in p_ret I am having to hit ENTER which will trigger the event AT SELECTION-SCREEN.
    How can I bring in p_ret without triggering the event AT SELECTION-SCREEN?
    Regards,
    Davis

    In this case.
    If you don't want at selection-screen to be triggered on hitting enter, you can give an if condition in at selection-screen.
    tables : sscrfields.
    AT SELECTION-SCREEN ON p_ebeln.
      SELECT SINGLE kwert INTO p_ret FROM zretention WHERE ebeln = p_ebeln AND ebelp = '00000' AND TYPE = 'C'.
      IF NOT sy-subrc = 0 OR p_ret IS INITIAL.
        CONCATENATE 'Purchase Order' p_ebeln 'does not have any retention available for release!' INTO d_string.
       clear sscrfield-ucomm.
        MESSAGE d_string TYPE 'E'.
      ENDIF.
    AT SELECTION-SCREEN.
    if sscrfields-ucomm = 'ONLI'.
      check p_ret is not INITIAL.
      IF p_amt > p_ret.
        MESSAGE 'Amt. To Be Released is more than the remaining retention. Please check your input.' TYPE 'E'.
      ELSEIF p_amt IS INITIAL.
        MESSAGE 'Amt. To Be Released is required. Please check your input.' TYPE 'E'.
      ENDIF.
    endif.
    The code in at selection-screen is executed only when user presses F8. on pressing 'Enter' it will not be executed.
    Hope this helps you.
    Regards,
    Siddarth

  • F4 help in the selection screen from a int table

    I collected the datas from the function module. and the internal table is populated.
    the internal table contains manny fields.
    among these fields i need to take only one field and this field value to be used for F4 help in the selection screen ( not a dynpro)
    for example : in the selection screen
    I have to select the PO.
    based on the user i have filtered the PO. (determined dynamically by using the user name this i have done it)
    then i have to assign the PO the selection screen.
    which FM will be better to use  for this type of scenario and help me out with some example codes particularly for my req
    Thanks

    Hi ,
    use the FM 'F4IF_INT_TABLE_VALUE_REQUEST'
    This example is for search help for material type .
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR s_mtart-low .
    select all material types you want to display in search help into table i_mtart.
    PERFORM select_material_type.
    PERFORM help_material_type.
    *& Form help_material_type
    text
    --> p1 text
    <-- p2 text
    FORM help_material_type .
    CALL FUNCTION 'F4IF_INT_TABLE_VALUE_REQUEST'
    EXPORTING
    DDIC_STRUCTURE = ' '
    retfield = 'MTART'
    PVALKEY = ' '
    dynpprog = sy-cprog
    dynpnr = sy-dynnr
    dynprofield = 'S_MTART-LOW'
    STEPL = 0
    WINDOW_TITLE =
    VALUE = ' '
    value_org = 'S'
    MULTIPLE_CHOICE = ' '
    DISPLAY = ' '
    CALLBACK_PROGRAM = ' '
    CALLBACK_FORM = ' '
    MARK_TAB =
    IMPORTING
    USER_RESET =
    TABLES
    value_tab = i_mtart
    FIELD_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.
    ENDFORM. " help_material_type
    Regards,
    Balaji.

  • How to link a search help to a selection screen field

    Hi All,
    I am using field PKWRG from PA0017 table in selection screen. I need F4 help there as in Tcode PA30 . But this field does not have value table or check table. However, it has a search help attached 'TRV_PKWRG' .
    But, I donot know how to assign a search help to a selection screen field. Please help.
    Regards,
    Nibha

    Hello,
    Fetch all the data which from the table which you want to show in the search help and pass the value to the FM
    F4IF_INT_TABLE_VALUE_REQUEST and the selection-screen event must be
    at selection-screen on value request parameter or selection option variable.
    BCALV_TEST_FULLSCREEN
    BCALV_TEST_FULLSCREEN_CALLS
    BCALV_TEST_FULLSCREEN_PRINT
    BCALV_TEST_FULLSCREEN_STATUS
    BCALV_TEST_GRID
    BCALV_TEST_GRID_DRAG_DROP
    BCALV_TEST_GRID_EDITABLE
    BCALV_TEST_GRID_EVENTS
    BCALV_TEST_GRID_INDEX
    BCALV_TEST_GRID_TOOLBAR
    BCALV_TEST_HIERSEQ_LIST
    BCALV_TEST_LIST
    BCALV_TEST_LIST_PRINT
    BCALV_TEST_LIST_STATUS
    BCALV_VERIFY_DTYPES_D0100_F01
    BCSMENUF01
    BDLCOF10
    BDLDVI10
    BDLTREDF

  • Error in search help button at selection-screen

    hi all,
    i have a small issue.
    i have created a seach help button in selection screen .
    my code is as bellow.
    TYPES: BEGIN OF ty_ZSD_SNID,
           KUNNR TYPE KUNNR,
           BAREA TYPE WERKS_D,
          END OF ty_ZSD_SNID.
    DATA : it_z TYPE STANDARD TABLE OF ty_ZSD_SNID.
    selection-screen : begin of block b with frame title text-000.
    select-options : skunnr for zsd_snid-kunnr.
    parameters :     pbarea like zsd_snid-barea obligatory.
    selection-screen : end of block b.
    INITIALIZATION.
      SELECT KUNNR BAREA FROM ZSD_SNID INTO TABLE it_z.
      SORT it_z BY BAREA KUNNR.
      DELETE ADJACENT DUPLICATES FROM it_z COMPARING BAREA KUNNR.
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR SKUNNR-low.
      IF it_z[] IS NOT INITIAL.
        CALL FUNCTION 'F4IF_INT_TABLE_VALUE_REQUEST'
                 EXPORTING
              DDIC_STRUCTURE         = ' '
                   retfield               = 'KUNNR'  " data base table field name
              PVALKEY                = ' '
                  dynpprog               = sy-repid " program name
                  dynpnr                 = sy-dynnr          "screen name
                  dynprofield            = 'SKUNNR-LOW'  " layot field name
              STEPL                  = 0
              WINDOW_TITLE           =
              VALUE                  = ' '
                  value_org              = 'S'
              MULTIPLE_CHOICE        = ' '
              DISPLAY                = ' '
              CALLBACK_PROGRAM       = ' '
              CALLBACK_FORM          = ' '
              MARK_TAB               =
            IMPORTING
              USER_RESET             =
                 TABLES
                   value_tab              = it_z[]   " internal talble name
              FIELD_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.
      ELSE.
        MESSAGE E000(zsdsn).
      ENDIF.
    my issue is , its working properly if records are there in my z table.
    if no records are there in the table then if i do comment the last message statement then its working.
    if i do uncomment like the above code, then its dumming.
    what i should i do ??
    kind regards

    closed because of no answer.

  • How to provide F4 help in a selection screen

    Hi..
       How to provide F4 help in a selection screen for a particular field  using  
    CALL FUNCTION 'F4IF_INT_TABLE_VALUE_REQUEST'.
    Thanks in Advance.
    Regards
    Raj Kumar

      AT SELECTION SCREEN
    at selection-screen on value-request for s_contr-low.
    Get contract (low value)
      perform get_contract changing s_contr-low.
    form get_contract  changing p_contr .
      types: begin of ty_ycontract,
               ycontract type xchcontract-ycontract,
               lifnr     type xchcontract-lifnr,
               ycontdate type xchcontract-ycontdate,
               ycont_end_dt type xchcontract-ycont_end_dt ,
             end of ty_ycontract.
      data: ds_returntab   type ddshretval,
            dt_returntab   type table of ddshretval,
            dl_fieldname     type dfies-fieldname.
      data: dt_ycontract type table of ty_ycontract.
      select ycontract lifnr ycontdate ycont_end_dt
        from xchcontract
        into table dt_ycontract.
      if sy-subrc = 0.
        clear dl_fieldname.
        dl_fieldname = 'YCONTRACT'.
        call function 'F4IF_INT_TABLE_VALUE_REQUEST'
          exporting
            retfield        = dl_fieldname
            value_org       = 'S'
          tables
            value_tab       = dt_ycontract
            return_tab      = dt_returntab
          exceptions
            parameter_error = 1
            no_values_found = 2
            others          = 3.
        if sy-subrc = 0.
          clear ds_returntab.
          read table dt_returntab into ds_returntab index 1.
          if sy-subrc = 0.
            p_contr = ds_returntab-fieldval.
          endif.
        endif.
      endif.
    endform.

  • Can we create serach help for a selection screen field

    Can we create serach help for a selection screen field with out creating searchhelp object.
    I mean is it possible to create serchelp in the program itself with some specific values i want to give.
    E.g say we can define any internal table and fill it with values and using that into selection screen fields
    Regards
    Mave

    AT SELECTION-SCREEN ON VALUE-REQUEST FOR paymeth.
      PERFORM PAYMENT_HELP.
    FORM PAYMENT_HELP.
      DATA: begin of DESCR_TAB occurs 0,
            DESCR LIKE BKPF-BKTXT,
            END OF DESCR_TAB.
      DATA: gd_repid like sy-repid.
      gd_repid = sy-repid.
      DESCR_TAB-DESCR = 'aaaaa'.
      append DESCR_TAB.
      DESCR_TAB-DESCR = 'bbbbb'.
      append DESCR_TAB.
      DESCR_TAB-DESCR = 'ccccc'.
      append DESCR_TAB.
      CALL FUNCTION 'F4IF_INT_TABLE_VALUE_REQUEST'
           EXPORTING
                retfield    = 'DESCR'
                DYNPPROG    = gd_repid
                DYNPNR      = '1000'
                DYNPROFIELD = 'paymeth'
                VALUE_ORG   = 'S'
                DISPLAY     = ' '
           TABLES
                value_tab   = DESCR_TAB.
    endform.
    Svetlin

  • I need a selection screen

    I need a selection screen if there r 3 selection screen in O/P screen
    If i click on 1 selection other 2 should be disable

    Hi Swaroop,
    write like this, i hope your problem will solve
    SELECTION-SCREEN BEGIN OF BLOCK B1 WITH FRAME TITLE TEXT-001.
    SELECT-OPTIONS: S_EBELN FOR EKKO-EBELN.MODIF ID S1.
    PARAMETERS: P_MATNR TYPE MATNR MODIF ID S2,
                             P_WERKS TYPE WERKS_D MODIF ID S3.
    SELECTION-SCREEN END OF BLOCK B1.
    BLOCK 2 ****
    SELECTION-SCREEN BEGIN OF BLOCK B2 WITH FRAME TITLE TEXT-002.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS: R1 RADIOBUTTON GROUP G1 DEFAULT 'X' USER-COMMAND UG1,
    R2 RADIOBUTTON GROUP G1  ,
    R3 RADIOBUTTON GROUP G1  .
    SELECTION-SCREEN END OF LINE.
    AT SELECTION-SCREEN OUTPUT.
    LOOP AT SCREEN.
        IF R1 EQ 'X' .
            IF  SCREEN-GROUP1 EQ 'S2' AND  SCREEN-GROUP1 EQ 'S3'.
          SCREEN-INPUT = 0.
          MODIFY SCREEN.
          SET CURSOR FIELD 'S_EBELN'.
            ENDIF.
        ENDIF.
        IF R2 EQ 'X'
           IF SCREEN-GROUP1 EQ 'S1' AND  SCREEN-GROUP1 EQ 'S2'.
          SCREEN-INPUT = 0.
          MODIFY SCREEN.
          SET CURSOR FIELD 'P_MATNR'.
           ENDIF.
        ENDIF.
    IF R3 EQ 'X'.
       IF SCREEN-GROUP1 EQ 'S1' AND SCREEN-GROUP1 EQ 'S3'  .
          SCREEN-INPUT = 0.
          MODIFY SCREEN.
          SET CURSOR FIELD 'P_MATNR'.
        ENDIF.
    ENDIF.
      ENDLOOP.
    Thanks,
    Murali

  • Restricting values F4 help in selection screen-Urgent

    Hi,
    can anyone pls tell how can I ristrict the values for search help in any field in selection screen.
    please tell me the way to hide some values in F4 help in selection screen so that user can not see those data for selection.
    Regards

    i think u can not hide the data.........
    create own f4 help............restrict the data and then pass it the f4 internal table....
    fro exp;;;;;
    types : begin of ty_tab,
              post_code1 like adrc-post_code1,
             end of ty_tab.
      data : it_tab type ty_tab occurs 0.
      data : lt_field type table of dfies,
             lw_field type dfies.
      select post_code1 from adrc into corresponding fields of table it_tab.
      call function 'F4IF_INT_TABLE_VALUE_REQUEST'
          exporting
            retfield        = 'POST_CODE1'
            dynpprog        = sy-repid
            dynpnr          = sy-dynnr
            dynprofield     = 'LI_LIST1'
            value_org       = 'S'
          tables
            value_tab       = it_tab
         field_tab       = lt_field
          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.
    Regards
    Anbu

  • Need Different Selection screen for different Queries in a Workbook

    Hi,
    I have created a workbook with Multiple tabs in BI 7.0.  Each Tab has different Queries and each query has different Selection screens (Variable Selections).
    When i open the workbook and refresh it, the selection screen is appearing only for one query.  All the queries are refreshed by this single selection screen, though each query has different Variable selections.  What i need is a seperate selection screen i.e seperate Variable selection appearing for each queries, when i refresh each one of them.
    Is it possible to do this?  If anybody has tried this, help me in solving this issue.  Thanks for ur time.
    Regards,
    Murali

    Murali,
    If you un-check the 'Display Duplicate Variables Only Once' this WILL solve your problem.
    When you Refresh, you should be presented with a single variable selection dialog box, but it should contain an area for each Query (DataProvider) that is embedded in the Workbook.
    This is the case if the queries are all on the same tab, or on different tabs.
    However, if you have multiple tabs each with a query on it, each query must have it's own DataProvider. If all queries are based on the same DataProvider, it will not work as the Workbook only 'sees' one Query for which it needs variable input.
    If you REALLY want multiple variable selection dialog boxes, then maybe the best way to do this is to have the queries in separate Workbooks.
    If you don't want the User to have to open 5 queries manually, you could use a Macro in each Workbook that runs on opening, to open the next Workbook in the sequence.
    I hope this makes sense!
    Regards
    Steve

  • Input help for a selection screen field

    I have a selection screen with field species and checkoff activity .
    For a given species('sc','sb' or 'ss') , the input values allowed for the
    check off activity must be 'SCCK' for species 'SC' ,'SBCK' for species 'SB' and so on.
    I need to provide input help for check off activity based on the value of the species.How do i do that?

    PARAMETER : p_val(10) TYPE c ,
                p_val2(10) TYPE c.
    AT SELECTION-SCREEN on p_val.
      IF p_val = 'SC'.
        p_val2 = 'SCCK'.
      ENDIF.

  • Help in the selection screen

    hi folks,
    I need help in updating the selection screen, I have declared the 'parameters' object in the selection screen like this.
    parameters:
      Paygroup type ZPGKIS obligatory.
    it has three values '5A', '5B' and '5V'. when I select '5V' from the parameters, I need to display another parameters selection object for 'date' otherwise NO
    I tried something like this.....
      if Paygroup = '5V'.
    parameters: p_date   type d.
      endif.
    It is not working...
    How can I correct this??
    Thanks in advance
    Vinu

    hii
    you can make that using radio button
    <b>
    REPORT z_selectionscreen .
    SELECTION-SCREEN BEGIN OF BLOCK blk.
    PARAMETERS : p_rb1 TYPE PAYGROUP RADIOBUTTON GROUP rad1 DEFAULT 'X' USER-COMMAND FC,
                 p_rb2 TYPE PAYGROUP RADIOBUTTON GROUP rad1.
    SELECTION-SCREEN END OF BLOCK blk.
    SELECTION-SCREEN BEGIN OF BLOCK blk_1 WITH FRAME.
    PARAMETERS : p_werks1 TYPE werks_d MODIF ID bk1.
    SELECTION-SCREEN END OF BLOCK blk_1.
    SELECTION-SCREEN BEGIN OF BLOCK blk_2 WITH FRAME.
    PARAMETERS : p_werks2 TYPE werks_d MODIF ID bk2,
                 p_matnr2 TYPE matnr   MODIF ID bk2.
    SELECTION-SCREEN END OF BLOCK blk_2.
    AT SELECTION-SCREEN OUTPUT.
      IF p_rb1 = '5V'.
        LOOP AT SCREEN.
          IF screen-group1 = 'BK1'.
            screen-active = 0.
            MODIFY SCREEN.
          ELSE.
            screen-active = 1.
            MODIFY SCREEN.
          ENDIF.
        ENDLOOP.
      ELSE.
        LOOP AT SCREEN.
          IF screen-group1 = 'BK2'.
            screen-active = 0.
            MODIFY SCREEN.
          ELSE.
            screen-active = 1.
            MODIFY SCREEN.
          ENDIF.
        ENDLOOP.
      ENDIF.</b>
    you can as well check this code
    SELECTION-SCREEN BEGIN OF BLOCK B1 WITH FRAME TITLE TEXT-001.
    PARAMETERS : P_FILE(25) TYPE C,
                 O_FILE(25) TYPE C.
    SELECTION-SCREEN END OF BLOCK B1.
    *Selection Screen 2
    SELECTION-SCREEN BEGIN OF BLOCK B2 WITH FRAME TITLE TEXT-002.
    PARAMETERS: CAL_TRA RADIOBUTTON GROUP G1 USER-COMMAND FLAG,
                SESSION RADIOBUTTON GROUP G1 DEFAULT 'X'.
    SELECTION-SCREEN END OF BLOCK B2.
    *Selection Screen 3
    SELECTION-SCREEN BEGIN OF BLOCK B3 WITH FRAME TITLE TEXT-003.
    PARAMETERS: MODE DEFAULT 'X' MODIF ID BL1,
                UPDATE DEFAULT 'X' MODIF ID BL1.
    SELECTION-SCREEN END OF BLOCK B3.
    *Selection Screen 4
    SELECTION-SCREEN BEGIN OF BLOCK B4 WITH FRAME TITLE TEXT-003.
    PARAMETERS: SES_NAM TYPE APQI-GROUPID MODIF ID BL2,
                KEP_TRAS TYPE C DEFAULT 'X' MODIF ID BL2,
                LOC_DATE TYPE SY-DATUM MODIF ID BL2,
                USER TYPE SY-UNAME DEFAULT SY-UNAME MODIF ID BL2.
    SELECTION-SCREEN END OF BLOCK B4.
                        At  Selection-Screen Output                      *
    AT SELECTION-SCREEN OUTPUT.
      IF CAL_TRA = 'X'.
        LOOP AT SCREEN.
          IF SCREEN-GROUP1 = 'BL1'.
            SCREEN-ACTIVE = '1'.
          ENDIF.
          IF SCREEN-GROUP1 = 'BL2'.
            SCREEN-ACTIVE = '0'.
          ENDIF.
          MODIFY SCREEN.
        ENDLOOP.
      ENDIF.
      IF SESSION = 'X'.
        LOOP AT SCREEN.
          IF SCREEN-GROUP1 = 'BL1'.
            SCREEN-ACTIVE = '0'.
          ENDIF.
          IF SCREEN-GROUP1 = 'BL2'.
            SCREEN-ACTIVE = '1'.
          ENDIF.
          MODIFY SCREEN.
        ENDLOOP.
      ENDIF.
    Message was edited by: Naresh Kumar
    Message was edited by: Naresh Kumar

  • Help need in selection query

    Hi ,
    I have a field(test) in ztable(zxxx) whose length is 12 char and while updating it
    only 10 digits were updated and there are no zeros in front of the value in order to make it
    12 digit.
    Now i need this parameter to be included in another program selection screen.
    Now i have given it as
    parameter :  test(12) type n.
    it works fine when it has an entry , when it is blank i has to retrieve all records but in this case
    i won't because it has a value of 000000000000
    noe when i declare like this
    paramter : test like zxxx-test.
    when my input is 123456, it won't fetch me any value because it has to be 0000123456 because it has been updated like in the table.
    There was a purpose in updating this way.
    Now my code is like this
    parameters : test(10) type n.
    select-options :   kostl for zxxx-kostl NO-EXTENSION NO INTERVALS,
          p_uname for zxxx-uname NO-EXTENSION NO INTERVALS.
    if test is initial.
    select * from zxxx into table itab where kostl in kostl and uname in p_uname.
    else.
    select * from zxxx into table itab where aufnr  = order and
                                   kostl in kostl and uname in p_uname.
    endif
    PLEASE SUGGEST ME IF THERE IS AN ALTERNATE BETTER WAY.
    or this is the best way
    Thanks

    Hi
    as per my knowledge what you have done is right.
    Thanks
    KAJOL

Maybe you are looking for

  • HP printer won't connect to the wireless network which has a WPA_PSK encryption

    My new HP Photosmart 5520 printer wont connect to my wifi which has a WPA_PSK encryption. I tried to put it on a unsecured wireless and it can connect to the wireless but can't connect to my mac os 10.7. Thank you!

  • More than one condition for a formula

    HI We have another field that has to 5 values, and if the field is blank, we have to write on the report 'Missing'. I am not sure how one codes for this. If else if else etc?

  • How to send Dynamic Interactive Forms through mail?

    Hi all, I'm trying to sent Interactive Forms as attachment through mails. Everything works fine as long as the Content of this Interactive Form stays static. When I add dynamic elements and test this in SFP, they work. However when they get sent by m

  • Multicast and wirerless

    I have a 4404 controller running 6.0.202 code and more more people have Mac running bonjour and wanting to use Airplay.  I see how to turn on Multicasting and even provide a Multicast address for IGMP snooping but does anyone have a good feel as to t

  • Flash videos randomly crash all my browsers

    Sometimes when trying to watch flash videos e.g Youtube the browser will just end process and disappear with the error "An unhandled Win32 exception has occurred". I've tried fresh install of flash and said browsers with no luck. The problem occurs i