Specifying Dynamic database table

Hi,
    I have a requirement where
your are having a selection screen say tables .Based on the user input,i must display the structure of the table.
If the user gives ekko in the selection screen.my output should have all the fields of the sturcture ekko.It dynamically varies.Suppose all if he gives mseg,it must display the mseg sturcture.Can anyone help me plz.The coding i had done is
REPORT  YCOMPLEXREQ                             .
type-pools : SLIS.
tables : DD02L.
parameter : p_table type DD02L-tabname.
data : ws_table like dd02l-tabname.
field-symbols : <f1> type any table.
data : itab  like table of ws_table with header line.
select single tabname
              from dd02l
              into ws_table
              where tabname = p_table.
assign ws_table to <f1>.
select single * from (ws_table)
          into   <f1>
but it goes to dump saying the output field can not hold the entire data ..
<b></b>good answers will be rewarded with points

check this code....
u need to alter some part of the code....
*& Report  ZLOAD_DYNAMIC_UPLOAD                                        *
REPORT  zload_dynamic_upload MESSAGE-ID zf_cd .
TYPES t_itab1 TYPE zfalsmex_tabline.
DATA: it_itab1 TYPE STANDARD TABLE OF t_itab1 WITH HEADER LINE,
      it_itab_h TYPE STANDARD TABLE OF t_itab1 WITH HEADER LINE,
      v_count TYPE i,
      v_flag.
                     SELECTION-SCREEN                                *
SELECTION-SCREEN BEGIN OF BLOCK b WITH FRAME TITLE text-001.
PARAMETERS: p_file TYPE rlgrap-filename OBLIGATORY,
            p_tabnam LIKE dd02l-tabname OBLIGATORY.
SELECTION-SCREEN END OF BLOCK b.
AT SELECTION SCREEN ON VALUE-REQUEST
*----Gettting the local file with f4 button
AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_file.
  PERFORM get_local_file_name USING p_file.
AT SELECTION-SCREEN ON P_TABNAM
AT SELECTION-SCREEN ON p_tabnam.
  PERFORM at_selectionscreen_on_p_tabnam.
                     START-OF-SELECTION                              *
START-OF-SELECTION.
  PERFORM excel_to_it.
  PERFORM dynamic_it_table.
                     END-OF-SELECTION                                *
END-OF-SELECTION.
  IF v_flag IS INITIAL.
    WRITE: / v_count,text-002,p_tabnam.
  ELSEIF v_flag = 'N'.
    WRITE: / text-003.
  ENDIF.  "if v_flag is initial.
*&      Form  GET_LOCAL_FILE_NAME
      text
     -->P_P_FILE  text
FORM get_local_file_name  USING    p_p_file.
  CALL FUNCTION 'KD_GET_FILENAME_ON_F4'
    CHANGING
      file_name = p_file.
ENDFORM.                    " GET_LOCAL_FILE_NAME
*&      Form  AT_SELECTIONSCREEN_ON_P_TABNAM
      text
-->  p1        text
<--  p2        text
FORM at_selectionscreen_on_p_tabnam .
  DATA: v_tabname LIKE dd02l-tabname.
  SELECT SINGLE tabname INTO v_tabname FROM dd02l WHERE
            tabname = p_tabnam.
  IF sy-subrc <> 0.
    MESSAGE e004 WITH text-004.
  ENDIF.
ENDFORM.                    " AT_SELECTIONSCREEN_ON_P_TABNAM
*&      Form  excel_to_it
      text
-->  p1        text
<--  p2        text
FORM excel_to_it .
  DATA: BEGIN OF it_field OCCURS 0,
          fieldname LIKE dd03l-fieldname,
        END OF it_field.
  DATA: BEGIN OF it_dd03l OCCURS 0,
          tabname LIKE dd03l-tabname,
          fieldname LIKE dd03l-fieldname,
        END OF it_dd03l.
  DATA: BEGIN OF it_field_count OCCURS 0,
          fieldname LIKE dd03l-fieldname,
          count TYPE i,
        END OF it_field_count.
  DATA: l_disp(256).
  CALL FUNCTION 'ZF_ALSM_EXCEL_TO_INTERNAL_TAB'
    EXPORTING
      filename                = p_file
      i_begin_col             = 1
      i_begin_row             = 1
      i_end_col               = 256
      i_end_row               = 1
    TABLES
      intern                  = it_itab_h
    EXCEPTIONS
      inconsistent_parameters = 1
      upload_ole              = 2
      OTHERS                  = 3.
Checking of EXCEL Fieldnames with Tablename Field Names
  LOOP AT it_itab_h.
    TRANSLATE it_itab_h-value TO UPPER CASE.
    MODIFY it_itab_h.
    it_field-fieldname = it_itab_h-value.
    APPEND it_field.
    CLEAR it_field.
  ENDLOOP.
  SELECT tabname
         fieldname
         INTO TABLE it_dd03l
         FROM dd03l
         WHERE tabname = p_tabnam.
  SORT it_dd03l BY fieldname.
  LOOP AT it_field.
    READ TABLE it_dd03l WITH KEY fieldname = it_field-fieldname
                                             BINARY SEARCH.
    IF sy-subrc <> 0 .
      v_flag = 'N'.
      WRITE: / text-005.
      STOP.
    ENDIF.
    CLEAR: it_dd03l.
  ENDLOOP.
Controlling the Repeating Field Names in EXCEL Header
  LOOP AT it_field.
    READ TABLE it_field_count WITH KEY fieldname = it_field-fieldname.
    IF sy-subrc NE 0.
      it_field_count-fieldname = it_field-fieldname.
      it_field_count-count = it_field_count-count + 1.
      APPEND it_field_count.
    ELSE.
      it_field_count-count = it_field_count-count + 1.
      MODIFY it_field_count INDEX sy-tabix.
      CONCATENATE it_field_count-fieldname
                  'is Repeating in EXCEL Header.'
                  INTO l_disp SEPARATED BY space.           "#EC
      WRITE: / l_disp.
      WRITE: / 'So, Please Correct the EXCEL Header and Restart Again.'.
      v_flag = 'N'.
      STOP.
    ENDIF.
    CLEAR: it_field_count.
  ENDLOOP.
  CALL FUNCTION 'ZF_ALSM_EXCEL_TO_INTERNAL_TAB'
    EXPORTING
      filename                = p_file
      i_begin_col             = 1
      i_begin_row             = 2
      i_end_col               = 256
      i_end_row               = 65536
    TABLES
      intern                  = it_itab1
    EXCEPTIONS
      inconsistent_parameters = 1
      upload_ole              = 2
      OTHERS                  = 3.
ENDFORM.                    " excel_to_it
*&      Form  dynamic_it_table
      text
-->  p1        text
<--  p2        text
FORM dynamic_it_table .
  TYPE-POOLS: slis.
  DATA: it_fcat TYPE lvc_t_fcat, "slis_t_fieldcat_alv,
        is_fcat LIKE LINE OF it_fcat,
        ls_layout TYPE slis_layout_alv,
        it_fieldcat TYPE lvc_t_fcat,
        is_fieldcat LIKE LINE OF it_fieldcat,
        new_table TYPE REF TO data,
        new_line TYPE REF TO data,
        ob_cont_alv TYPE REF TO cl_gui_custom_container,
        ob_alv TYPE REF TO cl_gui_alv_grid,
        vg_campos(255) TYPE c,
        i_campos LIKE TABLE OF vg_campos,
        vg_campo(30) TYPE c,
        vg_tables(60) TYPE c.
  FIELD-SYMBOLS: <l_table> TYPE table,
                 <l_line>  TYPE ANY,
                 <l_field> TYPE ANY.
  LOOP AT it_itab_h.
    is_fcat-fieldname = it_itab_h-value.
    is_fcat-ref_field = it_itab_h-value.
    is_fcat-ref_table = p_tabnam.
    APPEND is_fcat TO it_fcat.
  ENDLOOP.
*... Creating the dynamic internal table According to Excel Header
  CALL METHOD cl_alv_table_create=>create_dynamic_table
    EXPORTING
      it_fieldcatalog = it_fcat
    IMPORTING
      ep_table        = new_table.
*... Create a new line
  ASSIGN new_table->* TO <l_table>.
  CREATE DATA new_line LIKE LINE OF <l_table>.
  ASSIGN new_line->* TO <l_line>.
  FIELD-SYMBOLS : <fs_dyn_table> TYPE ANY.
  DATA : w_index TYPE i.
  IF it_itab1[] IS INITIAL.
    v_flag = 'N'.
    WRITE: / text-006.
    STOP.
  ELSE.
    SORT it_itab1 BY zrow zcol.
    LOOP AT it_itab1.
      MOVE : it_itab1-zcol TO w_index.
      ASSIGN COMPONENT w_index OF STRUCTURE <l_line> TO <fs_dyn_table>.
      MOVE it_itab1-value TO <fs_dyn_table>.
      AT END OF zrow.
        APPEND <l_line> TO <l_table>.
      ENDAT.
    ENDLOOP.
  ENDIF.
Start of Creating Table work area
  DATA: BEGIN OF it_fieldname OCCURS 0,
          tabname LIKE dd03l-tabname,
          fieldname LIKE dd03l-fieldname,
          position LIKE dd03l-position,
        END OF it_fieldname.
  SELECT tabname
         fieldname
         position
         INTO TABLE it_fieldname
         FROM dd03l
         WHERE tabname = p_tabnam.
delete it_fieldname[] where fieldname = '.INCLUDE'.
  DELETE it_fieldname[] WHERE fieldname+0(1) = '.'.
  SORT it_fieldname BY position.
  DATA: it_fcat_tw TYPE lvc_t_fcat, "slis_t_fieldcat_alv,
        is_fcat_tw LIKE LINE OF it_fcat,
        ls_layout_tw TYPE slis_layout_alv,
        it_fieldcat_tw TYPE lvc_t_fcat,
        is_fieldcat_tw LIKE LINE OF it_fieldcat,
        new_table_tw TYPE REF TO data,
        new_line_tw TYPE REF TO data,
        ob_cont_alv_tw TYPE REF TO cl_gui_custom_container,
        ob_alv_tw TYPE REF TO cl_gui_alv_grid,
        vg_campos_tw(255) TYPE c,
        i_campos_tw LIKE TABLE OF vg_campos,
        vg_campo_tw(30) TYPE c,
        vg_tables_tw(60) TYPE c.
  FIELD-SYMBOLS: <l_table_tw> TYPE table,
                 <l_line_tw>  TYPE ANY,
                 <l_field_tw> TYPE ANY.
  LOOP AT it_fieldname.
    is_fcat_tw-fieldname = it_fieldname-fieldname.
    is_fcat_tw-ref_field = it_fieldname-fieldname.
    is_fcat_tw-ref_table = p_tabnam.
    APPEND is_fcat_tw TO it_fcat_tw.
  ENDLOOP.
*... Create the dynamic internal table
  CALL METHOD cl_alv_table_create=>create_dynamic_table
    EXPORTING
      it_fieldcatalog = it_fcat_tw
    IMPORTING
      ep_table        = new_table_tw.
*... Create a new line
  ASSIGN new_table_tw->* TO <l_table_tw>.
  CREATE DATA new_line_tw LIKE LINE OF <l_table_tw>.
  ASSIGN new_line_tw->* TO <l_line_tw>.
End of Creating Table work area
  CLEAR: v_count.
  LOOP AT <l_table> INTO <l_line>.
    MOVE-CORRESPONDING <l_line> TO <l_line_tw>.
    MODIFY (p_tabnam) FROM <l_line_tw>.
    IF sy-subrc = 0.
      v_count = v_count + 1.
    ENDIF.
    CLEAR: <l_line>,<l_line_tw>.
  ENDLOOP.
  COMMIT WORK.
ENDFORM.                    " it_dynamic_it_table

Similar Messages

  • Can JDBC specify dynamic Database

    Now we have two DB2 database, with different IP address.
    One of those is running in normal situation, if it is down, the other will automatically start.
    Why this happened, how can the XI get information from the other DB? Is it possible to specify dynamic database destination in JDBC Adapter?
    Thanks in advance.

    Hi YiNing,
    look at my answers in
    Re: JDBC Problem in a Productive Sys!!!
    There is also a further link to a similar problem.
    Regards Mario

  • How to import a dynamic excel sheet to a dynamic database table.

    I am not a developer, but am looking at what is possible in SQL server as I am planning an implementation strategy.
    My requirement is as follows:
    I receive an excel sheet and I do not know what are the columns or the number of columns in the sheet.
    I need to load this sheet data into a dynamic table in SQL server - named based on input excel sheet. The column names should get created from the header row. This should be achieved just by providing excel sheet name & location.
    Thanks

    Hi,
    Try with below links :
    http://micktechblog.blogspot.in/2011/06/ssis-excel-import-with-unknown-number.html
    http://munishbansal.wordpress.com/2009/06/09/dynamic-columns-mapping-%E2%80%93-script-component-as-destination-ssis/
    sathya - www.allaboutmssql.com ** Mark as answered if my post solved your problem and Vote as helpful if my post was useful **.

  • Dynamic internal table operations

    Hi,
    I have an issue with dynamic internal table wherein I need to write  a  select statement with For All Entries on dynamic internal table and populating the record into another dynamic internal table.
    I am trying with the code below but its not working.
    SELECT (FLD)
    FROM (T_TABLE)
    INTO CORRESPONDING FIELDS OF TABLE <DYN1_TABL>
    FOR ALL ENTRIES IN <DYN_TABL>
    WHERE KEY_FNAME = <DYN_TABL>-KEY_FNAME.
    FLD is the dynamic field.
    T_TABLE is the dynamic database table.
    DYN1_TABL is the dynamic internal table
    DYN_TABL is the dynamic internal table
    KEY_FNAME is the dynamic key field of T_TABLE.
    Pls help me on this issue.
    Response with code snippets will be appreciated.
    Thanks in advance.

    Thanks for your reply Nikki but my issue is to reference  a field in dynamic internal table to be used with 'For All Entries' satement.
    like for static we use
    For All Entries in Itab where <fieldname> = itab-<fieldname>
    I was looking for the same statement for dynamic tables

  • At run time,ALV table is displaying all fields of database table

    Hi all
    I done one application using ALv I am displaying the ALV Table.my problem is at run time it was fetching and displaying all the fields in the data base table but i need only the fields which are defined in node.
    Please help me.
    Thanks and Regards
    Tulasi Palnati

    Hi,
    May be you have specified the database table as the Dicitonary structure property of the node.
    Check the same and if its there clear the Dictionary structure property of the node.
    Hope this solves your isse!
    Regards,
    Srilatha

  • Dynamic record deletion from database table

    Hi,
    I need to delete selected records from database table(dynamic names). Table names are being passed from main program with some of their field names. The record to be deleted from the database table is being decided based on the fields passed for the table and their contains passed from the main program.
    It is not possible to write dynamic where clause for DELETE statement directly.
    So, I created a dynamic internal table and i am trying to fetch all records using SELECT statement(for which we can write dynamic where condition, something like...SELECT...WHERE (itab).  ) which need to be deleted in the iternal table.
    Piece of code :
              CONCATENATE c_im v_tablefield1 INTO v_imprtfield1.
              CONCATENATE v_tablefield1 c_in v_imprtfield1
                       into s_condition separated by space.
              APPEND s_condition TO t_condition.
              PERFORM GET_DYNAMIC_ITAB USING s_flds_agtab-tabname
                                    changing t_itab.
              ASSIGN t_itab->* TO <itab>.
    *Select the data (to be deleted) from the database table
               SELECT * FROM (s_flds_agtab-tabname) INTO TABLE <itab>
                 WHERE (t_condition).
    *Delete the records from the table
               IF SY-SUBRC = 0.
                 DELETE (s_flds_agtab-tabname) FROM TABLE <itab>.
               ENDIF.
    Here t_condition is of standard table of WHERETXT.
    t_condition at the run time before giving dump was:
    SPART IN IM_SPART
    AND KUNNR IN IM_KUNNR
    Here IM_SPART is renge type of SPART and IM_KUNNR is renge of KUNNR.
    I am getting a DUMP:
    The WHERE condition has an unexpected format.
    Error analysis                                                                               
    The current ABAP/4 program attempted to execute an ABAP/4 Open SQL
    statement containing a WHERE condition of the form WHERE (itab) or
    WHERE ... AND (itab). The part of the WHERE condition specified at
    runtime in the internal table itab contains the operator         
             IN (v1, ..., vn)                                        
    in incomplete form.                                              
    How to correct the error
    If the error occurred in a non-modified SAP program, you may be  
    able to find a solution in the SAP note system.                  
    If you have access to the note system yourself, use the following
    search criteria:                                                 
    "SAPSQL_IN_ILLEGAL_LIST"                               
    "SAPLZSD_TAB_REFRESH " or "LZSD_TAB_REFRESHU01 "       
    "Z_SD_REFRESH_AGTABLES"                                
    If you cannot solve the problem yourself, please send the
    following documents to SAP:                             
    I would like to know whether "IN" operator is allowed in (itab) of WHERE clause. While testing I changed the "IN" to "=" specifying a suitable value there. It worked. So please let me know if i can give "IN" operator using renge table in the dynamic where clause.
    Thanking you,
    Surya

    Hi again,  so if you can not use the IN in a dynamic where clause you might be forced to dynamically build the entire select statement,  Here is a sample program which may give you some ideas, notice that we are writing the select statement code, putting it in another program and generating the subroutine at runtime, then call this routine.  I'm sure that this will help you see what you need to do.
    report zrich_0003 .
    tables: kna1.
    types: t_source(72).
    data: routine(32) value 'DYNAMIC_SELECT',
                 program(8),
                 message(128),
                 line type i.
    data: isource type table of t_source,
                xsource type t_source.
    ranges:
            r_kunnr for kna1-kunnr.
    data: ikna1 type table of kna1.
    data: xkna1 type kna1.
    r_kunnr-sign = 'I'.
    r_kunnr-option = 'EQ'.
    r_kunnr-low    = '0001000500'.
    append r_kunnr.
    xsource = 'REPORT ZTEMP.'.
    insert xsource  into isource index 1.
    xsource = 'FORM dynamic_select'.
    insert xsource  into isource index 2.
    xsource = 'Tables r_kunnr ikna1.'.
    append xsource to isource.
    xsource = 'select * into table ikna1 from kna1'.
    append xsource to isource.
    xsource = 'where kunnr in r_kunnr.'.
    append xsource to isource.
    xsource = 'ENDFORM.'.
    append xsource to isource.
    generate subroutine pool isource name program
                             message message
                             line line.
    if sy-subrc = 0.
      perform (routine) in program (program) tables r_kunnr
                                                    ikna1.
    else.
      write:/ message.
    endif.
    loop at ikna1 into xkna1.
      write:/ xkna1-kunnr.
    endloop.
    Regards,
    Rich Heilman

  • Dynamic creation of column in database table

    Can I create columns in a database table dynamically?
    Let's say I have two columns in a table. Users requested to have dynamic columns in the table. They wanted to create any no. of fields in the table dynamically. We can't alter the table every now and then. Is there any solution for this. Please let me.
    Your early response is highly appreciated.
    Thanks

    I can't use "Alter" statement every time. User may need to insert any no.of columns dynamically. There is no fixed columns. Right now there are two columns which are static. Somebody said it is durable through XML. Can you please let me know in detail. I haven't not done anything using XML.
    Thanks for the response.

  • Dynamic reading from database table

    Hi Experts,
    While reading from a database table the below statement for deletion works:
    DELETE (p_table) FROM <fs_wadbtab>.
    p_table: name of database table which is entered as a selection screen parameter
    <fs_wadbtab> : workarea of line type P_table
    However, the below statement does not work:
    READ (p_table) FROM <fs_wadbtab>.
    My requirement is to read a record from p_table with contents in a dynamic structure.
    Kindly suggest.
    Thanks.

    Just misunderstood you.
    Edited by: Karri Kemppi on Jun 23, 2010 10:00 AM

  • Urgent......  how to select few fields, from database table, (dynamic ita.)

    Dear all experts,
    I am able to populate all fields data from database table, using dynamic table creation.
    eg,
    SELECT *    FROM (w_tabname)    INTO    TABLE <t_itab>.
    where w_tabname is the table name given by the user, and t_itab is field symbol.
    but some requirement is like that i need to pick up only few fields, <b>which user will give at the runtime.</b>
    <b>I can</b> take those fields from file into any internal table,
    but the problem is that instead of <b>select *</b>, i need to put selected the fields given by user.
    i have tried with field symbol, it is not working (as per my knowledge.)
    do i need to create any structures dynamically ?
    Can anybody please help in this regards ?
    Your help will be surely rewarded with points.
    Waiting for reply..
    Regards
    Vinay

    Hi Vinay ,
    Adding to the below code , you can use some more fields in the select stmt as below:-
    REPORT ychatest.
    PARAMETERS : p_field1 LIKE dd03l-fieldname,
                             P_field2 LIKE dd03l-fieldname,
                             p_table LIKE dd03l-tabname.
    FIELD-SYMBOLS : <fs> TYPE STANDARD TABLE.
    SELECT (p_field1) (p_field2) ( FROM (p_table) INTO TABLE <fs>.
    Now p_field1 & p_field2  belong to the same table since you have give the user to enter only one table name.
    This should work fine.
    please try & let me know .
    Thanks & Regards,
    Daniel

  • Dynamic Stamps from Database Tables

    I'm the librarian for a small custom publisher, and we use Adobe Acrobat Pro 9 to produce products for academic instructors, and MS Excel (2007) to generate and store metadata for each selection/file (sometimes thousands of selections in a batch). Part of our production process requires placing a "credit line" stamp on the first page of each selection, which includes content which resides only in the Excel sheet (source citation info, and the page range of each selection, among other elements). We currently copy and paste this data manually from Excel to a text box on the PDF, which, given the volume of selections to process, simply won't work in the long run.
    I'm wondering if it's possible for an Acrobat plugin or script to read from a database table (Excel, or some other format if need be), and dynamically apply credit line text to a given filename. I've been researching a few different methods, including batch processing of dynamic stamps and a couple commercial plugins, but so far nothing which explicitly addresses this issue. I'd appreciate any help anyone can provide.

    user603743 wrote:
    @sb92075
    Well, we have been in product development for past dozen years. In my humble opinion, we know a thing are two about product design. But thanks for your inputs though.
    Obviously you are not doing so well with this "design"... Just sayin'... :) :)
    You seems to be expert in the application/product design. Have you ever heard of "user data mashup" concept in data warehousing? Just curious.
    "user mashup" would indicate that the user actually controls how this is done. You, as a "product" will be making some [potentially very bad] assumptions about the end-user data that cannot be accounted for in a "canned" product. You can influence how it is done, but, in the end, does it meet the exact business needs of the end-user.
    you could possibly use some PL/SQL packages to
    1) get all of the tables
    2) get all of the columns.
    3) do the mashup.
    Now a question. Let's say table1 and table3 have (col1 + col2) that are the same and column3 is different. What do you put in column3?? or is this another row.
    Edited by: user603743 on May 29, 2013 4:52 PM

  • Create object/structure like dynamic internal table

    Hi,
    We have created dynamic internal table with some fields.
    for the above how to create structure or internal table like dynamic internal table structure .
    Scenario: internal table itab1 ( with header line) have 5 fields.
    Based on some of the conditions in layout of the report.
    we have to create dynamic internal table.
    field-symbols: <FS> type standard table.
    we are able to create dynamic internal table with 3 fields
    with assignment <fs> = itab1[]
    the columns are not appearing but data appearing in next column.
    how to solve this one
    Thanks
    Ramesh

    Hi Ramesh,
      I hope this code works...
    report  yup_alv_datbase                         .
    *-Display Database table contents in ALV Grid Format
    >********************************************************************
    This report displays data from SAP tables, views (like SE16)        *
    FM : REUSE_ALV_GRID_DISPLAY                                         *
    tables:
      dd02l,                               " SAP tables
      dd03l.                               " Table Fields
    type-pools: slis.                      " ALV Global Types
    selection-screen :
    begin of line, comment 1(35) v_1 for field p_table.         "#EC NEEDED
    parameters p_table like dd03l-tabname obligatory memory id dtb.
    selection-screen end of line.
    selection-screen :
    begin of line, comment 1(35) v_2 for field p_max.           "#EC NEEDED
    parameters p_max(2) type n default '20' obligatory.
    selection-screen end of line.
    at selection-screen.
      select single * from dd02l where tabname  = p_table
                                   and as4local = 'A'
                                   and as4vers  = '0000'.
      if sy-subrc ne 0.
      Table & is not active in the Dictionary
        message e402(mo) with p_table.
      elseif dd02l-tabclass = 'INTTAB'.
      & is a structure, not a table
        message e403(mo) with p_table.
      endif.
    initialization.
      v_1 = 'Table'.
      v_2 = 'Maximum of records'.
    start-of-selection.
      perform f_display_data.
         Form  F_DISPLAY_DATA
    form f_display_data.
    Macro definition
      define m_sort.
        add 1 to ls_sort-spos.
        ls_sort-fieldname = &1.
        ls_sort-up = 'X'.
        append ls_sort to lt_sort.
      end-of-definition.
      data:
        l_long type i,
        lp_struct   type ref to data,
        lp_table    type ref to data,      " Pointer to dynamic table
        of_sdescr   type ref to cl_abap_structdescr,
        ls_lvc_cat  type lvc_s_fcat,
        lt_lvc_cat  type lvc_t_fcat,       " Field catalog
        ls_fieldcat type slis_fieldcat_alv,
        lt_fieldcat type slis_t_fieldcat_alv,  " Field catalog
        ls_layout   type slis_layout_alv,
        lt_sort     type slis_t_sortinfo_alv,  " Sort table
        ls_sort     type slis_sortinfo_alv.
      field-symbols :
        <fieldcat>   type slis_fieldcat_alv,
        <lt_data>    type table,           " Data to display
        <fs>         type any,
        <components> type abap_compdescr.
    Dynamic creation of a structure
      create data lp_struct type (p_table).
      assign lp_struct->* to <fs>.
    Fields Structure
      of_sdescr ?= cl_abap_typedescr=>describe_by_data( <fs> ).
      loop at of_sdescr->components assigning <components>.
      Field MANDT not displayed
        if sy-tabix = 1 and <components>-name = 'MANDT'.
          continue.                        " Next loop
        endif.
      Build Fieldcatalog
        ls_lvc_cat-fieldname = <components>-name.
        ls_lvc_cat-ref_table = p_table.
        append ls_lvc_cat to lt_lvc_cat.
      Build Fieldcatalog
        ls_fieldcat-fieldname = <components>-name.
        ls_fieldcat-ref_tabname = p_table.
        append ls_fieldcat to lt_fieldcat.
      endloop.
    Create internal table
      call method cl_alv_table_create=>create_dynamic_table
        exporting it_fieldcatalog = lt_lvc_cat
        importing ep_table = lp_table.
      assign lp_table->* to <lt_data>.
    Read data
      select * from (p_table) up to p_max rows
        into corresponding fields of table <lt_data>
       order by primary key.
      if <lt_data>[] is initial.
      No table entries found for specified key
        message i429(mo).
        exit.
      endif.
    Read key field to Build Sort Table
      select * from dd03l where tabname  = p_table
                            and fieldname <> '.INCLUDE'
                            and as4vers  = '0000'
                            and as4local = 'A'
                          order by position.
        read table lt_fieldcat assigning <fieldcat>
                                with key fieldname = dd03l-fieldname.
        check sy-subrc eq 0.
        add dd03l-leng to l_long.
        if dd03l-keyflag = 'X'.
        Build Sort Table
          m_sort dd03l-fieldname.
          <fieldcat>-key = 'X'.
        elseif l_long > 150.
          <fieldcat>-tech = 'X'.
        endif.
      endselect.
      ls_layout-zebra = 'X'.
      ls_layout-colwidth_optimize = 'X'.
      call function 'REUSE_ALV_GRID_DISPLAY'
           exporting
                is_layout   = ls_layout
                it_fieldcat = lt_fieldcat
                it_sort     = lt_sort
           tables
                t_outtab    = <lt_data>.
    endform.                               " F_DISPLAY_DATA
    END OF PROGRAM Z_ALV_DYNAMIC_DATA *********************
    Regards,
    Sampath

  • Deletion of  a particular record  from database table

    hai friends,
         i want to <b>delete</b> (or)   <b>insert</b> particular record from  predefined sap table... that is with out module pool programming...  can i delete or insert a record to or from  the table..
         thanks in advance
    @jay

    hi,
    ucan do it without module pool programming in your normal report program.
    To insert a line into an index table, use the statement:
    INSERT <line> INTO <itab> [INDEX <idx>].
    <line> is either a work area that is convertible to the line type, or the expression INITIAL LINE. If you use <wa>, the system adds a new line to the internal table <itab> and fills it with the contents of the work area. INITIAL LINE inserts a blank line containing the correct initial value for each field of the structure.
    To select the lines that you want to delete using a condition, use the following:
    DELETE FROM <target> WHERE <cond> .
    All of the lines in the database table that satisfy the conditions in the WHERE clause are deleted. The FROM expression must occur between the keyword and the database table.
    You should take particular care when programming the WHERE clause to ensure that you do not delete the wrong lines. For example, if you specify an empty internal table in a dynamic WHERE clause, all of the lines in the table are deleted.
    If at least one line is deleted, the system sets SY-SUBRC to 0, otherwise to 4. SY-DBCNT contains the number of lines deleted.
    regards,
    keerthi

  • How to dynamic set table names

    In our application, the table name can be set at runtime by the customer. So is there a way in Toplink JPA to set table name at runtime (thru annotation or orm.xml) or programatically? Thanks.

    Our application will host several domains at once. Each domain will get its own set of database tables for each module it uses. We keep them seperate by using a unique prefix. An example would be domainA.com's blog post table would be called domainA_blogPost, while domainB.com's will be domainB_blogPost. Both tables are the same, except for the name. The name needs to be specified at runtime since the central service controller tells the rest of the application which domain it is servicing and thus which set of tables to use. We will be adding domains dynamically all the time and we can't afford to create new entity sets and recompile the back end for every domain we add. I have been looking at the API and wonder if this is as simple as implementing a solution in our application, or am I going to have to tweek the implementation of toplink?

  • How to populate data in dynamic internal table

    Hi Expert,
    fyi. My dynamic internal table field is created base on data selected. Eg. select table qpcd has 5 records.  These 5 recods will become fieldname to my dynamic internal table. My dynamic internal table will be
    ...itab
          01
          02
          03
          04
          05
    The 5 records from qpcd is populated in another table call viqmel.  I need to find the occurance of each code in viqmel and populate the number of occurance in itab in each of column.  The final dynamic itab will be like this
    table itab
    01       02     03    04     05   -
    > field name
    2         0        1     0       1    -
    > data
    my source code like below
    Report ZPLYGRND2.
    TABLES: mara, makt.
    TYPE-POOLS: slis, sydes.
    DATA:it_fcat TYPE slis_t_fieldcat_alv,
         is_fcat LIKE LINE OF it_fcat,
         ls_layout TYPE slis_layout_alv.
    DATA: it_fieldcat TYPE lvc_t_fcat,
          is_fieldcat LIKE LINE OF it_fieldcat.
    DATA: new_table TYPE REF TO data,
          new_line TYPE REF TO data,
          ob_cont_alv TYPE REF TO cl_gui_custom_container,
          ob_alv TYPE REF TO cl_gui_alv_grid,
          vg_campos(255) TYPE c,
          i_campos LIKE TABLE OF vg_campos,
          vg_campo(30) TYPE c,
          vg_tables(60) TYPE c.
    types : begin of t_qpcd,
             codegruppe like qpcd-codegruppe,
             code like qpcd-code,
            end of t_qpcd.
    data:wa_qpcd type t_qpcd,
         i_qpcd type standard table of t_qpcd initial size 0.
    FIELD-SYMBOLS: <l_table> TYPE table,
                   <l_line> TYPE ANY,
                   <l_field> TYPE ANY.
    select * into corresponding fields of wa_qpcd from qpcd
    where katalogart = 'D'
    and   codegruppe = 'OOT01'.
    append wa_qpcd to i_qpcd.
    endselect.
    loop at i_qpcd into wa_qpcd.
      is_fcat-fieldname = wa_qpcd-code.
      APPEND is_fcat TO it_fcat.
    endloop.
    LOOP AT it_fcat INTO is_fcat.
        is_fieldcat-fieldname = is_fcat-fieldname.
        is_fieldcat-ref_field = is_fcat-ref_fieldname.
        is_fieldcat-ref_table = is_fcat-ref_tabname.
        APPEND is_fieldcat TO it_fieldcat.
    ENDLOOP.
    *... Create the dynamic internal table
    CALL METHOD cl_alv_table_create=>create_dynamic_table
        EXPORTING
            it_fieldcatalog = it_fieldcat
        IMPORTING
            ep_table = new_table.
    if sy-subrc = 0.
    endif.
    *... Create a new line
    ASSIGN new_table->* TO <l_table>.
    CREATE DATA new_line LIKE LINE OF <l_table>.
    ASSIGN new_line->* TO <l_line>.
    LOOP AT <l_table> INTO <l_line>.
    ENDLOOP.

    hello dear i m giving u a code in this a dynamic table is made on the basis of table in database , and u can download this data correct it , see it, or even change it....and upload in tht table help full if u dont know the table name...in advance.
    also the code to populate data in dynamic table is in this code like:
    SELECT * FROM (MTABLE_N)
    INTO CORRESPONDING FIELDS OF TABLE <FS_ITAB> .
    look at the whole program .hope this solve ur problem thanks.
    REPORT ZTESTA  MESSAGE-ID ZIMM    .
    TYPES : DATA_OBJECT TYPE REF TO DATA.
    DATA : MITAB TYPE REF TO DATA .
    TYPE-POOLS : SLIS .
    DATA : IT_FIELDCAT TYPE STANDARD TABLE OF SLIS_FIELDCAT_ALV
    WITH HEADER LINE .
    DATA : IT_FIELDCATALOG TYPE LVC_T_FCAT .
    DATA : WA_FIELDCATALOG TYPE LVC_S_FCAT .
    DATA : I_STRUCTURE_NAME LIKE DD02L-TABNAME .
    DATA : I_CALLBACK_PROGRAM LIKE SY-REPID .
    DATA : DYN_LINE TYPE DATA_OBJECT .
    FIELD-SYMBOLS : <FS_ITAB> TYPE STANDARD TABLE .
    DATA : TABLE_NAME_IS_VALID TYPE C .
    DATA : DYNAMIC_IT_INSTANTIATED TYPE C .
    CONSTANTS BUTTONSELECTED TYPE C VALUE 'X' .
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 5(29) T_TABL.
    PARAMETERS : MTABLE_N LIKE RSRD1-TBMA_VAL
    MATCHCODE OBJECT DD_DBTB_16 OBLIGATORY .
    DATA CHECKTABLED.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 5(29) T_FILE.
    PARAMETERS : MFILENAM LIKE RLGRAP-FILENAME .
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 5(29) T_DOWN.
    PARAMETERS : P_DOWNLD RADIOBUTTON GROUP GRP1
    USER-COMMAND M_UCOMM .
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 5(29) T_CHKF.
    PARAMETERS : P_CHKFIL RADIOBUTTON GROUP GRP1 .
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 5(29) T_UPLD.
    PARAMETERS : P_UPLOAD RADIOBUTTON GROUP GRP1 .
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 5(29) T_SHOW.
    PARAMETERS : P_SHOW_T RADIOBUTTON GROUP GRP1 .
    SELECTION-SCREEN END OF LINE.
    AT SELECTION-SCREEN OUTPUT .
      PERFORM CHECK_FILENAME .
    AT SELECTION-SCREEN.
      IF SY-UCOMM = 'ONLI'.
        CHECKTABLED = MTABLE_N+0(1).
        IF CHECKTABLED NE 'Z'.
          MESSAGE I017.
          LEAVE TO SCREEN 1000.
        ENDIF.
        IF SY-UNAME NE 'KAMESH.K'.
          MESSAGE I023 WITH SY-UNAME.
          LEAVE TO SCREEN 1000.
        ENDIF.
      ENDIF.
      IF SY-UCOMM = 'PRIN'.
        CHECKTABLED = MTABLE_N+0(1).
        IF CHECKTABLED NE 'Z'.
          MESSAGE I017.
          LEAVE TO SCREEN 1000.
        ENDIF.
        IF SY-UNAME NE 'KAMESH.K'.
          MESSAGE I023 WITH SY-UNAME.
          LEAVE TO SCREEN 1000.
        ENDIF.
      ENDIF.
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR MFILENAM .
      PERFORM F4_FOR_FILENAME .
    INITIALIZATION .
      T_TABL = 'Table Name' .
      T_FILE = 'File Name' .
      T_DOWN = 'Download Table' .
      T_CHKF = 'Check File to Upload' .
      T_UPLD = 'Upload File' .
      T_SHOW = 'Show Table Contents' .
    START-OF-SELECTION .
      PERFORM CHECK_TABLE_NAME_IS_VALID .
    END-OF-SELECTION .
      IF TABLE_NAME_IS_VALID EQ ' ' .
        MESSAGE I398(00) WITH 'INVALID TABLE NAME' .
      ELSE .
        PERFORM INSTANTIATE_DYNAMIC_INTERNAL_T .
        CHECK DYNAMIC_IT_INSTANTIATED = 'X' .
        CASE BUTTONSELECTED .
          WHEN P_DOWNLD .
            PERFORM SELECT_AND_DOWNLOAD .
          WHEN P_CHKFIL .
            PERFORM CHECK_FILE_TO_UPLOAD .
          WHEN P_UPLOAD .
            PERFORM UPLOAD_FROM_FILE .
          WHEN P_SHOW_T .
            PERFORM SHOW_CONTENTS .
        ENDCASE .
      ENDIF .
    FORM CHECK_TABLE_NAME_IS_VALID.
      DATA MCOUNT TYPE I .
      TABLES DD02L .
      CLEAR TABLE_NAME_IS_VALID .
      SELECT COUNT(*) INTO MCOUNT FROM TADIR
      WHERE PGMID = 'R3TR'
      AND OBJECT = 'TABL'
      AND OBJ_NAME = MTABLE_N .
      IF MCOUNT EQ 1 .
        CLEAR DD02L .
        SELECT SINGLE * FROM DD02L WHERE TABNAME = MTABLE_N .
        IF SY-SUBRC EQ 0.
          IF DD02L-TABCLASS = 'TRANSP' .
            TABLE_NAME_IS_VALID = 'X' .
          ENDIF .
        ENDIF.
      ENDIF .
    ENDFORM. " CHECK_TABLE_NAME_IS_VALID
    FORM SELECT_AND_DOWNLOAD.
      CLEAR : <FS_ITAB> .
      SELECT * FROM (MTABLE_N)
      INTO CORRESPONDING FIELDS OF TABLE <FS_ITAB> .
      PERFORM CHECK_FILENAME.
      CALL FUNCTION 'WS_DOWNLOAD'
           EXPORTING
                FILENAME                = MFILENAM
                FILETYPE                = 'DAT'
           TABLES
                DATA_TAB                = <FS_ITAB>
           EXCEPTIONS
                FILE_OPEN_ERROR         = 1
                FILE_WRITE_ERROR        = 2
                INVALID_FILESIZE        = 3
                INVALID_TYPE            = 4
                NO_BATCH                = 5
                UNKNOWN_ERROR           = 6
                INVALID_TABLE_WIDTH     = 7
                GUI_REFUSE_FILETRANSFER = 8
                CUSTOMER_ERROR          = 9
                OTHERS                  = 10.
      IF SY-SUBRC EQ 0.
        MESSAGE I398(00) WITH 'Table' MTABLE_N
        'successfully downloaded to '
        MFILENAM .
      ENDIF.
    ENDFORM. " SELECT_AND_DOWNLOAD
    FORM UPLOAD_FROM_FILE.
      DATA : ANS TYPE C .
      DATA : LINES_OF_ITAB TYPE I .
      DATA : MSY_SUBRC TYPE I .
      CALL FUNCTION 'POPUP_TO_CONFIRM_STEP'
           EXPORTING
                TEXTLINE1 = 'Are you sure you wish to upload'
                TEXTLINE2 = 'data from ASCII File to DB table '
                TITEL     = 'Confirmation of Data Upload'
           IMPORTING
                ANSWER    = ANS.
      IF ANS = 'J' .
        PERFORM CHECK_FILENAME.
        CLEAR MSY_SUBRC .
        CALL FUNCTION 'WS_UPLOAD'
             EXPORTING
                  FILENAME                = MFILENAM
                  FILETYPE                = 'DAT'
             TABLES
                  DATA_TAB                = <FS_ITAB>
             EXCEPTIONS
                  CONVERSION_ERROR        = 1
                  FILE_OPEN_ERROR         = 2
                  FILE_READ_ERROR         = 3
                  INVALID_TYPE            = 4
                  NO_BATCH                = 5
                  UNKNOWN_ERROR           = 6
                  INVALID_TABLE_WIDTH     = 7
                  GUI_REFUSE_FILETRANSFER = 8
                  CUSTOMER_ERROR          = 9
                  OTHERS                  = 10.
        MSY_SUBRC = MSY_SUBRC + SY-SUBRC .
        IF SY-SUBRC EQ 0.
          DESCRIBE TABLE <FS_ITAB> LINES LINES_OF_ITAB .
          IF LINES_OF_ITAB GT 0 .
            MODIFY (MTABLE_N) FROM TABLE <FS_ITAB> .
            MSY_SUBRC = MSY_SUBRC + SY-SUBRC .
          ENDIF .
        ENDIF.
        IF MSY_SUBRC EQ 0 .
          MESSAGE I398(00) WITH LINES_OF_ITAB
          'Record(s) inserted in table'
          MTABLE_N .
        ELSE .
          MESSAGE I398(00) WITH
          'Errors occurred No Records inserted in table'
          MTABLE_N .
        ENDIF .
      ENDIF .
    ENDFORM. " UPLOAD_FROM_FILE
    FORM F4_FOR_FILENAME.
      CALL FUNCTION 'WS_FILENAME_GET'
           EXPORTING
                DEF_PATH         = 'C:\'
                MASK             = ',.,..'
                MODE             = '0'
           IMPORTING
                FILENAME         = MFILENAM
           EXCEPTIONS
                INV_WINSYS       = 1
                NO_BATCH         = 2
                SELECTION_CANCEL = 3
                SELECTION_ERROR  = 4
                OTHERS           = 5.
    ENDFORM. " F4_FOR_FILENAME
    FORM CHECK_FILENAME.
      IF MFILENAM IS INITIAL
      AND NOT ( MTABLE_N IS INITIAL )
      AND P_SHOW_T NE BUTTONSELECTED.
        CONCATENATE 'C:\'
        MTABLE_N '.TXT' INTO MFILENAM.
      ENDIF .
    ENDFORM. " CHECK_FILENAME
    FORM INSTANTIATE_DYNAMIC_INTERNAL_T.
      CLEAR DYNAMIC_IT_INSTANTIATED .
      I_STRUCTURE_NAME = MTABLE_N .
      CLEAR IT_FIELDCAT[] .
      CALL FUNCTION 'REUSE_ALV_FIELDCATALOG_MERGE'
           EXPORTING
                I_STRUCTURE_NAME       = I_STRUCTURE_NAME
           CHANGING
                CT_FIELDCAT            = IT_FIELDCAT[]
           EXCEPTIONS
                INCONSISTENT_INTERFACE = 1
                PROGRAM_ERROR          = 2
                OTHERS                 = 3.
      IF SY-SUBRC EQ 0.
        LOOP AT IT_FIELDCAT .
          CLEAR WA_FIELDCATALOG .
          MOVE-CORRESPONDING IT_FIELDCAT TO WA_FIELDCATALOG .
          WA_FIELDCATALOG-REF_FIELD = IT_FIELDCAT-FIELDNAME .
          WA_FIELDCATALOG-REF_TABLE = MTABLE_N .
          APPEND WA_FIELDCATALOG TO IT_FIELDCATALOG .
        ENDLOOP .
        CALL METHOD CL_ALV_TABLE_CREATE=>CREATE_DYNAMIC_TABLE
        EXPORTING
        IT_FIELDCATALOG = IT_FIELDCATALOG
        IMPORTING
        EP_TABLE = MITAB .
        ASSIGN MITAB->* TO <FS_ITAB> .
        DYNAMIC_IT_INSTANTIATED = 'X' .
      ENDIF.
    ENDFORM. " INSTANTIATE_DYNAMIC_INTERNAL_T
    FORM SHOW_CONTENTS.
      CLEAR : <FS_ITAB> .
      SELECT * FROM (MTABLE_N)
      INTO CORRESPONDING FIELDS OF TABLE <FS_ITAB> .
      I_CALLBACK_PROGRAM = SY-REPID .
      CALL FUNCTION 'REUSE_ALV_LIST_DISPLAY'
           EXPORTING
                I_CALLBACK_PROGRAM = I_CALLBACK_PROGRAM
                IT_FIELDCAT        = IT_FIELDCAT[]
           TABLES
                T_OUTTAB           = <FS_ITAB>
           EXCEPTIONS
                PROGRAM_ERROR      = 1
                OTHERS             = 2.
    ENDFORM. " SHOW_CONTENTS
    FORM CHECK_FILE_TO_UPLOAD.
      PERFORM CHECK_FILENAME.
      CALL FUNCTION 'WS_UPLOAD'
           EXPORTING
                FILENAME                = MFILENAM
                FILETYPE                = 'DAT'
           TABLES
                DATA_TAB                = <FS_ITAB>
           EXCEPTIONS
                CONVERSION_ERROR        = 1
                FILE_OPEN_ERROR         = 2
                FILE_READ_ERROR         = 3
                INVALID_TYPE            = 4
                NO_BATCH                = 5
                UNKNOWN_ERROR           = 6
                INVALID_TABLE_WIDTH     = 7
                GUI_REFUSE_FILETRANSFER = 8
                CUSTOMER_ERROR          = 9
                OTHERS                  = 10.
      IF SY-SUBRC EQ 0.
        I_CALLBACK_PROGRAM = SY-REPID .
        CALL FUNCTION 'REUSE_ALV_LIST_DISPLAY'
             EXPORTING
                  I_CALLBACK_PROGRAM = I_CALLBACK_PROGRAM
                  IT_FIELDCAT        = IT_FIELDCAT[]
             TABLES
                  T_OUTTAB           = <FS_ITAB>
             EXCEPTIONS
                  PROGRAM_ERROR      = 1
                  OTHERS             = 2.
      ENDIF .
    ENDFORM. " CHECK_FILE_TO_UPLOAD
    Message was edited by:
            SAURABH SINGH
            SENIOR EXECUTIVE
            SAMSUNG INDIA ELECTRONICS LTD.,NOIDA

  • Database table 'e' is not accessible

    Hi all,
    like many others in the web I'm having problems deploying CMP Beans on BEA. I'm using Weblogic 8.1 and
    get the following error message:
    "[EJB:011076]Unable to deploy the EJB 'B' because the database table 'b' is not accessible. Please ensure that this table exists and is accessible."
    After a lot of research I understand the problem now. Weblogic is checking the cmp-fields at deployment time using something like "SELECT xx1, xx2, xxx3 FROM ttt1 WHERE 1 = 0". Some databases have no problem with such a select. My Solid database unfortunately does a full table scan on it. Having only some rows in the table b there is no problem at all, but I have more than 500.000 entries. :-(
    My question: Is there a workaround? Can I somewhere specify the SQL - command for checking mapped cmp-fields? Or can I disable the check somehow?
    I think it is a very annoying problem, many users out there have.
    Thanx in advance
    Robert

    Robert Jung wrote:
    Hi all,
    like many others in the web I'm having problems deploying CMP Beans on BEA. I'm using Weblogic 8.1 and
    get the following error message:
    "[EJB:011076]Unable to deploy the EJB 'B' because the database table 'b' is not accessible.Please ensure that this table exists and is accessible."
    >
    After a lot of research I understand the problem now. Weblogic is checking the cmp-fieldsat deployment time using something like "SELECT xx1, xx2, xxx3 FROM ttt1 WHERE 1 = 0".
    Some databases have no problem with such a select. My Solid database unfortunately does
    a full table scan on it. Having only some rows in the table b there is no problem at all,
    but I have more than 500.000 entries. :-(
    >
    My question: Is there a workaround? Can I somewhere specify the SQL - command for checkingmapped cmp-fields? Or can I disable the check somehow?
    I think it is a very annoying problem, many users out there have.Hi. All commercial quality DBMSes I know, are smart enough to evaluate constant search
    criteria, and not to access all the rows if it's a-priori known that no rows will
    qualify. I would ask 'Solid' for a fix.
    However, you can generate our EJBs with the option of retaining the generated
    JDBC code, which you could alter and recompile for your use. You might be able to
    substitute some DatabaseMetaData call to getTableColumns() to get the same info...
    Joe
    Thanx in advance
    Robert

Maybe you are looking for

  • Animated GIF's aren't animated.

    Now this is probably a simple problem to fix, but it is really bugging the crap out of me. Whenever I try to open an animated GIF, it simply sits at the first frame. This also happens in Preview, and it's very discouraging because I deal with a lot o

  • How can I open up more space on my external hard drive for Time Machine?

    I have a 500GB external hard drive that I use with Time Machine. I believe I have half designated for Time Machine and the other half to use as an external drive to put whatever I want on it. My issue is that now my Time Machine back up needs more th

  • Ipad 2 vs. Kindle vs. Iphone

    I am very very tempted to get an Ipad.... BUT...: I would only use it to read my books.... So far I've been reading from my Iphoen, which is just brilliant and easily "usable" in queues, in the subway, etc.... but my dilema is the following: IPad is

  • WS-C2955T-12 DC power issue

    Can we operate the said switch on 48V DC power. Because on the switch tag it is mentioned as 24V

  • How to edit contacts?

    How to edit contacts?