Making one selection screen block invisible

Hi,
I want to make one selection-screen block invisible based on one check box value.I have built the screen as follows:
PARAMETERS: pcheck1    TYPE char1  AS CHECKBOX.
SELECTION-SCREEN  BEGIN OF BLOCK b2 WITH FRAME TITLE text-004.
PARAMETERS: pproj    TYPE xxxx ,
            psproj   TYPE xxxx ,
            pobjec   TYPE xxxx .
SELECTION-SCREEN  END OF BLOCK b2.
based on the pcheck value I want to meke the above "SELECTION-SCREEN  BEGIN OF BLOCK b2 " invisible/visible.Can you please tell me how to do it?

You need to set values in structure SCREEN:
screen-invisible = '1' .
screen-input = '0' .
screen-output = '0' .
for all items contained in block.
For example:
AT SELECTION-SCREEN OUTPUT.
  IF <condition>.
    LOOP AT SCREEN.
      CASE screen-name.
        WHEN <block_name> OR
                   <parameter1> or <parameter1_text> or
                   <parameter_N> or <parameter_N_text> .
          screen-invisible = 1.
          screen-input      = 0.
          screen-output    = 0.
        WHEN OTHERS.
      ENDCASE.
      MODIFY SCREEN.
    ENDLOOP.
You can find names of variables which contain parameter texts using debuger.
  ELSEIF sy-tcode = 'ZEUA_EDB_EXPORT'.
    p_path = 'ZUA_EDB_EXPORT'.
  ENDIF.

Similar Messages

  • How to make selection-screen block as unvisible?

    hi,
    in report program there are two selection screen blocks like this.
    SELECTION-SCREEN BEGIN OF BLOCK b1.
         parameters: rb1 as radiobutton group r1 user-command ucomm,
                  rb2 as radiobutton group r1,
                  rb3 as radiobutton group r1,
                  rb4 as radiobutton group r1,
         SELECTION-SCREEN BEGIN OF BLOCK b2.
              parameters: ip1 type string.
              select-options: date for pernr-begda.
         SELECTION-SCREEN END OF BLOCK b2.
    SELECTION-SCREEN END OD BLOCK b1.
    Now when i clicked on rb4 the selecetion screen block b2 has to be visible.
    And rest of things i.e for rb1, rb2, rb3 it should not visible. it should be disabled.
    Regards,
    Shankar.

    hi,
    i am doing like this.
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text.
      SELECTION-SCREEN SKIP 1.
      SELECT-OPTIONS: pernr FOR person-pernr.
      SELECTION-SCREEN SKIP 1.
      PARAMETERS: tempname LIKE rlgrap-filename.
      SELECTION-SCREEN SKIP 1.
      PARAMETERS: rb_p1 TYPE c RADIOBUTTON GROUP r1 USER-COMMAND rbg,
                  rb_p2 TYPE c RADIOBUTTON GROUP r1,
                  rb_p3 TYPE c RADIOBUTTON GROUP r1,
                  rb_p4 TYPE c RADIOBUTTON GROUP r1.
      SELECTION-SCREEN SKIP 1.
        SELECTION-SCREEN BEGIN OF BLOCK b2 WITH FRAME TITLE text1.
            PARAMETERS: country(25) TYPE c MODIF ID ccc.
            SELECT-OPTIONS:Fromdate FOR person-begda NO-EXTENSION MODIF ID ccc.
        SELECTION-SCREEN END OF BLOCK b2.
    SELECTION-SCREEN END OF BLOCK b1.
    AT SELECTION-SCREEN OUTPUT.
    IF rb_p4 = ' ' .
      LOOP AT SCREEN.
          IF SCREEN-NAME = 'COUNTRY'
          OR SCREEN-NAME = 'FROMDATE-LOW'
          OR SCREEN-NAME = 'FROMDATE-HIGH'
          OR SCREEN-GROUP1 = 'CCC'.
              screen-input = 0. "Disable
          ENDIF.
          MODIFY SCREEN.
      ENDLOOP.
    ENDIF.
    IF rb_p4 = 'X' .
      LOOP AT SCREEN.
          IF SCREEN-NAME = 'COUNTRY'
          OR SCREEN-NAME = 'FROMDATE-LOW'
          OR SCREEN-NAME = 'FROMDATE-HIGH'
          OR SCREEN-GROUP1 = 'CCC'.
              screen-input = 1. "Disable
          ENDIF.
          MODIFY SCREEN.
      ENDLOOP.
    ENDIF.
    Now it's making as disabled the fields which are in block B2.
    Acutually my requirement is when i ever user selects RB_P4 then only that screen has to appear. and for rest of 3 RB it should not visible. it should be invisible.
    for this wat to do....
    Regards,
    Shankar.

  • How to get One Selection Screen for all queries?

    Hi Experts,
    I have three queries having selection screens. All the selection screen have the same variables, but the reports are different.
    I have created a workbook having these three queries. Each time when the workbook opens, the three selection screen pops up one after the another. Same values are entered in all the selection screens.
    Now the user wants only one selection screen for all the three reports. Is it possible? I tried but I do not see any way.
    I think there should be some way of getting it done.
    Waiting for your inputs,
    With kind regards,
    Shreeem

    Hi
    If a workbook contains multiple queries that use the same variable, you are prompted to enter the variable values again for each query. To avoid this, set the Display Duplicate Variables Only Once flag.
    Goto Workbook Settings>Under Variables Tab>select Display Duplicate Variables only Once
    http://help.sap.com/saphelp_nw70ehp1/helpdata/EN/54/a493f7256b43698191a2623e5a0532/frameset.htm
    Hope this helps,
    Aparna Duvvuri

  • How to write selection-screen block on 15th position?

    Hello all,
    I want to write selection-screen block on 15th position, How can I do this?
    I know that we can write parameter/select-option on perticuler position using following code.
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE t7.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN POSITION 15.
    PARAMETERS: fdat LIKE SY-DATUM,
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK b1.
    It writes parameter(FDAT) on 15th position. How can I write whole block on 15th position?

    Hi,
    For this u have to use comment lines. See the below simple program...
    SELECTION-SCREEN COMMENT /2(50) TEXT-001 MODIF ID SC1.
    SELECTION-SCREEN SKIP 2.
    SELECTION-SCREEN COMMENT /10(30) COMM1.
    SELECTION-SCREEN ULINE.
    PARAMETERS: R1 RADIOBUTTON GROUP RAD1,
    R2 RADIOBUTTON GROUP RAD1,
    R3 RADIOBUTTON GROUP RAD1.
    SELECTION-SCREEN ULINE /1(50).
    SELECTION-SCREEN COMMENT /10(30) COMM2.
    SELECTION-SCREEN ULINE.
    PARAMETERS: S1 RADIOBUTTON GROUP RAD2,
    S2 RADIOBUTTON GROUP RAD2,
    S3 RADIOBUTTON GROUP RAD2.
    SELECTION-SCREEN ULINE /1(50).
    INITIALIZATION.
    COMM1 ='Radio Button Group 1'.
    COMM2 ='Radio Button Group 2'.
    LOOP AT SCREEN.
    IF SCREEN-GROUP1 = 'SC1'.
    SCREEN-INTENSIFIED = '1'.
    MODIFY SCREEN.
    ENDIF.
    ENDLOOP.

  • Depndng on chkbox, should display selection screen block on selectionscreen

    Hi,
    Depending upon the chkbox it should display selection screen block on selection screen. 
    If not checked it should display B3 and If checked it should display Block B2 .
    SELECTION-SCREEN BEGIN OF BLOCK B1.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS P_DAT AS CHECKBOX USER-COMMAND FLAG.
    SELECTION-SCREEN COMMENT 3(79) text-112.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK B1.
    SELECTION-SCREEN BEGIN OF BLOCK B2 WITH FRAME TITLE TEXT-109.
    PARAMETER:      p_year1   LIKE ce1rh03-gjahr,
                    p_perid1  LIKE ce1rh03-perde.
    SELECTION-SCREEN END OF BLOCK B2.
    SELECTION-SCREEN BEGIN OF BLOCK B3 WITH FRAME TITLE TEXT-109.
    PARAMETER:      p_year    LIKE ce1rh03-gjahr MODIF ID MO1,
                             p_period  LIKE ce1rh03-perde MODIF ID MO1.
    SELECTION-SCREEN END OF BLOCK B3.
    If P_Dat is checked     .... It should display the Block B2 and
    If p_Dat is not checked .... it should display the Block B3
    Any suggestions will be appreciated!
    Regards,
    Kittu

    Hello Kittu,
    You can try this code:
    SELECTION-SCREEN BEGIN OF BLOCK b1.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS p_dat AS CHECKBOX USER-COMMAND flag.
    SELECTION-SCREEN COMMENT 3(79) text-112.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK b1.
    SELECTION-SCREEN BEGIN OF BLOCK b2 WITH FRAME TITLE text-109.
    PARAMETER:      p_year1   TYPE gjahr MODIF ID mo1,
                    p_perid1  TYPE perio MODIF ID mo1.
    SELECTION-SCREEN END OF BLOCK b2.
    SELECTION-SCREEN BEGIN OF BLOCK b3 WITH FRAME TITLE text-110.
    PARAMETER:      p_year    TYPE gjahr MODIF ID mo2,
                    p_period  TYPE perio MODIF ID mo2.
    SELECTION-SCREEN END OF BLOCK b3.
    AT SELECTION-SCREEN OUTPUT.
      LOOP AT SCREEN.
        IF p_dat = 'X' AND screen-group1 = 'MO2'.
          screen-active = '0'.
        ELSEIF p_dat <> 'X' AND screen-group1 = 'MO1'.
          screen-active = '0'.
        ENDIF.
        MODIFY SCREEN.
      ENDLOOP.
    Hope this helps.
    BR,
    Suhas

  • How to place selection screen block adjacent to other block

    hi all,
         I want a selection screen block side by side, is it possible
    without using screen painter, if it is let me know.
    Thanks & Regards
    RK

    Hai RK check the following syntax
    CALL SELECTION-SCREEN dynnr
                          [STARTING AT col1 lin1
                          [ENDING   AT col2 lin2]]
                          [USING SELECTION-SET variant].
    before this you need to create two screens

  • Enable / Disable selection screen block

    Hi, could u pls tell me how do I enable/disable selection screen block written below based on radio button selected??
    Block to be enabled / disabled :
    *----APO Version and RFC destination block
    SELECTION-SCREEN BEGIN OF BLOCK b4 WITH FRAME TITLE text-013.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 01(20) text-e11.    "APO Planning Version
    SELECTION-SCREEN POSITION 29.
    SELECT-OPTIONS s_apover FOR w_version NO INTERVALS.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 01(20) text-e09.    "APO RFC Destination
    SELECTION-SCREEN POSITION 32.
    PARAMETERS  :  p_aporfc LIKE rfcdes-rfcdest.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK b4.
    Radiobuttons :
    Material Type
    SELECTION-SCREEN BEGIN OF BLOCK ss04 WITH FRAME TITLE text-072       .
    PARAMETERS :
         Load only FERTs
           p_FERT  RADIOBUTTON GROUP styp DEFAULT  'X' USER-COMMAND rusr ,
         Load ROH/HALBs
           p_HALB  RADIOBUTTON GROUP styp                                .
    SELECTION-SCREEN END   OF BLOCK ss04                                 .
    Thanx in advance

    Hi
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
    PARAMETERS: pa_file TYPE rlgrap-filename MODIF ID abc,
    pa_lifnr TYPE lfa1-lifnr MODIF ID abc,
    pa_vkorg TYPE vbak-vkorg MODIF ID abc.
    SELECTION-SCREEN END OF BLOCK b1.
    SELECTION-SCREEN BEGIN OF BLOCK b2 WITH FRAME TITLE text-002.
    PARAMETERS: pa_kunnr TYPE vbak-kunnr MODIF ID def.
    SELECT-OPTIONS: s_lifnr FOR gs_lfa1-lifnr MODIF ID def,
    s_date FOR gs_lfa1-erdat MODIF ID def,
    s_augru FOR gs_vbak-augru MODIF ID def,
    s_vbeln FOR gs_vbak-vbeln MODIF ID def.
    SELECTION-SCREEN END OF BLOCK b2.
    SELECTION-SCREEN BEGIN OF BLOCK b3 WITH FRAME TITLE text-003.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS: pa_upd RADIOBUTTON GROUP g1 USER-COMMAND uc01 DEFAULT 'X'."#EC *
    SELECTION-SCREEN COMMENT 3(60) text-004 FOR FIELD pa_upd.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS: pa_rep RADIOBUTTON GROUP g1 ."#EC *
    SELECTION-SCREEN COMMENT 3(60) text-005 FOR FIELD pa_rep.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK b3.
    IF pa_rep EQ gc_x.
    LOOP AT SCREEN.
    IF screen-group1 = gc_abc.
    screen-input = gc_zero_num.
    ELSEIF screen-group1 = gc_def.
    screen-active = gc_one_num.
    ENDIF.
    MODIFY SCREEN.
    ENDLOOP.
    ELSEIF pa_upd EQ gc_x.
    *For Reprocessing
    LOOP AT SCREEN.
    IF screen-group1 = gc_def.
    screen-input = gc_zero_num.
    ELSEIF screen-group1 = gc_abc.
    screen-active = gc_one_num.
    ENDIF.
    MODIFY SCREEN.
    CLEAR pa_upd.
    ENDLOOP.
    ENDIF.
    REPORT zrich_001.
    PARAMETERS: p_rad1 RADIOBUTTON GROUP grp1 DEFAULT 'X'
                            user-command chk,
                p_rad2 RADIOBUTTON GROUP grp1.
    SELECT-OPTIONS: s_datum1 FOR sy-datum MODIF ID d1,
                    s_datum2 FOR sy-datum MODIF ID d2.
    AT SELECTION-SCREEN OUTPUT.
      LOOP AT SCREEN.
        IF p_rad1 = 'X'
          AND screen-group1 = 'D2'.
          screen-active = '0'.
        ENDIF.
        IF p_rad2 = 'X'
         AND screen-group1 = 'D1'.
          screen-active = '0'.
        ENDIF.
        MODIFY SCREEN.
      ENDLOOP.
    Regards
    Anji

  • Selection screen block is invisable when radiobutton is selected

    Hi Experts,
    i am sending the my code...........my requerment is  : Radiobutton(rb_cdr1)   is checked donu2019t show the  Fourth & Sixth block and no output files will be generated in those respective blocks. Only Show option a & b in the Fifth block. If the Radio button in unchecked donu2019t show the options a & b in the Fifth block)
    if Radiobutton(rb_csr1) donu2019t show the  fifth Sixth block . iam try to using loop at scrren and
    IF screen-group1 = 's1'.
       screen-invisible = '0'.
    But it's not working..........plz help me on this........
    file download option for dazel system.
    SELECTION-SCREEN BEGIN OF BLOCK b4 WITH FRAME TITLE text-h04.
    PARAMETERS: rb_dzlcl RADIOBUTTON GROUP gr2 MODIF ID s1,
                rb_dzapp RADIOBUTTON GROUP gr2 MODIF ID s1,
                p_dzfl   TYPE rlgrap-filename.
    SELECTION-SCREEN END OF BLOCK b4.
    SELECTION-SCREEN BEGIN OF BLOCK b7 WITH FRAME TITLE text-h07.
    PARAMETERS: rb_cdr1   RADIOBUTTON GROUP gr5 ,
                rb_csr1  RADIOBUTTON GROUP gr5  .
    SELECTION-SCREEN END OF BLOCK b7.
    Contibution detail report & UNIX File option
    SELECTION-SCREEN BEGIN OF BLOCK b5 WITH FRAME TITLE text-h05.
    PARAMETERS: rb_cdr   RADIOBUTTON GROUP gr3 MODIF ID s1,
                rb_loca  RADIOBUTTON GROUP gr3 MODIF ID s1,
                rb_appl  RADIOBUTTON GROUP gr3 MODIF ID s1,
                p_flnam TYPE rlgrap-filename.
    SELECTION-SCREEN END OF BLOCK b5.
    Contibution Summary report & UNIX File option
    SELECTION-SCREEN BEGIN OF BLOCK b6 WITH FRAME TITLE text-h06.
    PARAMETERS:  rb_csr  RADIOBUTTON GROUP gr4 MODIF ID s2,
                 rb_loc  RADIOBUTTON GROUP gr4 MODIF ID s2,
                 rb_app  RADIOBUTTON GROUP gr4 MODIF ID s2,
                 p_fln TYPE rlgrap-filename.
    SELECTION-SCREEN END OF BLOCK b6.
    Thanks in advance........

    hi !
    try the following one and make some changes that you want
    SELECTION-SCREEN BEGIN OF BLOCK b4 WITH FRAME TITLE text-h04.
    PARAMETERS: rb_dzlcl RADIOBUTTON GROUP gr2 MODIF ID s1,
    rb_dzapp RADIOBUTTON GROUP gr2 MODIF ID s1,
    p_dzfl TYPE rlgrap-filename MODIF ID s1.
    SELECTION-SCREEN END OF BLOCK b4.
    SELECTION-SCREEN BEGIN OF BLOCK b7 WITH FRAME TITLE text-h07.
    PARAMETERS: rb_cdr1 RADIOBUTTON GROUP gr5 MODIF ID s3 ,
    rb_csr1 RADIOBUTTON GROUP gr5 DEFAULT 'X'.
    SELECTION-SCREEN END OF BLOCK b7.
    Contibution detail report & UNIX File option
    SELECTION-SCREEN BEGIN OF BLOCK b5 WITH FRAME TITLE text-h05.
    PARAMETERS: rb_cdr RADIOBUTTON GROUP gr3 MODIF ID s1,
    rb_loca RADIOBUTTON GROUP gr3," MODIF ID s1,
    rb_appl RADIOBUTTON GROUP gr3," MODIF ID s1,
    p_flnam TYPE rlgrap-filename MODIF ID s1.
    SELECTION-SCREEN END OF BLOCK b5.
    Contibution Summary report & UNIX File option
    SELECTION-SCREEN BEGIN OF BLOCK b6 WITH FRAME TITLE text-h06.
    PARAMETERS: rb_csr RADIOBUTTON GROUP gr4 MODIF ID s2,
    rb_loc RADIOBUTTON GROUP gr4 MODIF ID s2,
    rb_app RADIOBUTTON GROUP gr4 MODIF ID s2,
    p_fln TYPE rlgrap-filename MODIF ID s2.
    SELECTION-SCREEN END OF BLOCK b6.
    AT SELECTION-SCREEN OUTPUT.
    LOOP AT SCREEN.
    IF screen-group1 = 'S2' or
       screen-group1 = 'S1'.
      IF rb_csr1 = 'X'.
        screen-active = 0.
      ELSEIF rb_cdr1 = 'X' .
         screen-active = 1.
      ENDIF.
    ELSEIF screen-group1 = 'S3'.
      IF rb_cdr1 eq 'X'.
        screen-active = 1.
      ELSEIF rb_csr1 = 'X' .
         screen-active = 1.
      ENDIF.
    ENDIF.
    MODIFY SCREEN.
    ENDLOOP.

  • Selection-screen block disappearing

    Hi All ,
    Can any one tell me how can i make a block in the selection screen invisible . rt now i am using the below code for selection screen ,
    SELECTION-SCREEN BEGIN OF BLOCK BLK1 WITH FRAME TITLE TEXT-001.
    PARAMETERS: P_SALE RADIOBUTTON GROUP GRP DEFAULT 'X',
                P_BILL RADIOBUTTON GROUP GRP .
    SELECTION-SCREEN END OF BLOCK BLK1.
    SELECTION-SCREEN BEGIN OF BLOCK BLK2 WITH FRAME TITLE TEXT-002.
    PARAMETERS MODIF ID SAL.
    SELECT-OPTIONS: S_vkorg for TVKO-VKORG obligatory MODIF ID SAL,
                    S_VTWEG for TVTW-VTWEG obligatory MODIF ID SAL,
                    S_SPART for TSPA-SPART obligatory MODIF ID SAL.
    SELECTION-SCREEN END OF BLOCK BLK2.
    SELECTION-SCREEN BEGIN OF BLOCK BLK3 WITH FRAME TITLE TEXT-003.
    SELECT-OPTIONS: S_vkorg1 for TVKO-VKORG obligatory MODIF ID BIL,
                    S_VTWEG1 for TVTW-VTWEG obligatory MODIF ID BIL,
                    S_SPART1 for TSPA-SPART obligatory MODIF ID BIL,
                    S_FKDAT for VBRK-FKDAT obligatory MODIF ID BIL.
    SELECTION-SCREEN END OF BLOCK BLK3.
    my requirement is , when i select the RB P_SALE the BLK3 have to be invisible and when i select the RB P_BILL BLK2 have to be invisible .
    Thanks & Regards ,
    Sabu.

    Hi,
    you have to do little modification to your selection scree.
    yse the following logic which i have used.
    *selection-screen begin of block blk11 with frame title text-002.
    *parameters : so_plant radiobutton group a USER-COMMAND fcod MODIF ID m1 DEFAULT 'X'.
    *parameters : so_ven   radiobutton group a MODIF ID m1 .
    *parameters : so_cust  radiobutton group a MODIF ID m1.
    *selection-screen end of block blk11.
    *at selection-screen OUTPUT .
    PERFORM chng_screen.
    *AT SELECTION-SCREEN.
    LOOP AT SCREEN.
       IF screen-group1 = 'M2'.
          IF screen-input NE '1'.
            v_flag = 'X'.
          ELSE.
            clear v_flag.
          ENDIF.
       ENDIF.
    endloop.
    *form chng_screen.
    *LOOP AT  SCREEN.
    if so_plant = 'X'.
      IF screen-group1 = 'M3'.
         screen-input = space.
         screen-active = 0.
         modify screen.
      ELSEIF  screen-group1 = 'M2'.
         screen-input = 1.
         screen-active = 1.
         modify screen.
      ELSEIF screen-group1 = 'M4'.
         screen-input = 1.
         screen-active = 0.
         modify screen.
       ENDIF.
    ELSEIF SO_VEN = 'X'.
      IF screen-group1 = 'M2'.
         screen-input = space.
         screen-active = 0.
         modify screen.
      elseif screen-group1 = 'M3'.
         screen-input = 1.
         screen-active = 1.
         modify screen.
      ELSEIF screen-group1 = 'M4'.
         screen-input = 1.
         screen-active = 0.
         modify screen.
       ENDIF.
    ELSEIF SO_CUST = 'X'.
       IF screen-group1 = 'M2'.
         screen-input = space.
         screen-active = 0.
         modify screen.
      ELSEIF screen-group1 = 'M3'.
         screen-input = 1.
        screen-active = 0.
         modify screen.
      ELSEIF screen-group1 = 'M4'.
         screen-input = 1.
        screen-active = 1.
         modify screen.
       ENDIF.
    ENDIF.
    *ENDLOOP.
    *endform.

  • Can I define a vertical SELECTION-SCREEN block ?

    Hi, I started getting to know the SELECTION-SCREEN statements now, I was wondering if there's a way to define a vertical screen block instead of an horizontal one.
    Also, can I set the size of a given block ? Let's say I don't want it to extend to the right margin of the screen. Can I limit it to the middle, for instance ?
    Here's a code excerpt so you can understand a little what I'm intending to do (I want to place the operators vertically on the screen).
    SELECTION-SCREEN BEGIN OF BLOCK BOX1 WITH FRAME TITLE S_TBOX1.
      SELECTION-SCREEN BEGIN OF LINE.
        SELECTION-SCREEN COMMENT 20(10) S_COMM.
      SELECTION-SCREEN END OF LINE.
      SELECTION-SCREEN BEGIN OF BLOCK BOX2 WITH FRAME TITLE S_TBOX2.
        SELECTION-SCREEN BEGIN OF LINE.
          SELECTION-SCREEN PUSHBUTTON (3) S_PB1 USER-COMMAND 'XXX'.
          SELECTION-SCREEN PUSHBUTTON (3) S_PB2 USER-COMMAND 'XXX'.
          SELECTION-SCREEN PUSHBUTTON (3) S_PB3 USER-COMMAND 'XXX'.
          SELECTION-SCREEN PUSHBUTTON (3) S_PB4 USER-COMMAND 'XXX'.
        SELECTION-SCREEN END OF LINE.
      SELECTION-SCREEN END OF BLOCK BOX2.
      SELECTION-SCREEN BEGIN OF LINE.
        SELECTION-SCREEN PUSHBUTTON (3) S_PB5 USER-COMMAND 'XXX'.
      SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK BOX1.
    INITIALIZATION.
      S_COMM = 'CALCULATOR'.

    Ok, I thought of that but... now I need the answer for the 2nd question I posted: is it possible to limit the extension of the block, so it ends right after the 4 buttons column ?
    SELECTION-SCREEN BEGIN OF BLOCK BOX1 WITH FRAME TITLE S_TBOX1.
      SELECTION-SCREEN BEGIN OF LINE.
        SELECTION-SCREEN COMMENT 20(10) S_COMM.
      SELECTION-SCREEN END OF LINE.
      SELECTION-SCREEN BEGIN OF BLOCK BOX2 WITH FRAME TITLE S_TBOX2.
        SELECTION-SCREEN BEGIN OF LINE.
          SELECTION-SCREEN PUSHBUTTON (3) S_PB1 USER-COMMAND 'XXX'.
        SELECTION-SCREEN END OF LINE.
        SELECTION-SCREEN SKIP.
        SELECTION-SCREEN BEGIN OF LINE. 
          SELECTION-SCREEN PUSHBUTTON (3) S_PB2 USER-COMMAND 'XXX'.
        SELECTION-SCREEN END OF LINE. 
        SELECTION-SCREEN SKIP.
        SELECTION-SCREEN BEGIN OF LINE. 
          SELECTION-SCREEN PUSHBUTTON (3) S_PB3 USER-COMMAND 'XXX'.
        SELECTION-SCREEN END OF LINE. 
        SELECTION-SCREEN SKIP.
        SELECTION-SCREEN BEGIN OF LINE.
          SELECTION-SCREEN PUSHBUTTON (3) S_PB4 USER-COMMAND 'XXX'.
        SELECTION-SCREEN END OF LINE.
      SELECTION-SCREEN END OF BLOCK BOX2.
      SELECTION-SCREEN BEGIN OF LINE.
        SELECTION-SCREEN PUSHBUTTON (3) S_PB5 USER-COMMAND 'XXX'.
      SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK BOX1.
    INITIALIZATION.
      S_COMM = 'CALCULATOR'.

  • How to make the Selection Screen fields Invisible..?

    Hi All,
    I have a selection screen in which I have 2 Radio Buttons and 2 Blocks(with input fields).
    The requirement is when the Radiobutton1 is selected, it should display the BLOCK1 and the BLOCK2 should be Invisible. The same way, when the Radiobutton2 is selected, it should display the BLOCK2 and the BLOCK1 should be Invisible.
    Could someone help me how to do this. Please share your valuable inputs. If anyone has some sample code, that would be greatful.
    Thanks in advance.
    Thanks & Regards,
    Paddu.

    Please search the forum. This question has been asked and answered many times before.
    Rob

  • Nested Selection Screen Blocks

    Hi friends,
    My requirement is to display the two nested blocks in the selection screen and the radio button parameters defined should come in a single group.
    as below........
    !   Begin Block1      
    !        * Radio  Button 1!
    !  Begin  Block2                                        
    !          * Radio  Button 2                                                      ! 
    !          * Radio  Button 3                                                      !
    !         * Radio  Button 4                                                       !
    !   End Block2                                                                     !
    !       End Block 1                                                                 !
             My Requirement is all Radio Buttons 1 2 3 & 4 should be under one group only. I just need nested frames as shown above
    Thanks & Regards,
    Kumar.

    Hi,
    In one group you can not declare only one radio button, you need atleast two radio button for a group.
    if there is a single radio button only, then better you make it as check box.
    Nesting of blocks is possible.
    you can do that.
    In one block there should be atleast two radio button for using Group.
    regards,
    Ruchika
    Reward if useful................

  • Regarding one selection screen

    hi,
    i have 4 radio buttons in my selection screen.
    ex 1,2,3,4.
    i want to click if 1 , then 3 should automatically active state,
    same when i click radiobutton 2, 4 will come.
    how to do this ....???
    please help,
    yours regards
    subhasis

    Hi
    If your radio buttons is in the same group then u cant do this. Because in one group u can select only one radio button at any time.
    If first 2 are in group1 and last 2 are in group2 then U can do like this. Copy paste this code in ur system and check the functionality.
    SELECTION-SCREEN: BEGIN OF BLOCK B1 WITH FRAME.
    PARAMETER: P_RADIO1 RADIOBUTTON GROUP GRP1 USER-COMMAND ucomm DEFAULT 'X',
    P_RADIO2 RADIOBUTTON GROUP GRP1.
    SELECTION-SCREEN: END OF BLOCK B1.
    SELECTION-SCREEN: BEGIN OF BLOCK B2 WITH FRAME.
    PARAMETER: P_RADIO3 RADIOBUTTON GROUP GRP2 USER-COMMAND ucomm,
    P_RADIO4 RADIOBUTTON GROUP GRP2.
    SELECTION-SCREEN: END OF BLOCK B2.
    AT SELECTION-SCREEN OUTPUT.
    IF p_radio1 EQ 'X'.
    CLEAR: p_radio4.
    p_radio3 = 'X'.
    ELSEIF p_radio2 EQ 'X'.
    CLEAR: p_radio3.
    p_radio4 = 'X'.
    ENDIF.

  • Coloring SELECTION-SCREEN blocks

    How do I manage to change the background color of a block?
    To be precise, of this block:
    SELECTION-SCREEN BEGIN OF BLOCK b002 WITH FRAME.
    SELECT-OPTIONS: so_lp FOR lqua-lgpla.
    PARAMETERS: pa_matnr LIKE lqua-matnr.
    SELECTION-SCREEN END OF BLOCK b002.
    Thanks.

    u cannot apply colors at selection-screen level, i believe.But u can make the fields look intensified, invisible and such sought by looping and changing the screen attributes.
    reward if helpful
    kiran

  • To create a variant for a selection screen having invisible fields

    Hello All
    I am facing a peculiar problem. I have a screen for the program RSEIDOCB in which the following fields are hidden:
                    TAOUTPR FOR EDIDC-STATUS NO-DISPLAY,
                    STAINPR  FOR EDIDC-STATUS NO-DISPLAY,
                    STAOUTRS FOR EDIDC-STATUS NO-DISPLAY,
                    STAINTA  FOR EDIDC-STATUS NO-DISPLAY,
                    STAOUTES FOR EDIDC-STATUS NO-DISPLAY,
                    STAINTD  FOR EDIDC-STATUS NO-DISPLAY,
                    STAOUTST FOR EDIDC-STATUS NO-DISPLAY,
                    STAOUTDT FOR EDIDC-STATUS NO-DISPLAY,
                    STAINBK  FOR EDIDC-STATUS NO-DISPLAY,
                    STAOUTEI FOR EDIDC-STATUS NO-DISPLAY,
                    STAINEI  FOR EDIDC-STATUS NO-DISPLAY,
                    STAOUTEX FOR EDIDC-STATUS NO-DISPLAY,
                    STAINEA  FOR EDIDC-STATUS NO-DISPLAY,
                    STAOUTDS FOR EDIDC-STATUS NO-DISPLAY,
                    STAINDS  FOR EDIDC-STATUS NO-DISPLAY.
    I want to create a variant for the above program having values for the fields. These fields are basically for specifying the various status of the idocs. I am unable to do to so at the moment. Please help me out. Suitable points will be provided.
    Regards
    Ankit

    Hi Ankit
    Follow these steps..
    1. in SE38 enter Program name 'RSEIDOCB'.
    2. Click on variants button
    3. enter variant name click on create
    4. in selection screen enter default values
    5. Click on attributes
    4. Enter meaning
    5. Press Shft + F4
    6. Bottom of Screen will popup invisible fields
    7. go down to screen
    8. select field and click on selection variables button
       (you to have to tick selection variable check box)
    9. here click on down arrow button very next to field
    10.you can choose values from list and assign to field.
    then save variant.
    Message was edited by:
            Perez C

Maybe you are looking for