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.

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.

  • 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.

  • Hiding the selection screen blocks

    Hello SDNers,
    This is my scenario.
    I need to have 2 selection screens ie b1 and b2.
    initially b2 should be hidden and  when i make a selection on b1 the block b2 should be displayed.
    Eg :
    selection-screen begin of block B1.
    parmeter : r_cust radiobutton group grp1,
                   r_ven t radiobutton group grp1.
    selection-screen end of block B1.
    selection-screen begin of block B2.
    parmeter : r_cret radiobutton group grp2,
                   r_chg radiobutton group grp2,
                   r_disp radiobutton group grp2,
    selection-screen end of block B2.
    Is this possible if yes please paste a sample snippet for understanding.
    Help would be highly appreciated and rewarded.
    Thanks in advance
    Regards,
    Ranjith N

    Hi...
    Please check the code...
    It will solve your problem
    selection-screen: begin of block c1 with frame title text-001.
    selection-screen skip.
    parameter: p_singl type char01 radiobutton group rsel
                       default 'X' user-command s_per,    " Single record
               p_mult  type char01 radiobutton group rsel." Multiple recrd
    selection-screen: end of block c1.
    selection-screen: begin of block c2 with frame title text-001.
    selection-screen skip.
    parameter: p_matnr  type matnr       modif id m1, " KMAT
               p_atwrt  type zcatnum     modif id m1, " Catalog string
               p_sr_des type atwrt       modif id m1. " Series Designator
    selection-screen: end of block c2.
    selection-screen: begin of block c3 with frame title text-001.
    selection-screen skip.
    PARAMETER: p_pc     radiobutton group err user-command ucomm
                                         modif id m4, " Presentation server
               p_server  radiobutton group err default 'X'
                                         modif id m4, " Application server
               p_f_pc   type localfile   modif id m3, " PC file name
               p_fname  type localfile   modif id m2. " Apltn srvr file path
    selection-screen: end of block c3.
    at selection-screen output.
    Design selection parameters dynamically
      perform sub_set_file_param.
      form sub_set_file_param .
      loop at screen.
      If single record is checked
        if p_singl is not initial.
          if screen-group1 = 'M2' or
             screen-group1 = 'M3' or
             screen-group1 = 'M4'.
            screen-active = 0.
          endif.
      If multiple record and application server is checked
        elseif p_mult is not initial and
               p_server is not initial.
          if screen-group1 = 'M1' or
            screen-group1 = 'M3' .
            screen-active = 0.
          endif.
      If multiple record and presentation server is checked
        elseif p_mult is not initial and
               p_pc   is not initial.
          if screen-group1 = 'M1' or
            screen-group1 = 'M2' .
            screen-active = 0.
          endif.
        endif.
    Modify the screen
        modify screen.
      endloop.
    endform.                    " sub_set_file_param
    Thanks
    Subhankar

  • 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.

  • 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.

  • 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

  • Place two selection screen BLOCKS  beside each other

    I want to place 2 selectio-screen blocks side by side instead of 1 below other.
    How to do that .?
    Please help.

    Just copy and paste and give the text elements with some texts.
    selection-screen begin of line.
      parameters session radiobutton group ctu.  "create session
      selection-screen comment 3(20) text-s07 for field session.
      selection-screen position 45.
      parameters ctu radiobutton group  ctu.     "call transaction
      selection-screen comment 48(20) text-s08 for field ctu.
    selection-screen end of line.
    selection-screen begin of line.
      selection-screen comment 3(20) text-s01 for field group.
      selection-screen position 25.
      parameters group(12).                      "group name of session
      selection-screen comment 48(20) text-s05 for field ctumode.
      selection-screen position 70.
      parameters ctumode like ctu_params-dismode default 'N'.
                                          "A: show all dynpros
                                          "E: show dynpro on error only
                                          "N: do not display dynpro
    selection-screen end of line.
    selection-screen begin of line.
      selection-screen comment 3(20) text-s02 for field user.
      selection-screen position 25.
      parameters: user(12) default sy-uname.     "user for session in batch
      selection-screen comment 48(20) text-s06 for field cupdate.
      selection-screen position 70.
      parameters cupdate like ctu_params-updmode default 'L'.
                                          "S: synchronously
                                          "A: asynchronously
                                          "L: local
    selection-screen end of line.
    selection-screen begin of line.
      selection-screen comment 3(20) text-s03 for field keep.
      selection-screen position 25.
      parameters: keep as checkbox.       "' ' = delete session if finished
                                          "'X' = keep   session if finished
      selection-screen comment 48(20) text-s09 for field e_group.
      selection-screen position 70.
      parameters e_group(12).             "group name of error-session
    selection-screen end of line.
    selection-screen begin of line.
      selection-screen comment 3(20) text-s04 for field holddate.
      selection-screen position 25.
      parameters: holddate like sy-datum.
      selection-screen comment 51(17) text-s02 for field e_user.
      selection-screen position 70.
      parameters: e_user(12) default sy-uname.    "user for error-session
    selection-screen end of line.
    selection-screen begin of line.
      selection-screen comment 51(17) text-s03 for field e_keep.
      selection-screen position 70.
      parameters: e_keep as checkbox.     "' ' = delete session if finished
                                          "'X' = keep   session if finished
    selection-screen end of line.
    selection-screen begin of line.
      selection-screen comment 51(17) text-s04 for field e_hdate.
      selection-screen position 70.
      parameters: e_hdate like sy-datum.
    selection-screen end of line.
    selection-screen skip.
    selection-screen begin of line.
      selection-screen comment 1(33) text-s10 for field nodata.
      parameters: nodata default '/' lower case.          "nodata
    selection-screen end of line.
    selection-screen begin of line.
      selection-screen comment 1(33) for field smalllog.
      parameters: smalllog as checkbox.  "' ' = log all transactions
                                         "'X' = no transaction logging
    selection-screen end of line.
    Regards
    Gopi

  • 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

  • Selection screen modification based on various buttons in selection screen

    Hi,
    I have 1 query related with Selection screen modification.
    In my Report Program,I have created GUI Status for my selection screen
    Now 2 buttons in application toolbar are coming on selection sceen.
    For this i used,'At selection screen output' event.
    And there are 2 blocks on selection screen.
    If user press button1 then block2 should not display.
    and if user press button2 then block1 should not display.
    but the problem is i m not getting reqd result and also while doing debugging its not showing me sy-ucomm value.
    Any pointers on this.
    Thanks,
    Mamta

    Hi Mamta,
       have it in a group then you can write code accordingly see sample example,
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS       : p_r1 RADIOBUTTON GROUP rad
                            USER-COMMAND clk DEFAULT 'X'.            " upload Radio Button
    SELECTION-SCREEN COMMENT 5(35) text-003.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN : BEGIN OF BLOCK 001 WITH FRAME TITLE text-001.
    PARAMETERS: p_upl       LIKE rlgrap-filename MODIF ID a           "Upload File
                             DEFAULT 'c:\temp\parbmat.xls',
                p_werks     like t001w-werks MODIF ID a,              "Plant
    PARAMETERS: p_rest      LIKE rlgrap-filename MODIF ID a           "Dwonload File Path
                             DEFAULT 'c:\temp\Success.xls'.
    SELECTION-SCREEN : END OF BLOCK 001.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS : p_r2 RADIOBUTTON GROUP rad.
    SELECTION-SCREEN COMMENT 5(35) text-004.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN : BEGIN OF BLOCK 002 WITH FRAME TITLE text-002.
    PARAMETERS     : p_plant  LIKE marc-werks MODIF ID b.                "Plant
    PARAMETERS     : p_lgort  LIKE mard-lgort MODIF ID b.                "Storage Location
    PARAMETERS     : p_vkorg  LIKE mvke-vkorg MODIF ID b.                "Sales Organization
    PARAMETERS     : p_vtweg  LIKE mvke-vtweg MODIF ID b.                "Distribution Channel
    SELECT-OPTIONS : s_mat FOR  mara-matnr MODIF ID b.                  "Material No No
    SELECT-OPTIONS : s_dat FOR  mara-ersda MODIF ID b.                  "Date on Record Created
    PARAMETERS     : p_down LIKE rlgrap-filename MODIF ID b
                      DEFAULT 'c:\temp\Material Master.xls'.           "Download File Path
    SELECTION-SCREEN : END OF BLOCK 002.
    AT SELECTION-SCREEN OUTPUT.
    *Inactive Fields depending on the radio button
      LOOP AT SCREEN.
        IF p_r1 = 'X'.
          IF screen-group1 = 'B'.
            screen-active = 0.
          ENDIF.
        ELSEIF p_r2 = 'X'.
          IF screen-group1 = 'A'.
            screen-active = 0.
          ENDIF.
        ENDIF.
        MODIFY SCREEN.
      ENDLOOP.
    Edited by: suresh suresh on Jul 28, 2009 12:42 PM
    Edited by: suresh suresh on Jul 28, 2009 12:42 PM

  • Regarding hiding Selection screen block

    hi all ,
    i have 2 blocks in the selection screen. the First block has 4 radiobuttons and the second block has 4 parameters.
    i need to hide the block 2 based on the radiobutton checked in the initail block.
    if radiobutton 1 or 2 is selected then the block should not be visible and if the rdbtn 3 or 4 is selected the block should be visible
    i have wriiten the code but it doesn't work at all. the block is hidden but when i select the radiobtn 3 or 4 it doesn't work
    the code i hve wriiten is as follows
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
    PARAMETERS: par1 RADIOBUTTON GROUP rg2 DEFAULT 'X' USER-COMMAND ucom1
    PARAMETERS: par2 RADIOBUTTON GROUP rg2 .
    PARAMETERS: par3 RADIOBUTTON GROUP rg2 .
    PARAMETERS: par4 RADIOBUTTON GROUP rg2
    SELECTION-SCREEN END OF BLOCK b1.
    SELECTION-SCREEN BEGIN OF BLOCK a1 WITH FRAME TITLE text-001.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETER p_pwwrk TYPE plaf-pwwrk  MODIF ID FSC.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    PARAMETERS p_wch TYPE cr_hname MODIF ID FSC.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECT-OPTIONS s_mdv01 FOR g_mdv01 MODIF ID FSC.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK a1.
    I have declared this  after Initialization.
    AT SELECTION-SCREEN OUTPUT.
    if par3 eq 'X' or par4 eq 'X'.
    LOOP AT SCREEN.
    IF screen-group1 = 'FSC'.
    screen-active = 0.
    MODIFY SCREEN.
    ENDIF.
    ENDLOOP.
    endif.
    can anybody please suggest.
    Thanx
    Srinivas

    Hiding Input Fields Locate the document in its SAP Library structure
    To suppress the display of the input field on the selection screen, you use the following syntax:
    PARAMETERS p ...... NO-DISPLAY ......
    Although parameter p is declared, it is not displayed on the selection screen.
    If the parameter belongs to the standard selection screen, you can assign a value to it either by using the DEFAULT addition when you declare it, or during the INITIALIZATION event. If you call the executable program using the SUBMIT statement, the calling program can also pass the value.
    When you use user-defined selection screens, you can assign a value to the parameter at any time before calling the selection screen.
    If you want to display a parameter only in certain cases, for example, depending on the values entered by the user in other input fields of the selection screen, you cannot use the NO-DISPLAY addition. If you use NO-DISPLAY, the parameter actually is an element of the interface for program calls, but not an element of the selection screen. As a result, you cannot make it visible using the MODIFY SCREEN statement.
    To hide a parameter that is an element of the selection screen, you must declare it without the NO-DISPLAY addition and suppress its display using the MODIFY SCREEN statement.
    We can Hide parameter / select option in selection screen dynamically by manipulating screen object.
    SCREEN is like an internal table with a header line. However, you do not have to declare it in your program. Go to debugging mode and then view structure of screen.
    You can modify SCREEN in your ABAP program during the PBO event of a screen. Its contents override the static attributes of the screen fields for a single screen call. The only statements that you can use with SCREEN are:
    LOOP AT SCREEN.
    MODIFY SCREEN.
    ENDLOOP.
    We can hide parameter by set screen-active to 0.
    Here is example of how to hide parameter in selection screen. Write it, and change click on radiobutton to hide parameter.
        REPORT ZAALGAL0006.
        DATA: d_ucomm LIKE sy-ucomm.
        PARAMETERS: p_grpa1(10) MODIF ID A,
        p_grpa2(5) MODIF ID A,
        p_grpb1(2) MODIF ID B.
        PARAMETERS: p_actA RADIOBUTTON GROUP rad1 USER-COMMAND ACT DEFAULT 'X',
        p_actB RADIOBUTTON GROUP rad1.
        AT SELECTION-SCREEN.
        d_ucomm = sy-ucomm.
        AT SELECTION-SCREEN OUTPUT.
        LOOP AT screen.
        IF p_actA = 'X'.
        IF screen-group1 = 'B'.
        screen-active = 0.
        ENDIF.
        ELSEIF p_actB = 'X'.
        IF screen-group1 = 'A'.
        screen-active = 0.
        ENDIF.
        ENDIF.
        MODIFY screen.
        ENDLOOP.
        START-OF-SELECTION.
    regards,
    srinivas
    <b>*reward for useful answers*</b>

  • Selection screen - Block Size

    hi all
    1.how to set a Block size inside the selection screen .
    2.how to set a short cut key for a push button.
    3.how to set a icon for a push button.
    Kindly clarify.
    with kind regards
    vel

    Hello,
    Try this
    TYPE-POOLS:
    icon.    " For Icon
    1)
    Example.
    SELECTION-SCREEN : BEGIN OF BLOCK b3 WITH FRAME TITLE text-t03.
    PARAMETERS: y_p_cd RADIOBUTTON GROUP rg1.
    SELECTION-SCREEN : END OF BLOCK b4.
    2)
    SELECTION-SCREEN PUSHBUTTON /1(83) push1
                  USER-COMMAND next VISIBLE LENGTH 40.
    Create Expand or Collapse Icon For Currency Selection Field
      CALL FUNCTION 'ICON_CREATE'
        EXPORTING
          name                  = icon_expand
          text                  = text-x22
        IMPORTING
          RESULT                = push1
        EXCEPTIONS
          icon_not_found        = 1
          outputfield_too_short = 2
          OTHERS                = 3.
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE y_k_s NUMBER sy-msgno
                WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
    Click on the ICON so that you will find the name of the ICONS.

  • 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'.

  • Bex selection screen does not appear when running workbook via RRMX.

    Hi Experts,
    I have following problem: When I run a BEx workbook from a user menu (trans. RRMX), I get no selection screen, but just the workbook with text: "no data found". When I press the refresh button (variable change button), the selection screen appears and after that the data are visible in the workbook. When I run the underlying query the selection screen appears normally. With some other workbooks with selections I do not have such a problem.
    Anybody can give me a hint how to get the selection screen diplayed? We are on BI 7.1, Bex SP 10, patch 1.
    Thank you,
    Michal

    Dear Michal,
    Your Question:
    Anybody can give me a hint how to get the selection screen diplayed? We are on BI 7.1, Bex SP 10, patch 1.
    Answer:
    Open the workbook and goto workbook setting from the analyzer design toolbar.
    Check the Refresh workbook on check box.
    So every time the selection screen will be appear after exectuion of the workbook.
    Thanks & Regards,
    Praveen.K

Maybe you are looking for

  • Page looks different in Dreamweave than online...why?

    This is a fairly basic question, but it's driving me nuts! When I look at my menu in dreamweaver, it looks like this: But when it's live it looks normal, like this: Does anyone know why that happens? I think it has something to do with the position:

  • PR source assign with validy of info record

    Hi, I have the below requirements. When ever I run the MR57 program system should assign the source with current validity in the info record. Where I do the step. I thing we have to do in user exit ME57 correct. Pl advice. Regards, kumar

  • Macbook Pro 13" and Logic!

    Hello, I am planning to buy the 2011 macbook pro 13 with i5 processor in july 2011 when it comes with the latest OSX Lion. so my question is will I be able to use the latest Logic express or Logic studio software properly and smoothly without any pro

  • Javascript confirm() with Yes/No?

    Is it possible to get "Yes" and "No" for the two buttons rather than "OK" and "Cancel"? Murray --- ICQ 71997575 Adobe Community Expert (If you *MUST* email me, don't LAUGH when you do so!) ================== http://www.projectseven.com/go - DW FAQs,

  • SharePoint 2013 ListView GroupBy SpURL field

    I am doing GroupBy Url Field in SharePoint (2013 Enterprise Edition) view. I have set 5  for group limits to return, and item limit to 1. Though there are more than 5 groups in list I can see less than 5 groups in view. After bit of analysis I found