BEx report hangs- selecting Alpha numeric values

I am working on the existing customer report
customer is the selection parameter for my report.
Issue is Customer has numerical and alpha numerical values.
If i give parameter rangs of value is numerical
01 - 500 query works fine
01-50cust1
50 cust1 - 195 cust2
query hangs.
Is their any way we can improve the query performance .
for searching alphanumerica values.
I have a workbook is built based on the query.
morethan 6 queries attached in the sheet 1....sheet2
each sheet has it is own query with values.
when I refresh and execute the workbook with the customer alphanumerica values it hangs.
Query is built based on the multiprovider.
Please help me onthis

Hello,
Try exporting in the 'fully formated grids and text'. It shouldl give you the 'member alias' used in the report.
Looks like if you export in the 'querry ready grids and text' it will show the 'member name' as in database although the report may have used the 'member alias'.
Regards

Similar Messages

  • How to display 'Alpha numeric values' in lower character?

    Hi,
    We have 'Alpha numeric value' in one column and i need to display alphabets in lower character.
    I tried but throwing error.
    SQL> select * from a439487.ora_dev_inventory;
    HOST_NM HA INV_DT
    SMMK94 - 21-AUG-08
    SQL> select to_lower(HOST_NM) from a439487.ora_dev_inventory;
    select to_lower(HOST_NM) from a439487.ora_dev_inventory
    ERROR at line 1:
    ORA-00904: "TO_LOWER": invalid identifier
    I want 'HOST_NM' to be displayed in lower value.
    I need o/p like 'smmk94'.
    Any idea?

    Where did you find the TO_LOWER function? Can you
    show us?I would guess it was just an assumption based on the fact we have to_char, to_date, to_number...
    ;)

  • How do I copy/paste full numerical-only account strings into the Projects WebADI template when the account segment fields in the template require use of the dropdown because they're formatted as alpha-numeric values?

    How do I copy/paste full numerical-only account strings into the Projects WebADI template when the account segment fields in the template require use of the dropdown because they're formatted as alpha-numeric values? I'm using the Integrator named "Projects - Transaction Import" and a custom Layout created based on the seeded Layout named "Transaction Import - Accounted". Do I need to somehow change my Layout to make the Document accept numerical values instead of requiring alpha-numeric values? I need to be able to populate the Document with a large amount of transactions and cannot feasibly go through every transaction to add the alpha-valued name of the account segment to every segment that requires it. The segments in particular causing the problem are "Expnd Type" and "Organization Name" which are both alpha-numeric and as such contain the segment number and name; I need to be able to only have to enter the Natural Account Number (6-digit number only) and the Organization Number (5-digit number only).

    How do I copy/paste full numerical-only account strings into the Projects WebADI template when the account segment fields in the template require use of the dropdown because they're formatted as alpha-numeric values? I'm using the Integrator named "Projects - Transaction Import" and a custom Layout created based on the seeded Layout named "Transaction Import - Accounted". Do I need to somehow change my Layout to make the Document accept numerical values instead of requiring alpha-numeric values? I need to be able to populate the Document with a large amount of transactions and cannot feasibly go through every transaction to add the alpha-valued name of the account segment to every segment that requires it. The segments in particular causing the problem are "Expnd Type" and "Organization Name" which are both alpha-numeric and as such contain the segment number and name; I need to be able to only have to enter the Natural Account Number (6-digit number only) and the Organization Number (5-digit number only).

  • Alpha Numeric Values

    Hi
    IS it supported in GL code combinations to have a alpha numeric values in key segment values .. we have a project segment in our chart of accounts and need the aplpha numeric values eg PRT001 , ADT001 etc . We do have some customizations and wondering if code combinations would have any impact
    Thanks
    Veda

    Yes you can have alpha numerics.
    Regards,
    Gareth

  • How to generate password alpha numeric value

    dear friends,
    i have written a simple pl/sql to generate a password.
    declare
    cursor c1 is select * from passwd;
    begin
    for I in c1
    loop
    if I.pfno < 3000 then
    update passwd set pwd=I.pfno where i.pfno=pfno;
    ELSe
    update passwd set pwd=lpad(round(I.pfno/20520),4,'0') where i.pfno=pfno;
    commit;
    end if;
    end loop;
    end;
    In this the pfno is 8 digit alpha numeric. I get password generated when it is only numeric but how could i get if pfno is like 04MAS155.
    Kindly help as i have to generate the same as early as possible. I have already been given with procedure to generate random password by our guys but still as i had already generated password to some employees in my concern based on querries like above i request your help to generate for alpha numeric 8 digit number.

    -- get a random string
        FUNCTION string (opt char, len NUMBER)
              /* "opt" specifies that the returned string may contain:
                 'u','U'  :  upper case alpha characters only
                 'l','L'  :  lower case alpha characters only
                 'a','A'  :  alpha characters only (mixed case)
                 'x','X'  :  any alpha-numeric characters (upper)
                 'p','P'  :  any printable characters
            RETURN VARCHAR2;  -- string of <len> characters (max 60)
        PRAGMA restrict_references (string, WNDS);

  • BEx report issue on setting offset value

    Friends,
    I have got a Bex reporting requirement as follows.
    Given a Calendar week I have to show data for 5 Key figures for the next 3 calendar weeks.  For ex: if I enter 05/2006 I have to show data for 05/2006, 06/2006 and 07/2006. 
    I thoght of using the Off Set parameter for all the Key figures, and for testing I did for 2nd set of Key figures with off set (1)..but these key figures are not showing any data.. Is it I am missing anything here ??
    Please comment if you have any better thoght of doing this..
    Thanks
    Mavi

    Hi,
      The format of period you gave refers to month i believe. If it is right, check the offsets once again. If the user enters fiscal year period, it should be converted in to week period using an customer exit variable(if you don,t have 0CALWEEK) and set offsets.
    Check this link, you may get some idea from that.
    Re: Aging Report

  • How to Return only alpha-numeric Values

    In my query, I want to return only records for which data in a specific column is alpha-numeric. Any records having this field as NULL, or containing symbols, I want to exclude. What's the best way to do this?
    Thanks,
    Brice

    select str from tab1
    where str is not null
    and translate(str, '_0123456789abcdefghijklmnopqrstuvwxyzABCDEFGHIJKLMNOPQRSTUVWXYZ','_') is null
    /Regards
    Dmytro

  • Select options numeric value with asterisk in field screen.

    Hi Guys
    I searched this solution in SDN and SAP HELP but I found the solution, so I created this post.
    I have a select options:
    SELECT-OPTIONS: s_asnum  FOR asmd-asnum
    If I insert value 3000111 , then my internal table show 000000000003000111  (ok its wright)
    If I insert value 30001*1 , then my internal table show  30001*1 (its my problem , because i NEED 0000000000030001*1 to my select work)
    How can I change my select option 30001*1  to  0000000000030001*1.
    Thanks for help.

    Hi Ronaldo,
    can't you ask your user to fill the zeros? or search by *30001*1?
    try  CONVERSION_EXIT_ALPHA_RANGE_I
    If it doesn't work you'll have to fill left zeros yourself in code.
    regards,
    Edgar

  • Exporting alpha numeric values using File Export Excel option

    Hi,
    When we export the report output to excel using the option file /export/excel/fully formatted grids and text, the text where we have alphanumeric characters, only the number component is getting exported. An example is 'Switch - Cisco 3750 (Goa) '. When the report data is exported, we can see only 3750 in the excel file. How do we fix this issue. Any help is highly appreciated.
    P

    Hello,
    Try exporting in the 'fully formated grids and text'. It shouldl give you the 'member alias' used in the report.
    Looks like if you export in the 'querry ready grids and text' it will show the 'member name' as in database although the report may have used the 'member alias'.
    Regards

  • Display F4 values as TEXT ONLY on selection screen of Bex report

    Hi,
    I have InfoObject with text(short) loaded for it. In Bex report on selection screen, I need to display ONLY TEXT values when you do F4 for values. How this can be achieved? I get key & text both now.
    Please note that I have tried all below settings -
    1. Set Text in InfoObject maintenance screen.
    This setting is over-ridden if you have multiprovider specific settings defined.
    2. Set Text in Infoprovider Specific properties.
    Here if you do KEY only, it works.. if you do KEY & TEXT, it works... but if you do TEXT only, it DOESNT work. It works for filter F4 values after report is executed but doesnt work for F4 values on Selection screen. There is no way I am able to get TEXT only on F4 values on selection screen.
    3. Set Text in Query
    These setting defines how value is displayed on report output. Nothing to do with F4 or Filter values.
    Thanks
    Abhijit

    Forgot to mention - I am on BI 7.0 & Frontend 3.5
    Thanks
    Abhijit

  • Convert Alpha-Numeric to Numeric values

    Hi,
    I have a requirement like there is a doc.no. which has alpha -numeric values (Eg:DA 112333).
    When i extract  this value i should be able to get only 112333 as the final output.
    How can i achieve this?
    Its not a fixed thing that only first two values will be alphabets it can occur anywhere in the sequence.
    Thanks in advance
    Merlin

    Hi,
    Check if you can make use of this sample code..
    Report xyz.
    DATA: l_str TYPE c LENGTH 10 VALUE '3D5X12YZ35',
          l_str1 TYPE c LENGTH 10,
          l_alpha TYPE string VALUE 'ABCDEFGHIJKLMNOPQRSTUVWXYZ',
          c TYPE c.
    DO 10 TIMES.
      c = l_str.
      IF c CA l_alpha.
        c = space.
      ELSE.
        CONCATENATE l_str1 c INTO l_str1.
      ENDIF.
      SHIFT l_str LEFT.
    ENDDO.
    CONDENSE l_str1.
    WRITE l_str1.

  • Random alpha numeric generation.

    i have a requiremnt where i need to generate a random alpha numeric values with the combination of
    a - z (lower case)
    A - Z (Upper case)
    0-9
    with out using the dbms_random.string
    please help me to get the complete script
    Prashant K

    i used dbms_random.string('X',6) statement but it generates the alphanumeric with upper case. i wanted the combination of lower,upper and digits. as shown below.
    e.g aB3cdFE88
    to get the above i did some thing like this.
    select dbms_random.string('L',4)||dbms_random.string('X',6) as rand_alphanumeric from dual
    here i am concatinating the two strings.
    i want to know is there any way other than this to geneate random alphanumeric values ?

  • Replicating a bex report in webi

    Hi
    I am trying to replicate a bex report in WEBI.In the bex report based on a variable value i show either planned values or actual  values for amount field, both of which are coming from 2 different cubes.How do i achieve the same functionality in a webi report?
    Pls help..

    You cannot merge two SAP BW universes into one. THe only option for merging to different SAP sources (BEx queries) in a single universe is to use the Data Federator.
    Use your BEx query based on the multiprovider you already have as data source for your universe.
    Regards,
    Stratos

  • ALV grid list  report when selected  from  selection screen

    Hi folks,
                I need to get ALV grid display in my list report when selected the interval values from  the selection screen. If I change the values in list of ALV grid it needs to be updated when I press UPDATE pushbutton. The output of list should be in ALV grid display.I need sorting ,flitering,totaling functionality in the list output.
    For example if I selected BUKRS = 100 and 200 in the selection screen ,I need to display the ALV grid list in below the selection screen as ALV grid display...
    Its urgent as  I am new to ALV grid functionality...
    Thanks in advance..

    hi raja,
    check with the folllowing code.
    REPORT zca0m_zca0fcstftop NO STANDARD PAGE HEADING
                                    MESSAGE-ID zcsv_usrtbl_maintain.
    Type pools                                                           *
    TYPE-POOLS : slis.                          " Used for ALV display
    Tables
    TABLES: zca0fcstftop,
            dd04t,                         "R/3 DD: Data element texts
            tactt.                         "Activities that can be protected
    internal tables
    DATA: BEGIN OF wa_zca0fcstftop .
            INCLUDE STRUCTURE zca0fcstftop.
    DATA: END OF wa_zca0fcstftop.
    DATA: t_zca0fcstftop LIKE STANDARD TABLE OF wa_zca0fcstftop.
    DATA: BEGIN OF i_fcode OCCURS 0,
            fcode LIKE sy-ucomm,
          END OF i_fcode.
    *Record for variant selection
    DATA : BEGIN OF ws_variant,
             selected TYPE c,
             variant  LIKE ltdx-variant,  "Variant name
             text     LIKE ltdxt-text,    "Variant description
           END OF ws_variant.
    *Table for variant selection
    data : itab_variant LIKE STANDARD TABLE OF ws_variant WITH HEADER LINE.
    Variant selection pop-up global variables
    DECLARATION OF TABLECONTROL 'VARIANT_CNTL' ITSELF
    CONTROLS: variant_cntl TYPE TABLEVIEW USING SCREEN 0200.
    LINES OF TABLECONTROL 'VARIANT_CNTL'
    DATA:     g_variant_cntl_lines  LIKE sy-loopc.
    DATA:grid1 TYPE REF TO  cl_gui_alv_grid ,
         g_custom_container TYPE REF TO cl_gui_custom_container.
    Work fields
    DATA: table_name LIKE dd02l-tabname,   "To store table name
          field_name LIKE dd03l-fieldname, "To Store Field Name
          act_auth LIKE tactz-actvt,       "To pass Activity ID
          tab_maint LIKE dd02l-tabname,    "To pass Table Name to be Maintd.
          wg_confirm_ind,                  "To trap User responses
          flag,                            "To trap changes made to an entry
          f_copy,                          "To Identify 'COPY' Command Use
          f_select,                        "To decide between Select-options
                                           " and Internal Table
          l_transaction_code LIKE tstc-tcode,
          v_langu LIKE sy-langu,
          v_repid LIKE sy-repid,
          s_variant TYPE disvariant.
    DATA: ok_code LIKE sy-ucomm.
    DATA:selected_rows TYPE lvc_t_row  ,
         sel_rows TYPE lvc_t_row WITH HEADER LINE.
    DATA:t_lines TYPE i.
    Constants                                                            *
    CONSTANTS :
               c_x TYPE c VALUE 'X',             " Constant 'X'.
               c_f TYPE c VALUE 'F'.             " Constant 'F'.
    Parameters and Selection Options
    *Selection Screen for table maintenance
    *Selection option for Plant
    SELECTION-SCREEN BEGIN OF BLOCK block1 WITH FRAME TITLE text-b01.
    PARAMETERS:  p_werks   LIKE zca0fcstftop-werks OBLIGATORY.
    SELECT-OPTIONS: s_prdfml  FOR zca0fcstftop-product_family,
                    s_bmach   FOR zca0fcstftop-base_machine,
                    s_factop FOR zca0fcstftop-factory_top,
                    s_optval  FOR zca0fcstftop-option_value,
                    s_week    FOR zca0fcstftop-week.
    SELECTION-SCREEN END OF BLOCK block1.
    SELECTION-SCREEN BEGIN OF BLOCK block2 WITH FRAME TITLE text-b02.
    PARAMETERS     : p_varant LIKE ltdx-variant.          " ALV variant
    SELECTION-SCREEN END OF BLOCK block2.
    At selection screen                                                  *
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_varant.
      PERFORM alv_variant_f4 CHANGING p_varant.
    AT SELECTION-SCREEN ON p_werks .
    Validating Plant on the selection screen
      PERFORM validate_plant.
    Initialization
    INITIALIZATION.
    Check Authorization for the Transaction
    Authorization Check For T Code
      SELECT tcode
         INTO l_transaction_code
         FROM tstc UP TO 1 ROWS
         WHERE pgmna = sy-repid.
      ENDSELECT.
      AUTHORITY-CHECK OBJECT 'S_TCODE'
                          ID 'TCD' FIELD l_transaction_code.
      IF sy-subrc NE 0.
        MESSAGE e001 WITH l_transaction_code.
      ENDIF.
      v_langu = sy-langu.                             " language
      v_repid = sy-repid .                            " abap Program name
    Start Of Selection
    START-OF-SELECTION.
      CALL SCREEN 0050.
    *&      Form  validate_plant                                           *
          Validating Plant on the selection screen                       *
    FORM validate_plant .
      DATA : l_werks LIKE t001w-werks.                          " Plant
      IF p_werks IS NOT INITIAL.
        SELECT SINGLE werks
            FROM t001w
            INTO l_werks
            WHERE werks EQ p_werks.
        IF sy-subrc NE 0.
          MESSAGE e100(ra) WITH text-001 .
        ENDIF.
      ENDIF.
      AUTHORITY-CHECK OBJECT 'Z_PP_PLANT'
               ID 'ACTVT' FIELD '03'
               ID 'WERKS' FIELD p_werks
               ID 'TCD' FIELD l_transaction_code.
      IF sy-subrc NE 0.
        MESSAGE e000(oo) WITH 'No authorization for plant:'(e80) p_werks.
      ENDIF.
    ENDFORM.                    " validate_plant
    *&      Form  get_data                                                 *
          Get data                                                       *
    FORM get_data .
      SELECT * FROM zca0fcstftop
        INTO TABLE t_zca0fcstftop
        WHERE werks           = p_werks
          AND product_family IN s_prdfml
          AND base_machine   IN s_bmach
          AND factory_top    IN s_factop
          AND option_value   IN s_optval
          AND week           IN s_week.
    ENDFORM.                    " get_data
    *&      Form  fill_fcode
    FORM fill_fcode USING    value(p_0029).
      i_fcode-fcode = p_0029.
      APPEND i_fcode.
      CLEAR i_fcode.
    ENDFORM.                               " fill_fcode
    *&      Module  STATUS_0100  OUTPUT
    MODULE status_0100 OUTPUT.
      SET PF-STATUS 'UPDATE'.
      CLEAR flag.
    ENDMODULE.                             " STATUS_0100  OUTPUT
    *&      Module  MODIFY_0100  OUTPUT
    MODULE modify_0100 OUTPUT.
      IF sy-ucomm = 'CHNG' OR
           sy-ucomm = 'PICK'.
        LOOP AT SCREEN.
          CHECK screen-group1 = 'CHG'.
          screen-required = '0'.
          screen-output   = '1'.
          screen-input    = '0'.
          MODIFY SCREEN.
        ENDLOOP.
      ENDIF.
    Check if you are in create mode & if yes then set the screen elements
    as mandatory
      IF ok_code = 'CREA'.
        LOOP AT SCREEN.
          CHECK screen-group1 = 'CHG'.
          screen-required = '1'.
          screen-output   = '1'.
          screen-input    = '1'.
          MODIFY SCREEN.
        ENDLOOP.
      ENDIF.
    ENDMODULE.                             " MODIFY_0100  OUTPUT
    *&      Module  Check_Exit  INPUT
          text
    MODULE check_exit INPUT.
      IF ( sy-ucomm = 'BACK' OR sy-ucomm = 'CANC' OR sy-ucomm = 'EXIT' ) AND
           ( flag = 'Y' ).
        CALL FUNCTION 'POPUP_TO_CONFIRM_STEP'
          EXPORTING
            defaultoption  = 'Y'
            textline1      = text-008
            textline2      = text-009
            titel          = text-004
            cancel_display = ' '
          IMPORTING
            answer         = wg_confirm_ind.
        CASE wg_confirm_ind.
          WHEN 'J'.                                             "Yes
            sy-ucomm = 'SAVE'.
            CLEAR flag.
          WHEN 'N'.                                             "No
            sy-ucomm = 'BACK'.
            CLEAR flag.
        ENDCASE.
      ENDIF.
    ENDMODULE.                             " Check_Exit  INPUT
    *&      Module  Exit_0100  INPUT
          text
    MODULE exit_0100 INPUT.
      SET SCREEN 0. LEAVE SCREEN.
    ENDMODULE.                             " Exit_0100  INPUT
    *&      Module  USER_COMMAND_0100  INPUT
          text
    MODULE user_command_0100 INPUT.
      CASE sy-ucomm.
        WHEN 'SAVE'.                       "Save
        Check to see if the user has the appropriate authorization
          IF p_werks NE zca0fcstftop-werks.
          could not update - not in selection
            MESSAGE e000(oo) WITH 'Entry not within selection'.
            SET SCREEN 0. LEAVE SCREEN.
            PERFORM get_data.
          ENDIF.
          IF f_copy = 'X'.
            INSERT zca0fcstftop.
            IF sy-subrc = 0.
              MESSAGE s004.
              PERFORM initialize.
              SET SCREEN 0. LEAVE SCREEN.
              PERFORM get_data.
            ELSE.
              MESSAGE w005.
            ENDIF.
          ELSE.
            MODIFY zca0fcstftop.
            IF sy-subrc = 0.
              MESSAGE s004.
              PERFORM initialize.
              SET SCREEN 0. LEAVE SCREEN.
              PERFORM get_data.
            ELSE.
              MESSAGE w005.
            ENDIF.
          ENDIF.
          PERFORM get_data.
        WHEN 'BACK'.                       "Back
          SET SCREEN 0. LEAVE SCREEN.
        WHEN 'CANC'.                       "Cancel
          SET SCREEN 0. LEAVE SCREEN.
        WHEN OTHERS.
      ENDCASE.
      COMMIT WORK.
    ENDMODULE.                             " USER_COMMAND_0100  INPUT
    *&      Form  Initialize
    FORM initialize.
      CLEAR :   table_name,
                field_name,
                wg_confirm_ind,
                f_copy,
                flag,
                t_zca0fcstftop,
                zca0fcstftop,
                wa_zca0fcstftop,
                i_fcode.
      REFRESH: t_zca0fcstftop.
    ENDFORM.                               " Initialize
    *&      Form  alv_variant_f4
          text
         <--P_VARIANT  text
    FORM alv_variant_f4  CHANGING variant.
      DATA: rs_variant LIKE disvariant.
      DATA nof4 TYPE c.
      CLEAR nof4.
      LOOP AT SCREEN.
        IF screen-name = 'VARIANT'.
          IF screen-input = 0.
            nof4 = 'X'.
          ENDIF.
        ENDIF.
      ENDLOOP.
      rs_variant-report   = sy-repid.
      rs_variant-username = sy-uname.
      CALL FUNCTION 'REUSE_ALV_VARIANT_F4'
        EXPORTING
          is_variant = rs_variant
          i_save     = 'A'
        IMPORTING
          es_variant = rs_variant
        EXCEPTIONS
          OTHERS     = 1.
      IF sy-subrc = 0 AND nof4 EQ space.
        variant = rs_variant-variant.
      ENDIF.
    ENDFORM.                               " ALV_VARIANT_F4
    *&      Module  STATUS_0050  OUTPUT
          text
    MODULE status_0050 OUTPUT.
    In this module Initialize the container and put the grid in it
      DATA:grid_layout  TYPE lvc_s_layo,
           fieldcat TYPE lvc_t_fcat,
           wa_fieldcat LIKE LINE OF fieldcat.
      PERFORM set_auth.
      SET PF-STATUS 'UPD_0050' EXCLUDING i_fcode.
      SET TITLEBAR 'UPD_0050'.
      IF g_custom_container IS INITIAL .
        CREATE OBJECT g_custom_container
           EXPORTING
              container_name = 'FTDATA'.
        CREATE OBJECT grid1
           EXPORTING
            i_parent = g_custom_container.
      ELSE.
        CALL METHOD grid1->free.
        CALL METHOD g_custom_container->free.
        CREATE OBJECT g_custom_container
           EXPORTING
              container_name = 'FTDATA'.
        CREATE OBJECT grid1
           EXPORTING
            i_parent = g_custom_container.
      ENDIF.
    Every time refresh The variables
      PERFORM initialize.
      PERFORM get_data.
      CALL FUNCTION 'LVC_FIELDCATALOG_MERGE'
        EXPORTING
          i_structure_name = 'ZCA0FCSTFTOP'
        CHANGING
          ct_fieldcat      = fieldcat.
      grid_layout-grid_title = text-t01.
      grid_layout-sel_mode = 'A'.
      grid_layout-stylefname = 'CT'.
      s_variant-report   = sy-repid.
      s_variant-username = sy-uname.
      s_variant-variant  = p_varant.
      CALL METHOD grid1->set_table_for_first_display
        EXPORTING
          i_structure_name = 'ZCA0FCSTFTOP'
          is_layout        = grid_layout
          is_variant       = s_variant
          i_save           = 'A'
        CHANGING
          it_outtab        = t_zca0fcstftop
          it_fieldcatalog  = fieldcat.
      Create Object to receive events and link them to handler methods.
      When the ALV Control raises the event for the specified instance
      the corresponding method is automatically called.
    CREATE OBJECT event_receiver.
    SET HANDLER event_receiver->handle_button_click FOR grid1.
    ENDMODULE.                 " STATUS_0050  OUTPUT
    *&      Module  USER_COMMAND_0050  INPUT
    MODULE user_command_0050 INPUT.
      CALL METHOD grid1->get_selected_rows
        IMPORTING
          et_index_rows = selected_rows.
      DESCRIBE TABLE selected_rows LINES t_lines.
      IF t_lines > 1 .
        MESSAGE e048(zcsv_sfdr).
      ENDIF.
    Clear Header
      CLEAR wa_zca0fcstftop.
      sel_rows[] = selected_rows .
      READ TABLE sel_rows INDEX 1.
      READ TABLE t_zca0fcstftop INTO wa_zca0fcstftop INDEX sel_rows-index.
      CASE ok_code.
        WHEN 'EXIT'.
          PERFORM exit_program.
        WHEN 'CREA'.
          CLEAR zca0fcstftop.
          ok_code = sy-ucomm.
          zca0fcstftop-werks = p_werks.
          CALL SCREEN 100.
        WHEN 'COPY'.
          MOVE wa_zca0fcstftop TO zca0fcstftop .
          CLEAR wa_zca0fcstftop.
          f_copy = 'X'.
          CALL SCREEN 100.
        WHEN 'CHNG'.
          CHECK NOT wa_zca0fcstftop IS INITIAL.
          MOVE wa_zca0fcstftop TO zca0fcstftop .
          CLEAR wa_zca0fcstftop.
          ok_code = sy-ucomm.
          CALL SCREEN 100.
        WHEN 'DELE'.
          CHECK NOT wa_zca0fcstftop IS INITIAL.
          CALL FUNCTION 'POPUP_TO_CONFIRM_STEP'
            EXPORTING
              defaultoption  = 'N'
              textline1      = text-005
              textline2      = text-006
              titel          = text-007
              cancel_display = ' '
            IMPORTING
              answer         = wg_confirm_ind.
          IF wg_confirm_ind EQ 'J'.
            DELETE zca0fcstftop FROM wa_zca0fcstftop .
            IF sy-subrc EQ 0.
              MESSAGE s004.
            ELSE.
              MESSAGE e005.
            ENDIF.
          ELSEIF wg_confirm_ind EQ 'N'.
          ENDIF.
      ENDCASE.
      CLEAR ok_code.
    ENDMODULE.                 " USER_COMMAND_0050  INPUT
    *&      Form  exit_program
    FORM exit_program .
      CALL METHOD g_custom_container->free.
      CALL METHOD cl_gui_cfw=>flush.
      SET SCREEN 0.
      LEAVE SCREEN.
    ENDFORM.                    " exit_program
    *&      Form  set_auth
    FORM set_auth.
      REFRESH: i_fcode.
    Check authorization for change
      MOVE '02' TO act_auth.        "02 --> Change
      MOVE 'ZCA0FCSTFTOP' TO tab_maint.
      AUTHORITY-CHECK OBJECT 'ZZ:TABLMNP'
        ID 'ACTVT' FIELD act_auth
        ID 'TABLE' FIELD tab_maint.
      IF sy-subrc NE 0.
        PERFORM fill_fcode USING 'CHNG'.
      ENDIF.
    Check for authorization for create
      MOVE '01' TO act_auth.        "01 --> Create
      MOVE 'ZCA0FCSTFTOP' TO tab_maint.
      AUTHORITY-CHECK OBJECT 'ZZ:TABLMNP'
        ID 'ACTVT' FIELD act_auth
        ID 'TABLE' FIELD tab_maint.
      IF sy-subrc NE 0.
        PERFORM fill_fcode USING 'CREA'.
        PERFORM fill_fcode USING 'COPY'.
      ENDIF.
    Check for authorization for delete
      MOVE '06' TO act_auth.        "06 --> Delete
      MOVE 'ZCA0FCSTFTOP' TO tab_maint.
      AUTHORITY-CHECK OBJECT 'ZZ:TABLMNP'
        ID 'ACTVT' FIELD act_auth
        ID 'TABLE' FIELD tab_maint.
      IF sy-subrc NE 0.
        PERFORM fill_fcode USING 'DELE'.
      ENDIF.
    ENDFORM.                    " set_auth
    *&      Module  check_change  INPUT
    MODULE check_change INPUT.
      flag = 'Y'.
    ENDMODULE.                 " check_change  INPUT
    regards,
    vikas.
    plz reward if helpful

  • Dynamic field selection by variable input in bex report

    Hi Frineds,
              I have created  variable on characteristic  ( 0CURTYPE )  which mainly have two values 'A' and ' B' .Based on my variable input in Bex I have to dynamical select key figuers  Example .
    0CURTYPE    KeyfigA  KeyFigB  
    A                    123 Rs   144 $
    B                     124 Rs   145 $
            In above example is user select A I have to display KeyfigA   if I select B then i should display Keyfig B in Bex report .
    I know that by using user exit in report we can do but I would like to try with out Exit .
    Thanks ,
    Kumar.

    Your formula variable allowed to be of type either number or amount or date or quantity which are all numeric(currency type/type tab) .But your reference characteristics is a letter.So there is an inconsistency here and you can not make equal your formula variable and 0currtype's variable.
    Have a look at Akshata's post in this thread :How to create formula variables in sap bi?
    Therefore this model does not work and I can not see any other way apart from a very simple user exit which says if 0currype=A, then formula variable=0 else if 0currtype=B then formula variable=1.After that you can use your formula variable in your formula since the letters are now converted to numbers.
    By the way it mustn't ask two things in the selection screen.Since your formula variable takes the values of 0currtype's variable automatically.Did you create the formula variable with replacement path(general tab) referencing to 0currtype?Just create a formula, enter this formula,right click create formula variable,go to general tab then replacement path then reference to 0currtype.But as I told, you nevertheless can not achieve it, just explaining it.
    Regards,
    Sunny

Maybe you are looking for

  • Accesing java objects in a jsp.

    I've got the following problem: I have a java class that contains a connection to a jdbc database, and several functions that manipulate that database( insert ,delete,select..) I create an instance of this class in a servlet, and I need to be able to

  • When I plug in an USB stick, my MacBook Air disables all USB devices

    When I plug in an USB device, my MacBook Air disables all USB devices and the keyboard. It looks like it would freeze, but all applications still work. It just does not respond to neither keyboard nor mouse. The only solution is to force-restart it.

  • My phone wont exit the settings screen and wont lock or turn off

    phone stuck on settings menu wont exit also it wont lock on its own or with lock button wont exit with home button either

  • Scaned Image won't let me select a section

    After scanning my image that I want to fix, I am not being able to make a selection on the image to fll in color or correction. I am getting this error message. "No pixels are more than 50% selected the Selection edges will not be visible" What am I

  • How to solve "We are having trouble verifying your membership" error?

    Hi, Recently, I just uninstall Creative Cloud which the trial period going to expire soon, then I re-install CS6 back which we have 3 licenses in total. Now, only one user meet with this problem, which once open Dreamweaver or Indesign software, the