Reg. Creation of table dynamically

Hi Experts,
While creating a table dynamically some of the fields in it_lvc_cat are Integer but the created table (new_table) contains all the fields as character. Is there any possibility of changing the datatype as interger for required fields.
  CALL METHOD cl_alv_table_create=>create_dynamic_table
    EXPORTING
      it_fieldcatalog = it_lvc_cat
    IMPORTING
      ep_table        = new_table.
Regards,
Vijay.

Hi,
Refer this code:
REPORT zmtable LINE-SIZE 255
               LINE-COUNT 65.
Program written by Vijay Chaitanya Raju
Maintain Table dynamicly (Table name is entered on Selection Screen)
Very powerfull program. Please maintain authorisation access and
restrict maintenance to Z-tables
Version 6.20 and up
(can be used in 4.6C with some modifications to block try - endtry
and classes)
Enhanced functionality with dynamic selection screen
TABLES: sscrfields.                "Fields on selection screens
TYPE-POOLS rsds.
DATA ds_clauses TYPE rsds_where.
DATA: BEGIN OF ifield OCCURS 0,
      fieldname LIKE dd03l-fieldname,
      position  LIKE dd03l-position,
      keyflag   LIKE dd03l-keyflag,
      datatype  LIKE dd03l-datatype.
DATA: END OF ifield.
DATA: sl_step    LIKE sy-tabix,
      ss_step    LIKE sy-subrc,
      ss_act(1)  TYPE c,
      sl_lines   LIKE sy-tfill,
      sl_status  LIKE sy-subrc,
      sl_subrc   LIKE sy-subrc,
      sl_update(1) TYPE c,
      sl_mandt(1)  TYPE c,
      len(6)       TYPE n,
      f_value(255) TYPE c,
      sl_datum     LIKE sy-datum,
      sl_uzeit     LIKE sy-uzeit,
      price1(15)   TYPE c,
      price2(15)   TYPE c,
      mess(60)     TYPE c,
      d_stat   LIKE sy-subrc,
      m_stat   LIKE sy-subrc,
      slchar(6) TYPE c.
DATA: ref_ptr TYPE REF TO cx_root.      "Root class more common
DATA: text TYPE string.
DATA: sl_index LIKE sy-tabix.
DATA: zauth LIKE dd02l-tabname.
DATA: num TYPE i,
      max_len TYPE i,
      check_len TYPE i,
      sl_sel(1) TYPE c.
TYPE-POOLS: icon.
SELECTION-SCREEN.
SELECTION-SCREEN BEGIN OF LINE.
text-012 - 'Table Name'
SELECTION-SCREEN COMMENT 1(25) text-012.
PARAMETERS: tabname LIKE dd02l-tabname DEFAULT 'ZSCARE'.
text-003 - 'Selection'
SELECTION-SCREEN PUSHBUTTON 75(9) text-003 USER-COMMAND sta1.
SELECTION-SCREEN END OF LINE.
numrows(text) - 'Max Number of ROWS'
PARAMETERS: numrows LIKE sy-subrc DEFAULT '100'.
At Selection-Screen                                                 *
AT SELECTION-SCREEN.
  CASE sscrfields-ucomm.
    WHEN 'STA1'.
      CLEAR sl_sel.
      CALL FUNCTION 'ZSTAN_SELECTIONS'
        EXPORTING
          tabname         = tabname
        IMPORTING
          ds_clauses      = ds_clauses
        EXCEPTIONS
          table_not_valid = 1
          other_error     = 2
          OTHERS          = 3.
      IF sy-subrc = 0.
        sl_sel = 'X'.
      ENDIF.
  ENDCASE.
*At Selection-Screen Output                                            *
AT SELECTION-SCREEN OUTPUT.
  SELECT SINGLE tabname
    INTO tabname
    FROM dd02l
    WHERE tabname  = tabname
      AND as4local = 'A'
      AND ( tabclass = 'TRANSP' OR tabclass = 'POOL'
            OR tabclass = 'CLUSTER' ).
  IF sy-subrc <> 0.
    MESSAGE 'Table is not valid' TYPE 'S'.
    RETURN.
  ENDIF.
START-OF-SELECTION.
START-OF-SELECTION.
  DEFINE: acheck.
    zauth = 'ZTABAUTH'.
    select single statu
      into sl_update
      from (zauth)
      where tabname = tabname
        and bname   = sy-uname.
    if sy-subrc <> 0.
      message 'You are not authorized to view this table' type 'S'.
      return.
    endif.
  END-OF-DEFINITION.
  SELECT SINGLE tabname
    INTO tabname
    FROM dd02l
    WHERE tabname  = tabname
      AND as4local = 'A'
      AND ( tabclass = 'TRANSP' OR tabclass = 'POOL'
            OR tabclass = 'CLUSTER' ).
  IF sy-subrc <> 0.
    MESSAGE 'Table is not valid' TYPE 'S'.
    RETURN.
  ENDIF.
  DATA: ptr_itab TYPE REF TO data.
  FIELD-SYMBOLS: <fs_itab> TYPE STANDARD TABLE. "ANY TABLE.
  CREATE DATA ptr_itab TYPE STANDARD TABLE OF (tabname).
  ASSIGN ptr_itab->* TO <fs_itab>.
For DELETION
  DATA: ptr_itd TYPE REF TO data.
  FIELD-SYMBOLS: <fs_itd> TYPE STANDARD TABLE.
  CREATE DATA ptr_itd TYPE STANDARD TABLE OF (tabname).
  ASSIGN ptr_itd->* TO <fs_itd>.
For MODIFICATION
  DATA: ptr_itm TYPE REF TO data.
  FIELD-SYMBOLS: <fs_itm> TYPE STANDARD TABLE.
  CREATE DATA ptr_itm TYPE STANDARD TABLE OF (tabname).
  ASSIGN ptr_itm->* TO <fs_itm>.
  DATA: ptr_wtab TYPE REF TO data.
  FIELD-SYMBOLS: <fs_wtab> TYPE ANY.
  CREATE DATA ptr_wtab TYPE (tabname).
  ASSIGN ptr_wtab->* TO <fs_wtab>.
  DATA: itabname(15) TYPE c.
  itabname = '<fs_wtab>'.
Standard list status with 'SAVE' button
  SET PF-STATUS 'STLI'.
  CLEAR sl_update.
Maintain authorisation access in table ZTABAUTH
Key fields:  tabname - Table name
             bname   = sy-uname - User name
             statu   = 'X' - maintain
                       ' ' - view
Check authorisation access
  acheck.
  SELECT fieldname position keyflag datatype
    INTO TABLE ifield
    FROM dd03l
    WHERE tabname = tabname
      AND fieldname NOT LIKE '.INCLU%'
    ORDER BY position.
  FIELD-SYMBOLS: <f1> TYPE ANY.
  DATA: tab_field(60) TYPE c,
        sline LIKE sy-lisel.
  DATA: field_attr LIKE dfies.
  DATA: BEGIN OF tfield_attr OCCURS 0.
          INCLUDE STRUCTURE field_attr.
  DATA: END OF tfield_attr.
  LOOP AT ifield.
    CALL FUNCTION 'G_FIELD_READ'
      EXPORTING
        table      = tabname
        fieldname  = ifield-fieldname
        text_flag  = 'X'
      IMPORTING
        field_attr = field_attr.
    tfield_attr = field_attr.
    APPEND tfield_attr.
  ENDLOOP.
  IF sl_sel = 'X'.
    SELECT *
      FROM (tabname)
      INTO TABLE <fs_itab> UP TO numrows ROWS
      WHERE (ds_clauses-where_tab).
  ELSE.
    SELECT *
      FROM (tabname)
      INTO TABLE <fs_itab> UP TO numrows ROWS.
  ENDIF.
  DESCRIBE TABLE <fs_itab> LINES sl_lines.
Show two extra lines to allow addition up to 2 new lines
  IF sl_update = 'X'.
    DO 2 TIMES.
      APPEND INITIAL LINE TO <fs_itab>.
    ENDDO.
  ENDIF.
  DATA: info(22) VALUE 'D - Delete, M - Modify'.
  WRITE: / icon_information AS ICON QUICKINFO info.
  WRITE ' '.
  CLEAR check_len.
  LOOP AT tfield_attr.
    IF tfield_attr-datatype = 'CLNT'.
      CONTINUE.
    ENDIF.
    len = tfield_attr-outputlen.
    IF tfield_attr-keyflag = 'X'.
      check_len = check_len + len + 1.
    ENDIF.
    IF tfield_attr-scrtext_m IS NOT INITIAL.
      WRITE: AT (len) tfield_attr-scrtext_m COLOR 1.
    ELSE.
      WRITE: AT (len) tfield_attr-fieldtext COLOR 1.
    ENDIF.
  ENDLOOP.
  CLEAR ss_step.
  CLEAR ss_act.
  LOOP AT <fs_itab> INTO <fs_wtab>.
    IF sy-tabix LE sl_lines.
      ss_step = 1.
    ELSE.
      CLEAR ss_step.
    ENDIF.
In field SS_STEP put D -  to delete record
                     M -  to modify/add new record
    IF sl_update = 'X'.
      WRITE:/ icon_change AS ICON.
      IF ss_step = 1.
        WRITE:  ss_act INPUT ON.
      ELSE.
        ss_act = 'M'.
        WRITE:  ss_act.
        CLEAR ss_act.
      ENDIF.
    ELSE.
      WRITE:/ icon_display AS ICON.
      WRITE:  ss_act COLOR 2.
    ENDIF.
    LOOP AT ifield.
Maintain client dependant tables in the same client
      IF ifield-datatype = 'CLNT'.
        sl_mandt = 'X'.
        CONTINUE.
      ENDIF.
      CONCATENATE itabname '-' ifield-fieldname INTO tab_field.
      ASSIGN (tab_field) TO <f1>.
      IF sl_update = 'X'.
        IF ifield-keyflag = 'X' AND ss_step IS NOT INITIAL.
          WRITE: <f1> COLOR 4.
        ELSE.
          WRITE: <f1> INPUT ON.
        ENDIF.
      ELSE.
        IF ifield-keyflag = 'X' AND ss_step IS NOT INITIAL.
          WRITE: <f1> COLOR 4.
        ELSE.
          WRITE: <f1> COLOR 2.
        ENDIF.
      ENDIF.
      UNASSIGN <f1>.
    ENDLOOP.
  ENDLOOP.
END-OF-SELECTION.
END-OF-SELECTION.
AT USER-COMMAND.
AT USER-COMMAND.
  CASE sy-ucomm.
    WHEN 'SAVE'.
      IF sl_update = 'X'.
        CLEAR: sl_step,
               sl_status,
               sl_subrc,
               <fs_wtab>,
               d_stat,
               m_stat,
               max_len.
        REFRESH <fs_itd>.
        REFRESH <fs_itm>.
        DO.
          IF sl_status <> 0.
            EXIT.
          ENDIF.
          ADD 1 TO sl_step.
          IF sl_subrc <> 0.
            EXIT.
          ENDIF.
          CLEAR ss_step.
          CLEAR ss_act.
          READ LINE sl_step
               FIELD VALUE ss_act INTO f_value.
          sl_subrc = sy-subrc.
          IF f_value(1) EQ 'D' OR f_value(1) = 'd'.
            ss_step = 1.  "Delete
          ELSEIF f_value(1) EQ 'M' OR f_value(1) = 'm'.
            ss_step = 2.  "Modify
          ELSE.
            CLEAR ss_step.
          ENDIF.
          CHECK sy-lisel(3) = '0Z '.
          IF ss_step GT 0.
            CLEAR sline.
            sline = sy-lisel+5(250).
            max_len = 250.
            CHECK sline(check_len) <> ' '.
            LOOP AT tfield_attr.
              CONCATENATE itabname '-' tfield_attr-fieldname
                                              INTO tab_field.
              ASSIGN (tab_field) TO <f1>.
              IF tfield_attr-fieldname = 'MANDT'.
                <f1> = sy-mandt.
              ELSE.
                CLEAR f_value.
                IF max_len LT tfield_attr-outputlen.
                  max_len = 255.
                  ADD 1 TO sl_step.
                  READ LINE sl_step.
                  sline = sy-lisel.
                ENDIF.
                f_value = sline(tfield_attr-outputlen).
                max_len = max_len - tfield_attr-outputlen - 1.
                IF tfield_attr-inttype = 'D'.
                  IF f_value CO ' 0./-'.
                    CLEAR sl_datum.
                    <f1> = sl_datum.
                  ELSE.
                    CALL FUNCTION 'CONVERT_DATE_INPUT'
                      EXPORTING
                        input                     = f_value
                        plausibility_check        = 'X'
                      IMPORTING
                        output                    = sl_datum
                      EXCEPTIONS
                        plausibility_check_failed = 1
                        wrong_format_in_input     = 2
                        OTHERS                    = 3.
                    IF sy-subrc = 0.
                      <f1> = sl_datum.
                    ELSE.
                      text = 'Invalid Date'.
                      sl_status = 1.
                      EXIT.
                    ENDIF.
                  ENDIF.
                ELSEIF tfield_attr-inttype = 'T'.
                  IF f_value CO ' 0:'.
                    CLEAR sl_uzeit.
                    <f1> = sl_uzeit.
                  ELSE.
                    CALL FUNCTION 'CONVERT_TIME_INPUT'
                      EXPORTING
                        input                     = f_value
                        plausibility_check        = 'X'
                      IMPORTING
                        output                    = sl_uzeit
                      EXCEPTIONS
                        plausibility_check_failed = 1
                        wrong_format_in_input     = 2
                        OTHERS                    = 3.
                    IF sy-subrc = 0.
                      <f1> = sl_uzeit.
                    ELSE.
                      text = 'Invalid Time'.
                      sl_status = 1.
                      EXIT.
                    ENDIF.
                  ENDIF.
                ELSEIF tfield_attr-inttype = 'C'.
                  TRANSLATE f_value TO UPPER CASE.
                  <f1> = f_value.
                ELSE.
                  TRANSLATE f_value USING ', '.
                  CONDENSE f_value NO-GAPS.
                  TRY.
                      <f1> = f_value.
                    CATCH cx_root INTO ref_ptr.
                      text = ref_ptr->get_text( ).
                      sl_status = 1.
                      EXIT.
                  ENDTRY.
                ENDIF.
                SHIFT sline BY tfield_attr-outputlen PLACES.
                SHIFT sline LEFT.
              ENDIF.
              UNASSIGN <f1>.
            ENDLOOP.
            IF sl_status = 0.
              CASE ss_step.
                WHEN 1.  "Delete
                  ADD 1 TO d_stat.
                  APPEND <fs_wtab> TO <fs_itd>.
                WHEN 2.  "Modify
                  ADD 1 TO m_stat.
                  APPEND <fs_wtab> TO <fs_itm>.
              ENDCASE.
            ENDIF.
          ENDIF.
        ENDDO.
        IF sl_status = 0.
          IF d_stat IS NOT INITIAL.
            slchar = d_stat.
            CONCATENATE 'Deleted -' slchar 'record.' INTO text
              SEPARATED BY space.
            DELETE (tabname) FROM TABLE <fs_itd>.
          ENDIF.
          IF m_stat IS NOT INITIAL.
            slchar = m_stat.
            CONCATENATE text 'Modified -' slchar 'record.' INTO text
              SEPARATED BY space.
            MODIFY (tabname) FROM TABLE <fs_itm>.
          ENDIF.
          IF d_stat IS INITIAL AND m_stat IS INITIAL.
            MESSAGE 'No changes were done' TYPE 'S'.
          ELSE.
            MESSAGE text TYPE 'S'.
          ENDIF.
          LEAVE.
        ELSE.
          MESSAGE text TYPE 'I'.
          EXIT.
        ENDIF.
      ELSE.
        LEAVE.
      ENDIF.
  ENDCASE.
*--END--
Below is Function for a Dynamic Selection Screen
FUNCTION zstan_selections.
""Local interface:
*"  IMPORTING
*"     VALUE(TABNAME) LIKE  DD02L-TABNAME DEFAULT 'ZSCARE'
*"  EXPORTING
*"     VALUE(DS_CLAUSES) TYPE  RSDS_WHERE
*"  EXCEPTIONS
*"      TABLE_NOT_VALID
*"      OTHER_ERROR
  DATA texpr TYPE rsds_texpr.
  DATA twhere TYPE rsds_twhere.
  DATA trange TYPE rsds_trange.
  DATA BEGIN OF qcat.                    "Selections View for
          INCLUDE STRUCTURE rsdsqcat.    "Free Selectoptions
  DATA END OF qcat.
  DATA BEGIN OF tabs OCCURS 10.
          INCLUDE STRUCTURE rsdstabs.
  DATA END   OF tabs.
  DATA BEGIN OF fields OCCURS 10.
          INCLUDE STRUCTURE rsdsfields.
  DATA END   OF fields.
  DATA BEGIN OF efields OCCURS 10.
          INCLUDE STRUCTURE rsdsfields.
  DATA END   OF efields.
  DATA selid LIKE rsdynsel-selid.
  DATA actnum LIKE sy-tfill.
  DATA title LIKE sy-title VALUE 'Selection Screen'.
  DATA: maxnum LIKE sy-subrc VALUE '69'.
  CLEAR    tabs.
  tabs-prim_tab = tabname.
  COLLECT  tabs.
  DATA: position LIKE dd03l-position.
  DATA: keyflag  LIKE dd03l-keyflag.
  CLEAR fields.
  fields-tablename = tabname.
  fields-sign      = 'I'.
  DATA: step LIKE sy-subrc.
  SELECT fieldname keyflag position
    INTO (fields-fieldname, keyflag, position)
    FROM dd03l
    WHERE tabname = tabname
      AND fieldname NOT LIKE '.INCLU%'
      AND datatype NE 'CLNT'
    ORDER BY position.
    ADD 1 TO step.
    CHECK step LE maxnum.
    IF keyflag <> 'X'.
      efields = fields.
      APPEND efields.
    ENDIF.
    APPEND fields.
  ENDSELECT.
  IF sy-subrc <> 0.
    RAISE table_not_valid.
  ENDIF.
  CALL FUNCTION 'FREE_SELECTIONS_INIT'
    EXPORTING
      expressions              = texpr
      kind                     = 'F'
    IMPORTING
      selection_id             = selid
      expressions              = texpr
      where_clauses            = twhere
      field_ranges             = trange
      number_of_active_fields  = actnum
    TABLES
      tables_tab               = tabs
      fields_tab               = fields
      fields_not_selected      = efields
    EXCEPTIONS
      fields_incomplete        = 01
      fields_no_join           = 02
      field_not_found          = 03
      no_tables                = 04
      table_not_found          = 05
      expression_not_supported = 06
      incorrect_expression     = 07
      illegal_kind             = 08
      area_not_found           = 09
      inconsistent_area        = 10
      kind_f_no_fields_left    = 11
      kind_f_no_fields         = 12
      too_many_fields          = 13.
  IF sy-subrc = 0.
    CALL FUNCTION 'FREE_SELECTIONS_DIALOG'
      EXPORTING
        selection_id            = selid
        title                   = title
      IMPORTING
        where_clauses           = twhere
        expressions             = texpr
        field_ranges            = trange
        number_of_active_fields = actnum
      TABLES
        fields_tab              = fields
      EXCEPTIONS
        internal_error          = 01
        no_action               = 02
        no_fields_selected      = 03
        no_tables_selected      = 04
        selid_not_found         = 05.
    IF sy-subrc = 0.
      CLEAR ds_clauses.
      MOVE tabname TO ds_clauses-tablename.
      READ TABLE twhere WITH KEY ds_clauses-tablename INTO ds_clauses.
      IF sy-subrc <> 0.
        RAISE other_error.
      ENDIF.
    ELSE.
      RAISE other_error.
    ENDIF.
  ELSE.
    RAISE other_error.
  ENDIF.
ENDFUNCTION.
Regards,
Shiva

Similar Messages

  • Reg: Creation of Table Types

    Hi All,
    I have a small question regaridng the creation of Table type.
    Let us suppose I am creating Table type for a custom table zsample which is having 5 fields. I am generally creating a structure similar to custom table and using that structure as line type for the table type. Let us suppose if there are any changes in the custom table like change in the order of fields or if new fields are added the table type will give dump.
    My question is If I use the custom table itself as a line type, will there be any effect in the performance or some thing or I can go ahead and use it..
    Thanks,
    Ravee

    What dump are you expecting ???
    It is idea behind the creation with reference to get structures and tables which always look like
    the tables they refer to.
    I can not see a possibilty for a dump as long as you create only an internal table.
    A dump could appear, if the internal table is later used to update another db-table. But there it should be clear that the structure of an internal should be created with reference to the tables which they change.
    Siegfried

  • Creation of Table Dynamically.

    Hi friends,
            I am creating one application in Webdynpro java for creating Table dynamically at run time. But i am getting error after deploying the application.
          I am getting this error :-
          error at runtime table "com.sap.tc.webdynpro.services.exceptions.WDRuntimeException: View: Cannot add element with duplicate ID "tb" of type com.sap.tc.webdynpro.clientserver.uielib.standard.impl.Table "
        how to solve this error.
    Thanks & Regards,
    Murali

    Hi Vijay,
         Yes , solved My problem. I am missing in my code that Condition
              if(firsttime){}
       That's why i am getting that type of error. Thanks for updating proper information.
    Thanks & Regards,
    Murali

  • Creation of internal table dynamically based on the Date Range entered

    Hi SAPgurus,
    I have been facing one issue i.e creation of internal table dynamically based on the date range entered in the selection screen. For example the date range I am giving as 06/2006 to 08/2006, it should display the Fieldcatelog dynamically, this part i have completed but the only issue I am facing is to populate the sales data into that fields.
    Right now my program is displaying the ALV like this.
    Ex:
    <b>CSR    District   06/2006  07/2006  08/2006  totals</b>      
    Shiva      New York                             10.00
    Shiva      new york                             30.00
    Shiva      new york                             40.00
    but it should display like this
    <b>CSR    District 06/2006 07/2006 08/2006 totals</b>
    Shiva  New York  10.00   30.00 40.00
    80.00                 
    Please help me in this scenario, how to acheive like this..
    Thanks & Regards,
    Sivaram Kandula

    Hi Sivaram,
                 I also got the same requirement . i saw rich and your code whatever you have uploaded.i have created dynamic internal table but i am facing the issue to populating the data to my dynamic internal table.
    Sivaram, can you please explain your code after this.
    *<dyn_table>
    *tab_item.
      LOOP AT tab_item.
        ASSIGN COMPONENT 1 OF STRUCTURE <dyn_wa> TO <dyn_table>.
        ASSIGN COMPONENT 2 OF STRUCTURE <dyn_wa> TO <dyn_table>.
    *    <dyn_wa> = tab_item-bztxt.
    *    <dyn_wa> = tab_item-total.
    *    APPEND <dyn_wa> TO <dyn_table>.
    **    <dyn_wa> = tab_item-total.
    **    ASSIGN tab_item-bezei  TO <dyn_wa>.
    *  APPEND <dyn_table>.
      ENDLOOP.
    how you are puting the loop at tab_item. but tab_item is already commented.
    can you send me the code after that.
    i am sending some part of my code.
    CALL METHOD cl_alv_table_create=>create_dynamic_table
       EXPORTING
         it_fieldcatalog = gt_fCAT1
       IMPORTING
         ep_table        = new_table.
    ASSIGN new_table->* TO <dyn_table>.
       create data new_line like line of <dyn_table>.
       assign new_line->* to <dyn_wa>.
    select vbeln
            fkart
            vkorg
            vtweg
            fkdat
            spart
            fksto
            from vbrk
            client specified
            into table gt_vbrk
            where mandt = sy-mandt
            and fkart in ('ZF5','ZFR')
            and vkorg = '1100'
            and vtweg = '20'
            and fkdat in s_fkdat
            and spart = '06'
            and fksto = ' '.
       if gt_vbrk[] is not initial.
      select  vbeln
              fkimg
              prsdt
              netwr
              matnr
              arktx
              werks
              mwsbp
              from vbrp
              client specified
              into table gt_vbrp
              for all entries in gt_vbrk
              where vbeln = gt_vbrk-vbeln
              and werks in s_werks
              and matnr in s_matnr.
      endif.
    select mnr ltx spras from t247
    into table it_t247
    where spras = 'E'.
    data: lv_month1 type vbrp-prsdt,
           name1(3) type c,
           s_month type string,
            s_month1 type string,
             s_month2 type string.
    *      lv_netwr1 type vbrp-netwr,
    *          lv_mwsbp1 type vbrp-mwsbp.
          loop at gt_vbrp into gs_vbrp.
            gs_final2-matnr = gs_vbrp-matnr.
            gs_final2-arktx = gs_vbrp-arktx.
            gs_final2-fkimg = gs_vbrp-fkimg.
           lv_month1 = gs_vbrp-prsdt.
            read table it_t247 into wa_t247 with key mnr = lv_month1+4(2).
            if sy-subrc eq 0.
            name1 =  wa_t247-ltx.
            endif.
             concatenate  name1
                       lv_month1(4) into s_month SEPARATED BY '_' .
             CONCATENATE S_MONTH 'QTY' INTO S_MONTH1 SEPARATED BY ''.
              CONCATENATE S_MONTH 'VALUE' INTO S_MONTH2 SEPARATED BY ''.
             gs_final2-month = s_month.
              lv_netwr1 = gs_vbrp-netwr.
            lv_mwsbp1 = gs_vbrp-mwsbp.
            gs_final2-MONTH_QTY = S_MONTH1.
            GS_FINAL2-MONTH_VAL = S_MONTH2.
            gs_final2-value = lv_netwr1 + lv_mwsbp1.
           append gs_final2 to gt_final2.
           clear: gs_final2. "lv_name2.
           endloop.
           if gt_final2[] is not initial.
             sort gt_final2 by matnr month ascending .
             loop at gt_final2 into gs_final2.
            gs_final2_01 = gs_final2.
         collect gs_final2_01 into gt_final2_01.
        endloop.
           endif.
       ENDIF..
    Regards
    Ankur

  • Static Tables Creation In oracle & Diff Between Static table ,Dynamic table

    Static Tables Creation In oracle & Diff Between Static table ,Dynamic table

    972471 wrote:
    Static Tables Creation In oracle & Diff Between Static table ,Dynamic tableAll tables in a well designed application should be static tables.
    Whilst it's possible to execute dynamic code and therefore create tables dynamically at run time, this is considered poor design and should be avoided in 99.99% of cases... though for some reason some people still think they need to do this, and it's never really justified.
    So what issue are you facing that you need to even bother considering dynamic tables?

  • Help required in creation of Dictionary table dynamically

    Hello All,
    I have created DDIC table created dynamically.
    But what i require is! the dictionary table which i have created should be under the package name as given by the customer.
    I have seen in FM DDIF_TABL_PUT  the parameter dd02v-APPLCLASS is the write parameter to create the table under the required package. This field is of length char 4 only.
    Normally the package name will be greater than char4 and also it happend in my case that the package name is more than char4.
    Now i am unable to create the table dynamically under the specified pacakage of the customer
    How can i solve this problem?
    Can any one help me in this issue?
    Regards,
    Gupta

    Hi Lakshman,
    Thank you for your reply,
    I have used the FM which you have mentioned but i didn't work. I mean when i see the attributes of the table, package is still empty.
    Can you help me to solve the problem.
      CALL FUNCTION 'TR_TADIR_INTERFACE'
        EXPORTING
    *     WI_DELETE_TADIR_ENTRY                = ' '
    *     WI_REMOVE_REPAIR_FLAG                = ' '
    *     WI_SET_REPAIR_FLAG                   = ' '
    *     WI_TEST_MODUS                        = 'X'
          wi_tadir_pgmid                       = 'R3TR'
          wi_tadir_object                      = 'TABL'
          wi_tadir_obj_name                    = lv_objname
    *     WI_TADIR_KORRNUM                     = ' '
    *     WI_TADIR_SRCSYSTEM                   = ' '
    *     WI_TADIR_AUTHOR                      = ' '
         wi_tadir_devclass                    = 'ZV/HF/PLANNING'
    *     WI_TADIR_MASTERLANG                  = ' '
    *     WI_TADIR_CPROJECT                    = ' '
    *     WI_TADIR_VERSID                      = ' '
    *     WI_REMOVE_GENFLAG                    = ' '
    *     WI_SET_GENFLAG                       = ' '
    *     WI_READ_ONLY                         = ' '
    *     IV_SET_EDTFLAG                       = ' '
    *   IMPORTING
    *     NEW_GTADIR_ENTRY                     =
    *     NEW_TADIR_ENTRY                      =
       EXCEPTIONS
         tadir_entry_not_existing             = 1
         tadir_entry_ill_type                 = 2
         no_systemname                        = 3
         no_systemtype                        = 4
         original_system_conflict             = 5
         object_reserved_for_devclass         = 6
         object_exists_global                 = 7
         object_exists_local                  = 8
         object_is_distributed                = 9
         obj_specification_not_unique         = 10
         no_authorization_to_delete           = 11
         devclass_not_existing                = 12
         simultanious_set_remove_repair       = 13
         order_missing                        = 14
         no_modification_of_head_syst         = 15
         pgmid_object_not_allowed             = 16
         masterlanguage_not_specified         = 17
         devclass_not_specified               = 18
         specify_owner_unique                 = 19
         loc_priv_objs_no_repair              = 20
         gtadir_not_reached                   = 21
         object_locked_for_order              = 22
         change_of_class_not_allowed          = 23
         no_change_from_sap_to_tmp            = 24
         OTHERS                               = 25
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
    Regards,
    Lisa
    Edited by: Lisa Roy on Apr 9, 2008 11:37 AM

  • Problem regarding the creation of Table using CSS.

    Hi ,
    Here I have a Problem regarding the creation of Table using CSS.
    In My Application i have a table with multiple rows(Rows are Dynamically added to the table).First i am setting the table with the following properties:
    width:900px;
    height : auto,
    Overflow : visible,
    Max-height: : 200px.
    If I use above properties,I'm getting a table with 5 or 6 rows(height upto 200px).After that i am getting the Vertical ScrollBar.
    The problem is when a table has many columns, Vertical and Horizontal Scrolls are coming at the time of setting the table. The table height is not Increasing dynamically.
    How can i use "height" property in CSS? (I want the table height to be increased when the columns are more.)
    Thanks & Regards
    Madhavi

    Hey humble user. Errr I'm trying to understand what ur trying to do. U want to create a section of a region destructively from an existing region right? If so select the option convert to new region (opt-comm-R or selecting it by right clicking). Check your audio bin to make sure. Whats the "merge" function? Are u refering to the glue tool?

  • How to create a table dynamically

    Hello All,
    I want to create a table dynamically in DDIC. I know that there is function module exist DB_CREATE_TABLE but i am getting some errors while using it.
    Could any please post some code for it.
    Regards,
    Lisa

    Here is the code i have writen my self.
    PARAMETERS: tabname TYPE dd02l-tabname,
                fldname TYPE dd03p-fieldname,
                rollname TYPE dd03p-rollname.
    DATA: gt_cl_bc_dyn TYPE REF TO zcl_bc_dyn,
          status TYPE sy-subrc.
    data: lct_table type ZTT_ZTSITAB.
    INITIALIZATION.
      tabname = 'ZTEST1'.
      CREATE OBJECT gt_cl_bc_dyn.
    START-OF-SELECTION.
      CALL METHOD gt_cl_bc_dyn->create_table
        EXPORTING
          tabname   = tabname
          fieldname = fldname
          rollname  = rollname
          itab      = lct_table
        IMPORTING
          status    = status    .
      IF status = 0.
        WRITE: 'Table creation is successful'.
      ELSE.
        WRITE: 'Table creation is unsuccessful'.
      ENDIF.
    Code in the method
    METHOD create_table.
      DATA: ls_dd02v_wa TYPE dd02v,
            ls_dd09l_wa TYPE dd09l,
            ls_dd03p TYPE dd03p,
            lt_dd03p TYPE TABLE OF dd03p,
            rc TYPE sy-subrc.
      ls_dd02v_wa-tabname = tabname.
      ls_dd02v_wa-tabclass = 'TRANSP'.
      ls_dd02v_wa-contflag = 'A'.
      ls_dd09l_wa-tabname = tabname.
      ls_dd09l_wa-tabkat = '0'.
      ls_dd09l_wa-tabart = 'APPL0'.
      ls_dd03p-tabname = tabname.
      ls_dd03p-fieldname = fieldname.
      ls_dd03p-position = '0001'.
      ls_dd03p-keyflag = 'X'.
      ls_dd03p-rollname = rollname.
      APPEND ls_dd03p TO lt_dd03p.
      CALL FUNCTION 'DDIF_TABL_PUT'
        EXPORTING
          name                    = tabname
         dd02v_wa                = ls_dd02v_wa
         dd09l_wa                = ls_dd09l_wa
       TABLES
         dd03p_tab               = lt_dd03p
       EXCEPTIONS
         tabl_not_found          = 1
         name_inconsistent       = 2
         tabl_inconsistent       = 3
         put_failure             = 4
         put_refused             = 5
         OTHERS                  = 6
      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 FUNCTION 'DDIF_TABL_ACTIVATE'
        EXPORTING
          name              = tabname
       IMPORTING
         rc                = rc
       EXCEPTIONS
         not_found         = 1
         put_failure       = 2
         OTHERS            = 3
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
      status = rc.
    ENDMETHOD.

  • How to create New columns for the Internal Table Dynamically?

    HI Guys,
                          In my logic i have to create new columns depending on the logic which i am executing.
    My requirement is .I have to display o/p like this
    Material || Year || Period  ||  Mix ratio || Vendor ||Mix Ratio || Vendor || Mix Ratio Vendor || Mix ratio || Vendor || Mix ratio.............................from table's CKMLMV003 and CKMLMV001.Her i have to display the o/p in the above format and i have to display Vendor and Mix Ratio for 5 columns irrespective of data .If i have more than 5 columns for any record then i have to create a New columns dynamically for Vendor and Mix ratio.If anybody want my code i can Submit But plz tell with example how to do?
                    <b>The O/P must be finally shown in ALV Grid</b>
    Thanks,
    Gopi

    You must create the entire internal table dynamically, you can not add columns to a statically define internal table.  Here is an example of creating a dynamic internal table.
    Creation of internal table dynamically based on the Date Range entered
    Regards,
    Rich Heilman

  • How to find the number of columns in an internal table DYNAMICALLY ?

    Hi,
    How to find the number of columns in an internal table DYNAMICALLY ?
    Thanks and Regards,
    saleem.

    Hi,
    you can find the number of columns and their order using
    the <b>'REUSE_ALV_FIELDCATALOG_MERGE'</b>
    call function 'REUSE_ALV_FIELDCATALOG_MERGE'
    EXPORTING
       I_PROGRAM_NAME               = sy-repid
       I_INTERNAL_TABNAME           = 'ITAB'
       I_INCLNAME                   = sy-repid
      changing
        ct_fieldcat                  = IT_FIELDCAT
    EXCEPTIONS
       INCONSISTENT_INTERFACE       = 1
       PROGRAM_ERROR                = 2
       OTHERS                       = 3
    if sy-subrc <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
             WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    endif
    now describe your fieldcat . and find no of columns.
    and their order also..
    regards
    vijay

  • Please!!!!!!   How can i add rows in html table dynamically [use jsp,bean]

    hello, i am a fresher in jsp. i want to add new rows in html table dynamically.In my coding, just only shows in one row . please help my problem with correct coding and i don't want to use database. Thanks ...............!
    Here is my coding-------------------
    ---------------- form.jsp --------------------->
    <%@ page import="java.util.*,newtest1.Validation" %>
    <jsp:useBean id="mybean" scope="page" class="newtest1.Validation" />
    <jsp:setProperty name="mybean" property="name" param="name" />
    <jsp:setProperty name="mybean" property="age" param="age" />
    <% s[i][j] %>
    <html>
    <head><title>Form</title></head>
    <body>
    <form method="get">
    <table border="0" width="700">
    <tr>
    <td width="150" align="right">Name</td>
    <td width="550" align="left"><input type="text" name="name" size="35"></td>
    </tr>
    <tr>
    <td width="150" align="right">Age</td>
    <td width="550" align="left"><input type="text" name="age" size="35"></td>
    </tr>
    </table>
    <table width="100%" border="0" cellspacing="0" cellpadding="5">
    <tr><td> </td></tr>
    <tr><td><input type="submit" name="submit" value="ADD"></td></tr>
    <tr><td> </td></tr>
    <tr><td width="100%" align="center" border=1>
    <% int count=mybean.getStart();
    for(int i=count; i<count+1; i++) { %>
    <tr>
    <td><jsp:getProperty name="mybean" property="name" /></td>
    <td><jsp:getProperty name="mybean" property="age" /></td>
    <td><%= count %></td>
    <% count+=1; %>
    </tr>
    <% } %></td></tr>
    </table>
    </form>
    </body>
    </html>
    ----------------- Validation.java ----------------->
    package newtest1;
    import java.util.*;
    public class Validation {
    private String name;
    private String age;
    static int start=0;
    public Validation() {    name=null;
    age=null;
    ++start;}
    public void setName(String username) { if(username!="")
    name=username;
    public String getName() { return name;  }
    public void setAge(String userage) {  if (age!="")
    {age=userage;}
    public String getAge() {  return age;   }
    public int getStart() {
    return start; }

    Hi, Do you mean to say,
    You have an HTML page in which you have a text field and an add button. If you enter anything in that text field and click on Add button the text field contents should be displayed in the same HTML page and you should be able to go on entering new values into the text field and you should be able to retain and display all the previously entered values..
    and finally the list of added items are not stored in the database..
    If this is the case
    i. Your html form should be submitted to the same page.
    ii. You need to have a Vector which holds the entered values.
    iii. Bind the vector object to the request object and collect the same vector object from the request and display its contents...
    I think this would help...

  • How to make columns in a table dynamic

    Hi,
    I want to make the columns of a table dynamic.
    At design time I dont know how many columns will be required.
    Rows are made dynamic by using the bean concept.
    Please help me in this reference(columns).
    Thanks
    Pooja

    Hi, i don't know how you create the rows dynamically but
    have you tried to use a forEach?
    <af:table ...>
    <af:forEach items="..." var="...">
    <af:column headerText="...">
    <af:outputText value="..."/>
    </af:column>
    </af:forEach>
    </af:table>
    here there is an example of a dynamic panelList:
    <af:panelList rows="3" maxColumns="6">
    <af:forEach items="#{bindings.ContratosView1.rangeSet}" var="li">
    <af:commandLink text="#{li.Codigo}" action="Edit"/>
    </af:forEach>
    </af:panelList>

  • Error While creating Table dynamically

    Hello gurus,
    I am trying to create a table dynamically in OA Page. For this I have added an Empty TableLayoutBean called "TestTableLayoutRN" in My PG. and In the controller's process request I have added following Code
    public void processRequest(OAPageContext pageContext, OAWebBean webBean)
    System.out.println("TableBeanCO:ProcessRequest");
    super.processRequest(pageContext, webBean);
    OAApplicationModule am = pageContext.getApplicationModule(webBean);
    Serializable[] parameters = null;
    //am.invokeMethod("rollbackSupplier");
    OATableLayoutBean tableLayoutBean = (OATableLayoutBean)webBean.findIndexedChildRecursive("TestTableLayoutRN");
    OARowLayoutBean row = (OARowLayoutBean)createWebBean(pageContext,
    OAWebBeanConstants.ROW_LAYOUT_BEAN,null,"rowHeader");
    tableLayoutBean.addIndexedChild(row);
    OACellFormatBean cell = (OACellFormatBean)createWebBean(pageContext,
    OAWebBeanConstants.CELL_FORMAT_BEAN,null,"cellHeader");
    row.addIndexedChild(cell);
    System.out.println("TableBeanCO:End ProcessRequest");
    But I am getting null pointer exception on the Line tableLayoutBean.addIndexedChild(row);
    when I am trying to add the row to this table..
    Can you please help why I am getting this error?
    Exception Details.
    oracle.apps.fnd.framework.OAException: java.lang.NullPointerException
         at oracle.apps.fnd.framework.OAException.wrapperException(OAException.java:888)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:597)
         at oracle.apps.fnd.framework.webui.OAWebBeanTableHelper.processRequest(OAWebBeanTableHelper.java:2084)
         at oracle.apps.fnd.framework.webui.beans.table.OATableBean.processRequest(OATableBean.java:1030)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.beans.layout.OAStackLayoutBean.processRequest(OAStackLayoutBean.java:350)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.OAPageLayoutHelper.processRequest(OAPageLayoutHelper.java:1095)
         at oracle.apps.fnd.framework.webui.beans.layout.OAPageLayoutBean.processRequest(OAPageLayoutBean.java:1569)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.beans.form.OAFormBean.processRequest(OAFormBean.java:385)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.beans.OABodyBean.processRequest(OABodyBean.java:353)
         at oracle.apps.fnd.framework.webui.OAPageBean.processRequest(OAPageBean.java:2298)
         at oracle.apps.fnd.framework.webui.OAPageBean.preparePage(OAPageBean.java:1711)
         at oracle.apps.fnd.framework.webui.OAPageBean.preparePage(OAPageBean.java:497)
         at oracle.apps.fnd.framework.webui.OAPageBean.preparePage(OAPageBean.java:418)
         at OA.jspService(OA.jsp:40)
         at com.orionserver.http.OrionHttpJspPage.service(OrionHttpJspPage.java:56)
         at oracle.jsp.runtimev2.JspPageTable.service(JspPageTable.java:317)
         at oracle.jsp.runtimev2.JspServlet.internalService(JspServlet.java:465)
         at oracle.jsp.runtimev2.JspServlet.service(JspServlet.java:379)
         at javax.servlet.http.HttpServlet.service(HttpServlet.java:853)
         at com.evermind.server.http.ServletRequestDispatcher.invoke(ServletRequestDispatcher.java:727)
         at com.evermind.server.http.ServletRequestDispatcher.forwardInternal(ServletRequestDispatcher.java:306)
         at com.evermind.server.http.HttpRequestHandler.processRequest(HttpRequestHandler.java:767)
         at com.evermind.server.http.HttpRequestHandler.run(HttpRequestHandler.java:259)
         at com.evermind.server.http.HttpRequestHandler.run(HttpRequestHandler.java:106)
         at EDU.oswego.cs.dl.util.concurrent.PooledExecutor$Worker.run(PooledExecutor.java:803)
         at java.lang.Thread.run(Thread.java:534)
    ## Detail 0 ##
    java.lang.NullPointerException
         at xx.oracle.apps.fnd.webui.TableBeanCO.processRequest(TableBeanCO.java:79)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:581)
         at oracle.apps.fnd.framework.webui.OAWebBeanTableHelper.processRequest(OAWebBeanTableHelper.java:2084)
         at oracle.apps.fnd.framework.webui.beans.table.OATableBean.processRequest(OATableBean.java:1030)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.beans.layout.OAStackLayoutBean.processRequest(OAStackLayoutBean.java:350)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.OAPageLayoutHelper.processRequest(OAPageLayoutHelper.java:1095)
         at oracle.apps.fnd.framework.webui.beans.layout.OAPageLayoutBean.processRequest(OAPageLayoutBean.java:1569)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.beans.form.OAFormBean.processRequest(OAFormBean.java:385)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:932)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequestChildren(OAWebBeanHelper.java:899)
         at oracle.apps.fnd.framework.webui.OAWebBeanHelper.processRequest(OAWebBeanHelper.java:640)
         at oracle.apps.fnd.framework.webui.OAWebBeanContainerHelper.processRequest(OAWebBeanContainerHelper.java:247)
         at oracle.apps.fnd.framework.webui.beans.OABodyBean.processRequest(OABodyBean.java:353)
         at oracle.apps.fnd.framework.webui.OAPageBean.processRequest(OAPageBean.java:2298)
         at oracle.apps.fnd.framework.webui.OAPageBean.preparePage(OAPageBean.java:1711)
         at oracle.apps.fnd.framework.webui.OAPageBean.preparePage(OAPageBean.java:497)
         at oracle.apps.fnd.framework.webui.OAPageBean.preparePage(OAPageBean.java:418)
         at OA.jspService(OA.jsp:40)
         at com.orionserver.http.OrionHttpJspPage.service(OrionHttpJspPage.java:56)
         at oracle.jsp.runtimev2.JspPageTable.service(JspPageTable.java:317)
         at oracle.jsp.runtimev2.JspServlet.internalService(JspServlet.java:465)
         at oracle.jsp.runtimev2.JspServlet.service(JspServlet.java:379)
         at javax.servlet.http.HttpServlet.service(HttpServlet.java:853)
         at com.evermind.server.http.ServletRequestDispatcher.invoke(ServletRequestDispatcher.java:727)
         at com.evermind.server.http.ServletRequestDispatcher.forwardInternal(ServletRequestDispatcher.java:306)
         at com.evermind.server.http.HttpRequestHandler.processRequest(HttpRequestHandler.java:767)
         at com.evermind.server.http.HttpRequestHandler.run(HttpRequestHandler.java:259)
         at com.evermind.server.http.HttpRequestHandler.run(HttpRequestHandler.java:106)
         at EDU.oswego.cs.dl.util.concurrent.PooledExecutor$Worker.run(PooledExecutor.java:803)
         at java.lang.Thread.run(Thread.java:534)

    I am not very sure - but I seem to remember that you need to call tableBean.prepareForRendering() before you start altering it... well - dont count on my suggestion to work.. I had tried something similar 3 years ago... and speaking from what little i remember from then...

  • Problem creating an internal table dynamically

    Hi,
    I'm trying to create an internal table dynamically as i would be able to determine the structure of the table based on the user input.
    I've used the sample code from this forum ...
    REPORT  ZRICH_0003       .
    type-pools: slis.
    field-symbols: <dyn_table> type standard table,
                   <dyn_wa>,
                   <dyn_field>.
    data: alv_fldcat type slis_t_fieldcat_alv,
                   it_fldcat type lvc_t_fcat.
                   type-pools : abap.
    data : it_details type abap_compdescr_tab,
           wa_details type abap_compdescr.
    data : ref_descr type ref to cl_abap_structdescr.
    data: new_table type ref to data,
          new_line  type ref to data,
          wa_it_fldcat type lvc_s_fcat.
          selection-screen begin of block b1 with frame title text.
    parameters: p_table(30) type c.
    selection-screen end of block b1.
    Get the structure of the table.
    ref_descr ?= cl_abap_typedescr=>describe_by_name( p_table ).
    it_details[] = ref_descr->components[].
    loop at it_details into wa_details.
      clear wa_it_fldcat.
      wa_it_fldcat-fieldname = wa_details-name .
      wa_it_fldcat-datatype = wa_details-type_kind.
      wa_it_fldcat-inttype = wa_details-type_kind.
      wa_it_fldcat-intlen = wa_details-length.
      wa_it_fldcat-decimals = wa_details-decimals.
      append wa_it_fldcat to it_fldcat .
      endloop.
    Create dynamic internal table and assign to FS
    call method cl_alv_table_create=>create_dynamic_table
                exporting
                it_fieldcatalog = it_fldcat
                importing
                ep_table        = new_table.
    assign new_table->* to <dyn_table>.
    Create dynamic work area and assign to FS
    create data new_line like line of <dyn_table>.
    assign new_line->* to <dyn_wa>.
    <b>* Select Data from table.
    select * into table <dyn_table>           from
    (p_table).</b>
    Write out data from table.
    loop at <dyn_table> into <dyn_wa>.
    do.
    assign component  sy-index  of structure <dyn_wa> to <dyn_field>.
    if sy-subrc <> 0.
    exit.
    endif.
    if sy-index = 1.
    write:/ <dyn_field>.
    else.
    write: <dyn_field>.
    endif.
    enddo.
    endloop.
    I'm able to get the structure of the table that i want, but when i'm trying to select data from the table into this internal table..as highlighted in the sample code above..i'm getting a short dump...saying that ' the database table is 600 bytes wide but the internal table is only 576 bytes wide.
    The internal table is declared as
    field-symbols: <dyn_table> type standard table..
    Could anyone please tell me how to rectify this.
    Thanks in advance,
    Harsha.

    Hi Smitha,
    I'm building the internal table by getting the structure using the method
    cl_abap_typedescr=>describe_by_name( p_table ).
    where p_table is the table name determined dynamically..
    Now using this structure, i'm building an internal table by calling the method
    call method cl_alv_table_create=>create_dynamic_table
    I've checked all the fields after the internal table has been created .. and it contains all the fields of the table that i'm supplying initially..
    But when i read data into that internal table, it gives me that dump..I've described it in this post earlier.
    Any more suggestions would be very helpful.
    Thanks,
    Harsha

  • Reg: Creation of PFILE

    Hi
    I'm a fresh DBA.I'm new to this field and learning Things.Unknowingly i deleted the pfile and made a shutdown to my database..... When i'm trying to start the Database i'm unable to start it. is there any way to create a new pfile..........Please find me the way...
    Advance Thanks
    S.Ram

    Hi,
    What is your Oracle version ? Have you create a spfile before delete pfile ? If the response is no, you need to recreate a pfile manually.
    => It a good way to have a backup of all database files, including pfile (or spfile).
    Nicolas.
    Duplicate case with thread in other forum :
    Re: Reg: Creation of PFILE after DB Shutdown
    Message was edited by:
    N. Gasparotto

Maybe you are looking for

  • 2 TB External Drive no Longer Recognized by iMac 27"

    I have a 2 TB external HD (actually two 1 TB drives housed together in a OQC Mercury Elite Case) that has been working flawlessly for about 10 months as my Time Machine backup to the iMac 27". I have it hooked via FW800. Yesterday I noticed that TM b

  • HELP ME!!!!! pc doesn't recognise Shuffle

    ARRRGGGHHHH!!! annoying the crap out of me... i have tried everything to get my shuffle to work!!!! i baught it off of a friend 3 days ago.... these 3 days i have been trying everything i could think of to get it to work, and still no luck. I have ev

  • Updating Java JRE from 1.5 to 1.6 in Solaris 10 SPARC

    Hi! The server came with the 1.5.0_07 preinstalled , now I want to update it to 1.6.0_11 and downloaded it already. How can I update it ?

  • AD security group memberships not coming over to SP2013.

    This seems to have coincided with applying a number of updates to our SharePoint server via Windows Update over the weekend.  Since then, changes in AD security groups are not being reflected by the appropriate access in SharePoint.  If somebody has

  • Get rid of pop/tick in a segment?

    Hi, i'm new to GB. running 09. Here's what im trying to do. I have an MP3 song from a band im working with, and need to take the intro to one of their songs and loop/stretch it out to about 30 seconds for a video im working on. I think i have the bas