Dump in select query

Hi Experts ,
The following select query creates a dump called time out error, May be this is taking long time to execute . Please tell me how to fine tune this select query?
select v1vbeln v2matnr
         v2werks v1fkdat
         v1knumv v1fkart
         v1sfakn v2posnr
         v2vgbel v2ntgew
         v2gewei v1land1
         v2autyp v1vbtyp
         v1~vkorg
         v1~vtweg
         v1~spart
    into table i_billing
    from vbrk as v1 inner join
         vbrp as v2 on
         v1vbeln = v2vbeln
   where v1~vbeln in so_vbeln
     and v1~vkorg in so_vkorg
     and v1~vtweg in so_vtweg
     and v1~spart eq p_spart
     and v1~fkart in so_fkart
     and v1~fkdat in so_fkdat
     and v1~vbeln in so_vbeln
     and ( v1~vbtyp eq '5'
      or v1~vbtyp eq '6'
      or v1~vbtyp eq 'M'
      or v1~vbtyp eq 'S'
      or v1~vbtyp eq 'N'
      or v1~vbtyp eq 'O' )
     and ( v2~vgtyp eq 'J'
      or  v2~vgtyp eq 'T' )
   If is a kit o a dis only get positions
      and ( ( v2~zzkit eq '' and
              v2~zzdis eq '' )
             or ( ( v2~zzkit ne '' or
                    v2~zzdis ne '' ) and
             ( v2~uepos <> '000000' ) ) ).
Thanks in advance .

hi,
post it on ABAP forum and not on PI forum
Regards,
Michal Krawczyk

Similar Messages

  • Getting sort Dump on select Query

    Hi expert,
    I m new in abap i m getting short dump on
    *& Report  ZREAD_ITAB                                                  *
    REPORT  ZREAD_ITAB                              .
    TABLES : MARC,MARA,MAKT.
    SELECT-OPTIONS S_MATNR FOR MARC-MATNR .
    PARAMETER P_WERKS LIKE MARC-WERKS.
    DATA T_MARC LIKE MARC OCCURS 0 WITH HEADER LINE.
    DATA T_MARA LIKE MARA OCCURS 0 WITH HEADER LINE.
    DATA T_MAKT LIKE MAKT OCCURS 0 WITH HEADER LINE.
    DATA : BEGIN OF ITAB OCCURS 0,
           MATNR LIKE MARC-MATNR,
           WERKS LIKE MARC-WERKS,
           MBRSH LIKE MARA-MBRSH,
           MEINS LIKE MARA-MEINS,
           MATKL LIKE MARA-MATKL,
           MAKTX LIKE MAKT-MAKTX,
           SPRAS LIKE MAKT-SPRAS,
           END OF ITAB.
    SELECT MATNR WERKS LVORM FROM MARC INTO CORRESPONDING FIELDS OF TABLE
    T_MARC WHERE MATNR IN
                S_MATNR AND WERKS = P_WERKS.
    IF T_MARC[] IS NOT INITIAL.
    *this line)-  SELECT MATNR MBRSH MEINS MATKL FROM MARA INTO T_MARA
      FOR ALL ENTRIES IN T_MARC WHERE MATNR = T_MARC-MATNR.
      endselect.
      SELECT MATNR MAKTX SPRAS FROM MAKT INTO CORRESPONDING FIELDS OF
      T_MAKT FOR ALL ENTRIES IN T_MARC WHERE MATNR =
      T_MARC-MATNR.
      endselect.
      LOOP AT T_MARC.
        READ TABLE T_MARA WITH KEY MATNR = T_MARC-MATNR.
        MOVE :
              T_MARC-MATNR TO ITAB-MATNR,
              T_MARC-WERKS TO ITAB-WERKS.
        READ TABLE T_MAKT WITH KEY MATNR = T_MARC-MATNR.
        MOVE :
              T_MARA-MBRSH TO ITAB-MBRSH,
              T_MARA-MEINS TO ITAB-MEINS,
              T_MARA-MATKL TO ITAB-MATKL,
              T_MAKT-MAKTX TO ITAB-MAKTX,
              T_MAKT-SPRAS TO ITAB-SPRAS.
      ENDLOOP.
    ELSE .
    WRITE:/ 'NO DATA FOUND'.
    ENDIF.
    Please solve.
    Regards ,
    Ashish

    Hi,
    In addition to above code, you need to place the mandatory check when using for all entries for checking the driver table is initial or not. If T_MARC[] IS INITIAL, all the entries from MARA will be selected.
    IF NOT T_MARC[] IS INITIAL.  "Mandatory check
    SELECT MATNR MBRSH MEINS MATKL FROM MARA INTO CORRESPONDING FIELDS OF TABLE T_MARA
      FOR ALL ENTRIES IN T_MARC WHERE MATNR = T_MARC-MATNR.
    SELECT MATNR MAKTX SPRAS FROM MAKT INTO CORRESPONDING FIELDS OF TABLE T_MAKT
      FOR ALL ENTRIES IN T_MARC WHERE MATNR = T_MARC-MATNR AND SPRAS = SY-LANGU.
    ENDIF.
    Thanks,
    Vinod.

  • I am getting dump error while running one report in one select query

    Hi,
    While running a report program, I am getting a dump error in one select query. So could you please correct the select query so that I can't face the dump error.
    SELECT vbeln parvw kunnr INTO CORRESPONDING FIELDS OF TABLE l_t_vbpa
      FROM vbpa
      FOR ALL ENTRIES IN l_t_backorder_item
      WHERE vbeln = l_t_backorder_item-vbeln AND
      ( ( parvw = c_we AND kunnr IN rng_shipto ) OR  ( parvw = c_ag AND
      kunnr IN rng_soldto ) ) .
    <removed by moderator>
    Best Regards,
    BDP
    Edited by: Thomas Zloch on Apr 30, 2010 12:31 PM

    Hi Bansidhar,
    It would be helpful if you could tell what type of dump it is.
    If it is a timeout you should check whether l_t_backorder_item is empty - in this case ALL document numbers are selected. f you get the timeout with a populated table consider converting the l_t_backorder_item table into one ore more ranges tables - the select with ranges tables is way quicker than 'for all entries'. But take care the ranges table has not to many entries - the SAP SQL converter puts this into one huge SQL statement and this might become too big to be handled by the database (depends on the actual underlying database).
    I would also consider splitting the SELECT into two (2nd one with 'appending into table') to make the code easier to understand It also helps the database system determining a strategy for the select.
    Regards,
    Gerd Rother

  • Select query written on view giving dump

    Hi All,
    I have written the following query on COAS view in my code:
          SELECT aufnr bukrs INTO TABLE gt_aufnr
            FROM coas
              WHERE
                    aufnr IN r_aufrm AND
                    auart IN s_auart AND
                    autyp = c_autyp_01 AND
                    kokrs = c_kokrs_mbca.
    When records in range r_aufrm are too many like 6000 or so it gives me a run time error on this query - DBIF_RSQL_INVALID_RSQL. Error description says size of select query is large.
    Question : Is this bug coming because I am using the view. If i select the records on table AUFK (only table on which the view is created), will it rectify the problem?? I am asking this because it's in production and I cant make any change and test then and there.
    Note: the range r_aufrm contains two types of records for AUFNR - 1. with sign GE and others with sign LE. So I cannot use for all entries. If I still can, please tell me how?
    Thanks a looot!
    Waiting for the response,
    Navita

    Thanks All!!
    I think, this range limit has caused the problem. Range limit is 999 records.
    Just one question I have. At runtime when I check the number of entries in r_aufrm in the query, I get 6000 entries. So, does it allow 6000 records to enter the range variable even if it has a limit of 999. Is it the case that, in select query only it will throw a dump if records in range exceed 999??
    SELECT aufnr bukrs INTO TABLE gt_aufnr
    FROM coas
    WHERE
    aufnr IN r_aufrm AND
    auart IN s_auart AND
    autyp = c_autyp_01 AND
    kokrs = c_kokrs_mbca.
    Please clear my doubt.
    Thanks a lot for ur help!!!!
    Navita

  • Dump error in select query

    Hey Gurus,
    i am working on a requirement in which select query is fetching 8 fields from a ZTABLE.
    IF NOT IT_ZQAPP1[] IS INITIAL.
      SELECT AUFNR VORNR PROBNR PIPENO NVORNR SHIFT
      PSTAT PRODAT FROM ZQAPP INTO CORRESPONDING FIELDS OF TABLE IT_ZQAPP_B
      FOR ALL ENTRIES IN IT_ZQAPP1
      WHERE AUFNR = IT_ZQAPP1-AUFNR
      AND WERKS IN P_WERKS
      AND PRODAT LE P_PRODAT.
    it works fine for lesser data but throws a dump error TSV_TNEW_PAGE_ALLOC_FAILED for entries more than 70000,
    and my requirement is to fetch more than a lac record.
    Kindly Suggest the corrections.
    Thanks in Advance...

    Hi!
    This error occurs typically, when there is no more memory for your ABAP session. This means, you have to do one of the followings:
    - restrict your report for smaller intervals, like process only 1 month instead of 6 months together
    - rewrite your program, and eliminate/refresh/free the unneccesary internal tables, or columns from internal tables. You might even try to remove unneccesary lines from internal tables
    - use SELECT - ENDSELECT instead of SELECT ... INTO statement. This could slower your program, but you'll need less memory usage
    Check your memory usage always, with SM04 transaction (Goto - Memory menu).
    Regards
    Tamá

  • Dump in a Select query

    Hi All,
    I am getting a dump & the dump says " TIME LIMIT EXCEEDED". The code as  below:-
    LOOP AT it_gen1 INTO wa_gen1.
            SELECT  vbelv posnv
              FROM  vbfa
        INTO TABLE  li_vbfa
             WHERE  vbeln = wa_gen1-bil_number
               AND  posnn = wa_gen1-itm_number.
            DESCRIBE TABLE li_vbfa  LINES gv_count .
            READ TABLE  li_vbfa  INDEX gv_count  .
            IF sy-subrc =  0 .
              MOVE: li_vbfa-vbelv TO gv_vbelv1,
                    li_vbfa-posnv TO gv_posnv.
            ENDIF .
            CALL FUNCTION 'SD_DOCUMENT_PARTNER_READ'
              EXPORTING
                i_parvw   = 'ZS'
                i_posnr   = gv_posnv
                i_vbeln   = gv_vbelv1
              IMPORTING
                e_vbpa    = li_vbpa
                e_vbadr   = li_vbadr
              EXCEPTIONS
                not_found = 1
                OTHERS    = 2.
            IF sy-subrc <> 0.
              MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
            WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
            ENDIF.
            MOVE  li_vbpa-kunnr  TO  wa_gen2-kunnr .
            MOVE-CORRESPONDING wa_gen1 TO wa_gen2.
            APPEND  wa_gen2 TO it_gen2  .
          ENDLOOP.
    If I use Function Module   CALL FUNCTION 'SAPGUI_PROGRESS_INDICATOR' before ENDLOOP this will overcome the error says one of my friend.
    Is this a feasible solution for this error?
    Thanks in dvance....

    Hi All,
    Thanks for all your inputs. This issue is resolved now. I have used ranges in the select query & removed FOR ALL ENTRIES construct. The select query is working very fastly now with correct data.
    The code with the changes as below :-
            LOOP AT it_gen1 INTO wa_gen1.
              CLEAR r_bil_number.
              CLEAR r_itm_number.
              r_bil_number-option = 'EQ'.
              r_bil_number-sign = 'I'.
              r_bil_number-low = wa_gen1-bil_number.
              COLLECT r_bil_number.
              r_itm_number-option = 'EQ' .
              r_itm_number-sign = 'I'.
              r_itm_number-low = wa_gen1-itm_number.
              COLLECT r_itm_number.
            ENDLOOP.
            SELECT vbelv
                   posnv
                   vbeln
                   posnn
                   vbtyp_n
                   vbtyp_v                     
                   FROM vbfa
                   INTO TABLE li_vbfa
             WHERE vbeln IN r_bil_number
             AND posnn   IN r_itm_number
             AND vbtyp_n = c_m.
    Regards
    Abhii.

  • Dump for a select query

    Hi Gurus,
    I have a select query as follows:
        SELECT
                   vbap~vbeln
                   vbap~posnr
                   vbap~matnr
                   vbap~arktx
                   vbap~pstyv
                   vbap~abgru
                   vbap~prodh
                   vbap~netwr
                   vbap~werks
                   vbap~kwmeng
                   vbap~prctr
                   vbap~ps_psp_pnr
                               FROM vbap
                INTO TABLE i_item_vbap
                FOR ALL ENTRIES IN i_reg_vbak
                WHERE
                vbap~vbeln EQ i_reg_vbak-vbeln AND
                vbap~matnr IN s_matnr          AND
                vbap~werks IN s_werks          .
    However, when I execute the program, I get the dump saying as:
    I get this exception "DBIF_RSQL_INVALID_RSQL", assigned to CLASS  "CX_SY_OPEN_SQL_DB"
    Please help me in understanding this.
    Also, there are only 85 entries in i_reg_vbak, plus not many values are there for s_matnr and s_werks.
    I tried executing this query w/o for all entries, but still it gave a dump.
    Waiting for your reply, thanks!

    hello
    SELECT
    vbap~vbeln
    vbap~posnr
    vbap~matnr
    vbap~arktx
    vbap~pstyv
    vbap~abgru
    vbap~prodh
    vbap~netwr
    vbap~werks
    vbap~kwmeng
    vbap~prctr
    vbap~ps_psp_pnr
    from vbap into corresponding fields of table it_vbap.
    if u use any  fields of vbap on selection scrren then mention as
    eg: where vbeln in s_vbeln etc.
    with regards,
    sumanth reddy

  • Select query dump

    Hi all,
    tables: ikpf,iseg.
    TYPES: BEGIN OF i_ikpf,
           werks TYPE ikpf-werks,    "Plant
           lgort TYPE ikpf-lgort,    "Storage location
           iblnr TYPE ikpf-iblnr,    "Physical Inventory Document
           gjahr TYPE ikpf-gjahr,    "Fiscal Year
           zldat TYPE ikpf-zldat,    "Last Count Date
           sobkz TYPE ikpf-sobkz,
           bldat TYPE ikpf-bldat,
           gidat TYPE ikpf-gidat,
           budat TYPE ikpf-budat,
           END   OF i_ikpf.
    DATA:  it_ikpf  TYPE STANDARD TABLE OF i_ikpf              ,
           wa_ikpf  TYPE i_ikpf                                .
    SELECTION-SCREEN: BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
    SELECT-OPTIONS  : s_matnr FOR iseg-matnr,
                      s_werks FOR ikpf-werks,
                      s_lgort FOR ikpf-lgort,
                      s_iblnr FOR ikpf-iblnr,
                      s_gjahr FOR ikpf-gjahr,
                      s_zldat FOR ikpf-zldat,
                      s_abcin FOR iseg-abcin.
    SELECTION-SCREEN: END OF BLOCK b1     .
    SELECT iblnr gjahr werks lgort sobkz bldat gidat zldat budat
      from ikpf
      INTO TABLE it_ikpf
      WHERE werks IN s_werks and
            lgort IN s_lgort and
            iblnr IN s_iblnr and
            gjahr IN s_gjahr and
            zldat IN s_zldat.
    select query is giving dump as " data could not be placed in an output area"
    thanks in advance,

    When selecting the fields, order of fields selection and fields in internal table should be same.
    Check the below code
    tables: ikpf,iseg.
    TYPES: BEGIN OF i_ikpf,
    iblnr TYPE ikpf-iblnr, "Physical Inventory Document
    gjahr TYPE ikpf-gjahr, "Fiscal Year
    werks TYPE ikpf-werks, "Plant
    lgort TYPE ikpf-lgort, "Storage location
    sobkz TYPE ikpf-sobkz,
    bldat TYPE ikpf-bldat,
    gidat TYPE ikpf-gidat,
    zldat TYPE ikpf-zldat, "Last Count Date
    budat TYPE ikpf-budat,
    END OF i_ikpf.
    DATA: it_ikpf TYPE STANDARD TABLE OF i_ikpf ,
    wa_ikpf TYPE i_ikpf .
    SELECTION-SCREEN: BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
    SELECT-OPTIONS : s_matnr FOR iseg-matnr,
    s_werks FOR ikpf-werks,
    s_lgort FOR ikpf-lgort,
    s_iblnr FOR ikpf-iblnr,
    s_gjahr FOR ikpf-gjahr,
    s_zldat FOR ikpf-zldat,
    s_abcin FOR iseg-abcin.
    SELECTION-SCREEN: END OF BLOCK b1 .
    SELECT iblnr
           gjahr
           werks
           lgort
           sobkz
           bldat
           gidat
           zldat
           budat
    from ikpf
    INTO TABLE it_ikpf
    WHERE werks IN s_werks and
    lgort IN s_lgort and
    iblnr IN s_iblnr and
    gjahr IN s_gjahr and
    zldat IN s_zldat.
    Other wise use "INTO CORRESPONDING FIELDS" while selecting.
    Hope this helps u.

  • Select query giving dump

    Hi,
    We have a select query written as below:
    SELECT  counter
                stokz
                pernr
                workdate
                rnplnr
                catshours
          FROM catsps
          INTO TABLE t_catsps
          WHERE pernr IN r_pernr
          AND   workdate IN s_wrkdt
          AND   rnplnr IN s_ntwrk
          AND   belnr IN s_docno
          AND   transfer NE 'X'.
    Here, the range which we are using has a record of more than 16000. At this particular portion of the code the program dumps. I suspect it is due to the excessive data records in the ranges option. Is there any remedy for this situation. Please help!

    Hi,
    check the inetrnal table strcure field are of same type of catsps table field which you are fetching
    Or try to USe into corresponding fields of table t_catsps.
    "check the inetrnal table strcure field are of same
    "type of catsps table field which you are fetching
    SELECT  counter
                 stokz
                 pernr
                 workdate
                 rnplnr
                 catshours
           FROM catsps
           INTO TABLE t_catsps   'Or try to USe into corresponding fields of table t_catsps
           WHERE pernr IN r_pernr
           AND   workdate IN s_wrkdt
           AND   rnplnr IN s_ntwrk     "check rnplnr and  s_ntwrk     are of same type
           AND   belnr IN s_docno      "Check belnr and s_docno are of same type
           AND   transfer NE 'X'.
    "hadle sy-subrc
    prabhudas
    Edited by: Rob Burbank on Sep 22, 2010 9:32 AM

  • Getting Dump from a select query

    Dear All,
    Am selecting records from KEKO  and storing into  E1KEKO  internal table. But am getting dump error. I need to send those E1KEKO records as idoc. Kindly help me out how to fix this dump.
      SELECT * INTO CORRESPONDING FIELDS OF e1keko
        FROM keko
        WHERE keko~matnr = p_matnr
          AND keko~werks = p_werks
          AND keko~bwtar = 'Z06'
          AND keko~bwvar = 'Z06'.
        CLEAR t_idoc_data.
        t_idoc_data-segnam = c_segnam_e1keko.
        t_idoc_data-mandt = sy-mandt.
        t_idoc_data-sdata  = e1keko.
        APPEND t_idoc_data.
        CLEAR e1keph.
    endselect
    Thanks in advance.
    Anandhan

    Hi,
    If i use the below select query in a test program,  that time also am getting the same dump.
    DATA: e1keph TYPE e1keph,
          e1keko TYPE e1keko.
       SELECT * INTO CORRESPONDING FIELDS OF e1keko
        FROM keko
        WHERE keko~matnr = '000000000010801071'.
      endselect.
    (code}
    The dump showing the below message
      The reason for the exception is:
      In a SELECT access, the read file could not be placed in the target
      field provided.
      Either the conversion is not supported for the type of the target field
      the target field is too small to include the value, or the data does no
      have the format required for the target field.
    Thanks in advance
    Anandhan

  • Short Dump for Dynamic Select Query

    Hello all,
    I get a short dump for my dynamic select query at the end of the code. The error is "The types of operands "dbtab" and "itab" cannot be converted into one another."
    My code looks like below.
    FORM get_ccnum_2  USING    p_tabname TYPE dd03l-tabname.
    DATA: p_table(30)  TYPE c.
      FIELD-SYMBOLS:  <dyn_wa>,
                                   <t> TYPE table.
      DATA: 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.
    p_table = p_tabname.
      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-intlen    = wa_details-length.
        wa_it_fldcat-decimals  = wa_details-decimals.
        APPEND wa_it_fldcat TO it_fldcat .
      ENDLOOP.
      CALL METHOD cl_alv_table_create=>create_dynamic_table
        EXPORTING
          it_fieldcatalog = it_fldcat
        IMPORTING
          ep_table        = new_table.
    ASSIGN new_table->* TO <t>.
    CREATE DATA new_line LIKE LINE OF <t>.
      ASSIGN new_line->* TO <dyn_wa>.
    wa_cond = 'CCNUM <> '' '' '.
    APPEND wa_cond TO tab_cond.
          SELECT * INTO TABLE <t>
                   FROM     (p_table)
                   WHERE    (tab_cond)
                   ORDER BY (tab_ord).
    ENDFORM.                    " GET_CCNUM_2

    Hi,
    I tried to execute the code using table BSEGC and it gave a short dump..
    the actual exception that shows in ST22 IS ..UNICODE_TYPES_NOT_CONVERTIBLE..
    I think there is something wrong in the internal table creation..
    Instead of using the method cl_alv_table_create=>create_dynamic_table to create the dynamic table I used the following and it worked..
    CREATE DATA new_table TYPE TABLE OF (p_table).
    * Comment begin  " Naren
    *  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-intlen    = wa_details-length.
    *    wa_it_fldcat-decimals  = wa_details-decimals.
    *    APPEND wa_it_fldcat TO it_fldcat .
    *  ENDLOOP.
    *  CALL METHOD cl_alv_table_create=>create_dynamic_table
    *    EXPORTING
    *      it_fieldcatalog = it_fldcat
    *    IMPORTING
    *      ep_table        = new_table.
    * Comment End.  " Naren
    CREATE DATA new_table TYPE TABLE OF (p_table).   " New code by naren
    Please Try this..
    Thanks
    Naren

  • Select query giving Time out dump

    Hi All,
        I have written a select query on a table in BW system.The code for the same is attached below.The table contains some 6,00,000 records.This query is giving a time out error.Kindly look into the query and advice ways to make it work.Thanks.
        IF NOT lt_temp[] IS INITIAL.
          SELECT /bic/zprrmatnr objvers /bic/zprclwynr /bic/zprrmdlr
                 FROM  /bic/pzprrmatnr
                 INTO CORRESPONDING FIELDS OF TABLE lt_zprrmatnr
                 FOR ALL ENTRIES IN lt_temp
                 WHERE /bic/zprclwynr = lt_temp-temp
                 AND   objvers = 'A'.
        ENDIF.
    Thanks and Regards,
    Faisal

    Not only is it BW, it is also a customer table. Have a look here on how to research yourself:
    Please Read before Posting in the Performance and Tuning Forum
    Thomas

  • Select query is working on oracle 10.1.0 but its not working in 10.2.0

    select query is working and retrieving some data from oracle database server 10.1.0.2.0, but same query is not working in 10.2.0.1.0 database server, its throws(ORA-00942: table or view does not exist)
    But schema related tables and relevant details are same in 10.2.0.1.0 database server, so don't think that table is missing on that schema.
    Note: Query length is upto 480 line
    I have validate all the things, everything is fine, i don't why that query is not executing in different version.
    I am in helpless in this situation?, anybody faced this issue?
    Thanks in advance

    Validated means all the tables and and columns are verified, i just running in sqlprompt,
    Say for example:
    sql> select * from table1;
    One thing i observed while executing the query its showed error in one location of select sql. i mean particular word in select sql.
    After that i combined some three lines of huge select sql into single then i am getting error in different location i mean different word...
    My question is how same query executing in Oracle 10g Release 1, same dump (its exported from Release1) imported into oracle 10g release 2 is not executing. its shows Table or view doesn't exit.

  • Performance issue with select query and for all entries.

    hi,
    i have a report to be performance tuned.
    the database table has around 20 million entries and 25 fields.
    so, the report fetches the distinct values of two fields using one select query.
    so, the first select query fetches around 150 entries from the table for 2 fields.
    then it applies some logic and eliminates some entries and makes entries around 80-90...
    and then it again applies the select query on the same table using for all entries applied on the internal table with 80-90 entries...
    in short,
    it accesses the same database table twice.
    so, i tried to get the database table in internal table and apply the logic on internal table and delete the unwanted entries.. but it gave me memory dump, and it wont take that huge amount of data into abap memory...
    is around 80-90 entries too much for using "for all entries"?
    the logic that is applied to eliminate the entries from internal table is too long, and hence cannot be converted into where clause to convert it into single select..
    i really cant find the way out...
    please help.

    chinmay kulkarni wrote:Chinmay,
    Even though you tried to ask the question with detailed explanation, unfortunately it is still not clear.
    It is perfectly fine to access the same database twice. If that is working for you, I don't think there is any need to change the logic. As Rob mentioned, 80 or 8000 records is not a problem in "for all entries" clause.
    >
    > so, i tried to get the database table in internal table and apply the logic on internal table and delete the unwanted entries.. but it gave me memory dump, and it wont take that huge amount of data into abap memory...
    >
    It is not clear what you tried to do here. Did you try to bring all 20 million records into an internal table? That will certainly cause the program to short dump with memory shortage.
    > the logic that is applied to eliminate the entries from internal table is too long, and hence cannot be converted into where clause to convert it into single select..
    >
    That is fine. Actually, it is better (performance wise) to do much of the work in ABAP than writing a complex WHERE clause that might bog down the database.

  • Error While Firing select Query  on Table

    Hi aill,
    we have Oracle 11g RG2 RAC on Production Machine. When I am firing select query on one partiton table,it will show me below error in Alter Log file :
    Exception [type: SIGSEGV, Address not mapped to object] [ADDR:0x0] [PC:0x84056AA, kkpamDInfo()+38] [flags: 0x0, count: 1]
    Errors in file /opt/app/oracle/diag/rdbms/winsdb/WINSDB2/trace/WINSDB2_ora_29686.trc (incident=288563):
    ORA-07445: exception encountered: core dump [kkpamDInfo()+38] [SIGSEGV] [ADDR:0x0] [PC:0x84056AA] [Address not mapped to object] []
    Incident details in: /opt/app/oracle/diag/rdbms/winsdb/WINSDB2/incident/incdir_288563/WINSDB2_ora_29686_i288563.trc
    While checking the trace file :
    ========== FRAME [2] (ksedst1()+98 -> skdstdst()) ==========
    defined by frame pointers 0x2ba371efaa40 and 0x2ba371efa990
    CALL TYPE: call ERROR SIGNALED: no COMPONENT: KSE
    RDI 0000000000000000 RSI 0000000000000000 RDX 00002BA371EF6118
    RCX 0000000000000001 R8 0000000000000000 R9 0000000000000000
    RAX 0000000000000000 RBX 0000000000000003 RBP 00002BA371EFAA40
    R10 71EFA9A000000000 R11 0000000000000000 R12 0000000000000003
    R13 0000000000000003 R14 0000000000000001 R15 0000000000000001
    RSP 00002BA371EFA9A0 RIP 000000000349E72E
    Dump of memory from 0x2ba371efaa40 to 0x2ba371efaaf0
    2BA371EFAA40 71EFAB10 00002BA3 0349E77F 00000000 [...q.+....I.....]
    2BA371EFAA50 00000000 00000000 00000000 00000000 [................]
    2BA371EFAA60 71B996F0 00002BA3 02050034 00000000 [...q.+..4.......]
    2BA371EFAA70 000000FF 00002BA3 00002004 00000000 [.....+... ......]
    2BA371EFAA80 00000000 00000000 2338D058 00016DAB [........X.8#.m..]
    2BA371EFAA90 00000003 00000000 085232F3 00000000 [.........2R.....]
    2BA371EFAAA0 0000000D 00000000 00000002 00000000 [................]
    2BA371EFAAB0 00000000 00000000 00000000 00000000 [................]
    2BA371EFAAC0 71EFAAD0 00002BA3 085BBFCF 00000000 [...q.+....[.....]
    2BA371EFAAD0 71EFAB10 00002BA3 0349E249 00000000 [...q.+..I.I.....]
    2BA371EFAAE0 00000000 00002BA3 00000013 00000000 [.....+..........]
    Can Anyone guide me for above Errors. How can I resolve the same.

    A quick search of Oracle Support shows that there are a handful of bugs that match ORA-07445 with an argument of kkpamDInfo()+38.
    Whether yours is already identified and patched depends on the exact version of 11.2 and the specific circumstances.
    If you're on 11.2.0.1 then this might be part of what sounds like quite a big bucket of such errors - Bug 9399991 relating to errors and dumps with SQL against partitioned tables.

Maybe you are looking for

  • Accidentally purchased music from iTunes Store. Can I get my money back?

    Thinking I was buying a song by the All-American Rejects on the Top 100 list on iTunes, I ended up pressing the "Buy Song" buttong below it. So instead of getting the song I wanted, I instead purchased "You Found Me" by the Fray. A song I hate. I tri

  • Java.io.UnsupportedEncodingException: Media Type of a TextResponseWrapper

    Hi, I am trying to view intermedia image using jsp..similar to photo album demo..what does the following exception mean.. java.io.UnsupportedEncodingException: Media Type of a TextResponseWrapper must start with "text/"      at oracle.webdb.provider.

  • Itune has stopped working

    I sync my iPad. iOS 4.3.3  with itune 10.4   can't  sync photo. window shown. Itune has stopped working  and report these app crash. ของQuickTime ครับ ลองหาจากอากู้แล้วยังไม่สามารถแก้ได้ครับ รบกวนตามรายละเอืยดด้านล่างครับ itune has stopped working Pr

  • Filtered (rules) messages and mail ...

    Hi ~ My screen name "never-mac?" comes from the fact that - as a 25+ year PC user - I said "I'll never get a MAC!!" Never say never!! I bought a MACBOOK for home (to avoid the VISTA experience,) and requested an iMAC for my new work computer. All tha

  • Reinstalling itunes removes my dvd drive

    I cannot burn playlists to disc from itunes.  I have tried uninstalling and reinstalling itunes.  The error message i get is "disc burner or software not found."  I try to update the driver for the drive then it disappears from "devices" altogether.