ALV Output Screen ..........

Hi Experts,
In ALV report for FM  we use PF_STATUS_SET.
  CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
    EXPORTING
      i_callback_pf_status_set = 'PF_STATUS_SET'
For each time we have to go in se41 and copy the standard screen full screen for :
FORM pf_status_set USING extab TYPE slis_t_extab.
  SET PF-STATUS 'STD' EXCLUDING extab.
ENDFORM.                    "pf_status_set
Is there any standard procedure to do this in ALV without copy screen in se41 each time?
Yusuf

Hi,
I think you want the program can use a default status bar with out creating threw se41
then use the syntax-
SET PF_STATUS  SPACE.
here there is no need to create threw se41 i think.
Edited by: vijay Mekala on Jan 2, 2008 8:26 AM
Edited by: vijay Mekala on Jan 2, 2008 8:27 AM
Edited by: vijay Mekala on Jan 2, 2008 8:29 AM

Similar Messages

  • Avoid ALV output screen in submit statement

    hello,
    I have created one FM.in that FM i am calling one zreport using submit statement as i want to access that zreport's internal table.so i have done that using IMPORT and EXPORT statement and i am getting values in my FM.
    but my problem is when i execute that FM it stops and display the ALV output of zreport and then when i press back button it gives me FM's output.i dont want that ALV output.can anybody help me that how to omit this output screen?
    regards
    soniya s.

    Hi,
    Use option EXPORTING LIST TO MEMORY with statement SUBMIT.
    Regards,
    Nikhil
    Edited by: Nikhil Kayal on May 13, 2009 1:32 PM

  • Change in the ALV Output Screen field

    Dear All,
    How can I change or Edit the output apperared in the ALV report.
    My requirement is that,
    Consider Report have given Output in ALV  as 213.00 in quantity field that I want to change at run time manualy as per my requirement.
    Pls. Suggest.
    Aniruddha

    Dear Sir,
    I AM CALLING THIS SUBROUTINE IN FOLLOWING SEQUENCE...AND I WANT MY QUANTITY FIELD SHOULD BE EDITABLE IN RUNTIME .PLZ SOLVE MY PROBLEM.
    PERFORM top_of_page.
    PERFORM fieldcat_init USING gt_fieldcat[].
    PERFORM sub_comment_build USING t_list_top_of_page.
    PERFORM ALV .
    FORM fieldcat_init  USING    rt_fieldcat TYPE slis_t_fieldcat_alv.
      DATA: ls_fieldcat TYPE slis_fieldcat_alv.
      DATA: pos TYPE i VALUE 1.
      CLEAR ls_fieldcat.
      pos = pos + 1.
      lCLEAR ls_fieldcat.
       pos = pos + 1.
      ls_fieldcat-col_pos   =  pos.
      ls_fieldcat-fieldname = 'GSMNG'.
      ls_fieldcat-seltext_m = 'QUANTITY'.
      ls_fieldcat-tabname   = 'MATRIX1'.
      ls_fieldcat-outputlen = 18.
      ls_fieldcat-EDIT = 'A'.
      APPEND ls_fieldcat TO  rt_fieldcat.
    FORM ALV .
    call function 'REUSE_ALV_GRID_DISPLAY'
    EXPORTING
      I_INTERFACE_CHECK                 = ' '
      I_BYPASSING_BUFFER                = ' '
      I_BUFFER_ACTIVE                   = ' '
       I_CALLBACK_PROGRAM                = sy-repid
      I_CALLBACK_PF_STATUS_SET          = ' '
       I_CALLBACK_USER_COMMAND           =
       I_CALLBACK_TOP_OF_PAGE            = 'TOP_OF_PAGE '
      I_CALLBACK_HTML_TOP_OF_PAGE       = ' '
      I_CALLBACK_HTML_END_OF_LIST       = ' '
      I_STRUCTURE_NAME                  =
      I_BACKGROUND_ID                   = ' '
      I_GRID_TITLE                      =
      I_GRID_SETTINGS                   =
      IS_LAYOUT                         =
       IT_FIELDCAT                       = gt_fieldcat[]
    IT_EXCLUDING                      =
      IT_SPECIAL_GROUPS                 =
      IT_SORT                           =
      IT_FILTER                         =
      IS_SEL_HIDE                       =
      I_DEFAULT                         = 'X'
      I_SAVE                            = 'A'
      IS_VARIANT                        =
      IT_EVENTS                         =
      IT_EVENT_EXIT                     =
      IS_PRINT                          =
      IS_REPREP_ID                      =
      I_SCREEN_START_COLUMN             = 0
      I_SCREEN_START_LINE               = 0
      I_SCREEN_END_COLUMN               = 0
      I_SCREEN_END_LINE                 = 0
      I_HTML_HEIGHT_TOP                 = 0
      I_HTML_HEIGHT_END                 = 0
      IT_ALV_GRAPHICS                   =
      IT_HYPERLINK                      =
      IT_ADD_FIELDCAT                   =
      IT_EXCEPT_QINFO                   =
      IR_SALV_FULLSCREEN_ADAPTER        =
    IMPORTING
      E_EXIT_CAUSED_BY_CALLER           =
      ES_EXIT_CAUSED_BY_USER            =
      tables
        T_OUTTAB                          = matrix1
    EXCEPTIONS
       PROGRAM_ERROR                     = 1
       OTHERS                            = 2
    if SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    endif.
    Pls. suggest the changes inthe above coding
    Thanking you in anticipation
    Aniruddha

  • How to change the Grid ALV output resolution according to screen

    Hi All,
    I have a requirement in which I have to adjust the Grid ALV Output Screen resolution according to user screen. I mean if the user has any type of  screen (17'' , 15'', 12.1'' ),  the output should be completely fit to his screen.
    Helpful solution will definitely be rewared.
    Amit Varlani

    Hi!
    I doesn't depends on the screen size only the desktop resolution.
    If the desktop resolution is set to 1024*768 on every computer, then it will be the same all the time.
    You can set the desktop resolution in your windows (right click on desktop - properties - settings).
    Regards
    Tamá

  • How we can add the 2 buttons on the alv out screen.

    I have a requirement, i want to add two buttons on the application bar on the ALV report out.
    with the use of grid functional module.
    for example: i want to buttons details and balance on the ALV output screen. if i click on detail it will display the details and if i click on balance it will show the balance data in report.
    and if i use the back and exit that time it will come out the selection screen.
    please send me any exiting report its very urgent.

    Hi frnd,
    To add additional button in the application toolbar,
    First copy the std toolbar from std sap program,
    In se 41 give
    program name = SAPLKKBL
    copy staus.
    Use own status (Copy STANDARD from SAPLKKBL)
      SET PF-STATUS 'STANDARD_NEW' .(in this new user defined status add ur buttons)
    steps:
    then in the ''REUSE_ALV_GRID_DISPLAY' function module
      CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
           EXPORTING
                i_callback_program       = gv_repid
                i_callback_user_command  = EVENT_USER_COMMAND
                i_callback_pf_status_set = EVENT_SET_STATUS_01
                i_grid_title             = gc_tit
                is_layout                = gt_layout
                it_fieldcat              = gt_fieldcat[]
           TABLES
                t_outtab                 = gt_lfa1
           EXCEPTIONS
                program_error            = 1
                OTHERS                   = 2.
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
    FORM     event_set_status_01  USING  lt_excl  TYPE  slis_t_extab.
    Use own status (Copy STANDARD from SAPLKKBL)
      SET PF-STATUS 'STANDARD' .
    ENDFORM.                    "EVENT_SET_STATUS_01
    *& Form Name:  event_user_command                                      *
    *& Form Desc:  For Handling USER_COMMAND                               *
    FORM     event_user_command  USING
                                        if_ucomm     TYPE  sy-ucomm
                                        is_selfield  TYPE  slis_selfield.
      CASE if_ucomm.
        WHEN 'PRINT'.
      endcase.
    endform

  • ALV Output into Excel problem

    HI ,
    I developed ALV report, the output is coming properly. But if i download that output into local file or spreadsheet from ALV output screen am unable to get the data only header and field headers are coming but data is not coming. But for other ALV with same importing parameters it is downloading properly. I donu2019t know whatu2019s problem only for this ALV, any one can please help me out from this situation pls.
    Thx

    Hi Lavanya
        There can be two possibilities
      1.) check the authorization, if it's missing, then this might happen...u hav said that the other report, it's downloading fine...r u trying to download the other report also with the same user id? is it a standard program or a customized report?
    2.) just try reducing the security level in excel --> Tools -> Macros -> Security
    regards
    Sathish

  • How to get rid of the loop in ALV output from At selection screen event?

    I have several push buttons on a selection screen.
    Clikc on a button, then it pops up an editable ALV report. (This gets triggered AT SELECTION SCREEN event.). REUSE_ALV_GRID_DISPLAY_LVC..
    On the ALV output, I enabled F4 for a couple of fields. Once I click on the F4 button, ONF4 method gets triggerd and a pop up appears with custom search helps.
    choose a line and it fills the cell.
    Upto this it works fine.
    Now I click on the BACK button at the ALV output, it takes me to the selection screen. I click on the button again, it show the editable ALV. Now when I click on the F4 button, the pop up comes up twice and the cell gets filled from the second pop - up.
    How to control this?
    Probably I am not refreshing something?
    (I am using REUSE_ALV_GRID_DISPLAY_LVC and tooks ome code for ONF4 event from BCALV_*DATATYPES (forgot the exact name) program.)
    Thanks,
    Ven

    Hi,
    FORM refresh_grid USING  pw_grid TYPE REF TO cl_gui_alv_grid.
    *Work area
      DATA : wal_stable TYPE lvc_s_stbl.
      CHECK NOT pw_grid IS INITIAL.
      wal_stable-col = c_check.
      wal_stable-row = c_check.
    *Method to refresh grid
      CALL METHOD  pw_grid->refresh_table_display
           EXPORTING
             is_stable      = wal_stable
             i_soft_refresh = c_check
           EXCEPTIONS
             finished       = 1
             OTHERS         = 2.
    ENDFORM.                    " refresh_grid
    Thanks,
    Sree.

  • ALV Report -   Selection screen information should appear in Output screen

    Hi experts,
    I am working on ALV Reports.
    I want selection screen information to appear in ouputscreen when report executed.
    Those who know the sloution pls tell  me as soon as possible.
    regards,
    Imran

    Hi Imrangs ,
    Ur requirement is not clear -
    if u want ur selection screen and the output screen on the same screen, i.e if u fill ur selection options with input and press the button then ur ALV will display on the same screen. For this try to use Screen painter, it will get resolved.
    http://www.kodyaz.com/articles/sap-abap-tutorial-alv-grid-cl_gui_alv_grid-screen-painter.aspx
    chreers
    Regards
    Neha

  • Selection screen in ALV output

    Hi Experts,
    My requirement is - A selection screen should pop up on the click of a button in the ALV output. Using the parameters I input on the selection screen anothor ALV should be displayed on the same page at the bottom. I'm displaying ALV using cl_gui_alv_grid.
    Thanks.
    Ajith

    Hi Nimesh,
    The requirement has slightly been updated so as to display the 2nd ALV is another screen.
    As you suggested I used the call selection screen. How ever I did not use events for the same. I called the selection screen on checking sy-ucomm in PAI.
    After I input the values in the pop up selection screen , even if I click the cancel button(at bottom) or the close button( top corner)  the execution still  follows and the second ALV is displayed.
    Please help me in this so that If I click on cancel or close the second ALV is not displayed and the control remains in the first ALV
    Thank you.
    Edited by: Ajith  Krishna on Oct 31, 2008 10:24 PM

  • Date format needs to be in selection screen mm/dd/yyyy but in alv output ..

    hi
    i need help on displaying date in alv output
    date format needs to be in selection screen mm/dd/yyyy but in alv output ..it should be displayed as yyyymmdd
    regards
    Nishant

    hi,
    you are passing the value to ALv using an internal table.
    so store the format  YYYYMMDD date in the internal table and pass it to ALV.
    use the below FM
    DD/MM/YYYY -> YYYYMMDD
    <b>CONVERSION_EXIT_PDATE_INPUT</b>
    rgds
    Anver

  • Grid ALV Output to Screen  as well as to Spool.

    Hi Masters,
    I have one requirement in which I have to Send the Grid ALV Output to Screen as well as to Spool.
    Can Anybody suggest any solution?
    and most Important 
    Helpful answers will get definitely awarded.
    Thanks in advance

    ALV Grid Output cannot be sent to Sppol.
    REUSE_ALV_GRID_DISPLAY function module will not work when the program runs in background mode.
    You should use the LIST Display function module when you run the program in Background.
    code like:
    if sy-batch = 'X'.
    call function 'REUSE_ALV_LIST_DISPLAY'...
    endif.
    Regards,
    Ravi Kanth Talagana

  • Can we control the output screen area of alv grid list

    Hi All,
    can we control the screen area of grid control in alv's , not using ooalv's. By default grid list is displaying in the whole screen, but i want  to display this grid list in specific area in output screen , not in full screen, how to set these screen area for this grid control. Please let me know.

    Hi,
    If you use the following parameters
      I_SCREEN_START_COLUMN             = 0
      I_SCREEN_START_LINE               = 0
      I_SCREEN_END_COLUMN               = 0
      I_SCREEN_END_LINE                 = 0
    you will get the output in the size expected but it will be in the form of a pop up box and a blank screen at the back and user action like cancel etc will take you back to the selection screen.

  • Output more than once ALV on screen

    Hi,
    We want to display data from 3 different internal tables on 3 different ALVs on output subscreen. i dont want to call a new screen but display all 3 ALVs one after other on single subscreen.
    Kindly send any code blocks. I would prefer to do this using "Docking container" or with use of similar containers. Also suggest how i can insert some text lines between ALVs on output screen.
    Kindly assist asap.
    Best Regards,
    Abbasi

    HI
    here 2 alv output in one screen
    *& Report  ZAMIT_ALVOOPS
    REPORT  ZNNR_ALVOOPS_SCREEN.
    tables: mara,spfli.
    types: begin of ty_tab,
            matnr type mara-matnr,
            ernam type mara-ernam,
            ersda type mara-ersda,
           end of ty_tab.
    DATA ITAB1 TYPE TABLE OF SPFLI.
    DATA WA1 LIKE LINE OF ITAB1.
    DATA IO1 TYPE SPFLI-CARRID VALUE 'AA'.
    data itab type table of ty_tab.
    data wa like line of itab.
    DATA OK_CODE TYPE SY-UCOMM.
    DATA: GRID TYPE REF TO CL_GUI_ALV_GRID,
          CONT TYPE REF TO CL_GUI_CUSTOM_CONTAINER.
    DATA: GRID1 TYPE REF TO CL_GUI_ALV_GRID,
          CONTA TYPE REF TO CL_GUI_CUSTOM_CONTAINER.
    CREATE OBJECT CONT EXPORTING CONTAINER_NAME = 'CONT1' .
    CREATE OBJECT GRID EXPORTING I_PARENT = CONT .
    CREATE OBJECT CONTA EXPORTING CONTAINER_NAME = 'CONT2' .
    CREATE OBJECT GRID1 EXPORTING I_PARENT = CONTA .
    selection-screen begin of block b1 with frame title text-100.
    select-options: s_matnr for mara-matnr.
    selection-screen end of block b1.
    select matnr ernam ersda from mara into corresponding fields of table itab up to 15 rows
    where matnr in s_matnr .
    call selection-screen 100.
    *&      Module  USER_COMMAND_0100  INPUT
          text
    MODULE USER_COMMAND_0100 INPUT.
    if ok_code = 'PB1'.
    leave to screen 0.
    else.
    leave to screen 100.
    endif.
    ENDMODULE.                 " USER_COMMAND_0100  INPUT
    *&      Module  STATUS_0100  OUTPUT
          text
    MODULE STATUS_0100 OUTPUT.
    SET PF-STATUS 'xxxxxxxx'.
    SET TITLEBAR 'xxx'.
    SELECT * FROM SPFLI INTO
      CORRESPONDING FIELDS OF TABLE ITAB1 WHERE CARRID = IO1.
    CALL METHOD grid->SET_TABLE_FOR_FIRST_DISPLAY
      EXPORTING
       I_BUFFER_ACTIVE               =
       I_BYPASSING_BUFFER            =
       I_CONSISTENCY_CHECK           =
        I_STRUCTURE_NAME              = 'MARA'
       IS_VARIANT                    =
       I_SAVE                        =
       I_DEFAULT                     = 'X'
       IS_LAYOUT                     =
       IS_PRINT                      =
       IT_SPECIAL_GROUPS             =
       IT_TOOLBAR_EXCLUDING          =
       IT_HYPERLINK                  =
       IT_ALV_GRAPHICS               =
       IT_EXCEPT_QINFO               =
       IR_SALV_ADAPTER               =
      CHANGING
        IT_OUTTAB                     = itab.
       IT_FIELDCATALOG               =
       IT_SORT                       =
       IT_FILTER                     =
    EXCEPTIONS
       INVALID_PARAMETER_COMBINATION = 1
       PROGRAM_ERROR                 = 2
       TOO_MANY_LINES                = 3
       others                        = 4
    IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
               WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    ENDIF.
       CALL METHOD GRID1->SET_TABLE_FOR_FIRST_DISPLAY
        EXPORTING
          I_STRUCTURE_NAME = 'SPFLI'
        CHANGING
          IT_OUTTAB        = ITAB1.
    ENDMODULE.                 " STATUS_0100  OUTPUT

  • HOW TO KEEP PUSHBUTTON IN OUTPUT SCREEN(ALV)

    HOW TO KEEP PUSHBUTTON IN OUTPUT SCREEN ( ALV FORMAT)

    Hi,
    At selection screen use this below code:
    Eg:
    *SELECTION-SCREEN FUNCTION KEY 1. "Adds button to application toolbar
    Declaration of sel screen buttons
    selection-screen begin of line.
    selection-screen pushbutton (20) w_button user-command but1.
    selection-screen pushbutton (25) w_but2 user-command but2.
    selection-screen end of line.
    Madhu
    Pls reward me if it is useful

  • How get window between selection screen and alv output

    Hi Friends,
    I am displaying ALV report now i want to display small window with one button and it should show list of fields before displaying alv output.
    means i want a window showing list of fields of internal table coming from program.and when i will click on yes button it should show ALV output.
    how can i achive this .
    Pls. help
    thanks in advance.

    Hi,
    Try to use the following command:
    <b><i>WINDOW STARTING AT <some-value> <some-value> ENDING AT <some-value> <some-value>.
    </i></b>
    notice that there is a space between <> <>.
    This statement should be used inside the AT USER-COMMAND event.
    i.e.,
    AT USER-COMMAND.
       CASE SY-UCOMM.
           WHEN 'XXX'.
                <b> <i> WINDOW STARTING AT <> <> ENDING AT <> <>.</i></b>
                 ..............statements....................
       ENDCASE.
    This should help you some what.
    Bye

Maybe you are looking for