Program is taking lot of time for execution

Hi all,
TYPES: BEGIN OF TY_MARA,
       MATNR       TYPE  MATNR,         " Material Number
       ZZBASE_CODE TYPE  ZBASE_CODE,    " Base Code
       END OF TY_MARA,
       BEGIN OF TY_MAKT,
       MATNR       TYPE  MATNR,         " Material
       MAKTX       TYPE  MAKTX,         " Material Description
       END OF TY_MAKT,
       BEGIN OF TY_MARC,
       MATNR       TYPE  MATNR ,        " Material Number
       WERKS       TYPE  WERKS_D,      " Plant
       END OF TY_MARC,
       BEGIN OF TY_QMAT,
       MATNR        TYPE  MATNR,         " Material Number
       ART           TYPE  QPART,         " Inspection Type
       END OF TY_QMAT,
       BEGIN OF TY_MAPL,
       MATNR        TYPE  MATNR,        " Material
       PLNTY        TYPE  PLNTY,        " Task List Type
       END OF TY_MAPL,
       BEGIN OF TY_PLKO,
       PLNTY          TYPE     PLNTY,         " Task List Type
       VERWE             TYPE     PLN_VERWE,     "     Task list usage
       END OF TY_PLKO,
       BEGIN OF TY_KLAH,
       CLASS          TYPE    KLASSE_D,       "     Class Number
       END OF TY_KLAH,
       BEGIN OF TY_FINAL,
       MATNR          TYPE    MATNR,          " Material Number
       MAKTX          TYPE    MAKTX,          " Material Description
       ZZBASE_CODE    TYPE    ZBASE_CODE,     " Base Code
       WERKS          TYPE    WERKS_D,        " Plant
       CLASS          TYPE    KLASSE_D,       "     Class Number
       ART             TYPE    QPART,           " Inspection Type
       VERWE             TYPE    PLN_VERWE,       " Task list usage
       MESSAGE        TYPE    STRING,          " Message
       END OF TY_FINAL.
DATA: I_MARA  TYPE  STANDARD TABLE OF TY_MARA  ,
      I_MAKT  TYPE  STANDARD TABLE OF TY_MAKT  ,
      I_MARC  TYPE  STANDARD TABLE OF TY_MARC  ,
      I_QMAT  TYPE  STANDARD TABLE OF TY_QMAT  ,
      I_MAPL  TYPE  STANDARD TABLE OF TY_MAPL  ,
      I_PLKO  TYPE  STANDARD TABLE OF TY_PLKO  ,
      I_KLAH  TYPE  STANDARD TABLE OF TY_KLAH  ,
      I_FINAL TYPE  STANDARD TABLE OF TY_FINAL ,
      WA_MARA  TYPE  TY_MARA,
      WA_MAKT  TYPE  TY_MAKT,
      WA_MARC  TYPE  TY_MARC,
      WA_QMAT  TYPE  TY_QMAT,
      WA_MAPL  TYPE  TY_MAPL,
      WA_PLKO  TYPE  TY_PLKO,
      WA_KLAH  TYPE  TY_KLAH,
      WA_FINAL TYPE  TY_FINAL.
DATA: V_MTART         TYPE    MARA-MTART,
      V_MATNR         TYPE    MARA-MATNR,
      V_ZZBASE_CODE   TYPE    MARA-ZZBASE_CODE,
      V_WERKS         TYPE    T001W-WERKS,
      V_BESKZ         TYPE    MARC-BESKZ.
*selection-screen
SELECTION-SCREEN SKIP 1.
SELECTION-SCREEN BEGIN OF BLOCK B1 WITH FRAME TITLE TEXT-001.
SELECT-OPTIONS: S_MTART    FOR V_MTART DEFAULT 'halb' TO 'zraw',
                S_MATNR    FOR V_MATNR,
                S_ZZBASE   FOR V_ZZBASE_CODE,
                S_WERKS    FOR V_WERKS OBLIGATORY,
                S_BESKZ    FOR V_BESKZ.
SELECTION-SCREEN END OF BLOCK B1.
START-OF-SELECTION.
  SELECT MATNR
         ZZBASE_CODE
         FROM  MARA INTO TABLE I_MARA
         WHERE MTART IN S_MTART       "Material Type
         AND   MATNR IN S_MATNR        "Material
         AND   ZZBASE_CODE IN S_ZZBASE."Base Code
IF NOT I_MARA IS INITIAL.
  SELECT MATNR
         MAKTX
         FROM MAKT INTO TABLE I_MAKT FOR ALL ENTRIES IN I_MARA
         WHERE MATNR = I_MARA-MATNR.
ENDIF.
IF NOT I_MARA IS INITIAL.
  SELECT MATNR
         WERKS
         FROM MARC INTO TABLE I_MARC FOR ALL ENTRIES IN I_MARA
         WHERE MATNR = I_MARA-MATNR
         AND WERKS IN S_WERKS "plant
         AND BESKZ IN S_BESKZ."Procurement Type
ENDIF.
IF NOT I_MARA IS INITIAL.
  SELECT MATNR
         ART
         FROM QMAT INTO TABLE I_QMAT FOR ALL ENTRIES IN I_MARA
         WHERE MATNR = I_MARA-MATNR
         AND WERKS IN S_WERKS.
ENDIF.
IF NOT I_MARA IS INITIAL.
  SELECT MATNR
         PLNTY FROM MAPL INTO TABLE I_MAPL FOR ALL ENTRIES IN I_MARA
         WHERE MATNR = I_MARA-MATNR.
ENDIF.
IF NOT I_MAPL IS INITIAL.
  SELECT PLNTY
         VERWE
         FROM PLKO INTO TABLE I_PLKO FOR ALL ENTRIES IN I_MAPL
         WHERE PLNTY = I_MAPL-PLNTY.
  ENDIF.
  LOOP AT I_MARA INTO WA_MARA.
    CALL FUNCTION 'CLFC_BATCH_ALLOCATION_TO_CLASS'
      EXPORTING
        MATERIAL                  = WA_MARA-MATNR
       PLANT                     =  WA_MARC-WERKS
       CLASSTYPE                 =  '023'
  I_IGNORE_MATMASTER        = ' '
  I_BATCHES_ONLY            =
  I_IGNORE_BUFFER           = ' '
     IMPORTING
  CLASSTYPE                 =
       CLASS                     = WA_KLAH-CLASS
     EXCEPTIONS
       WRONG_FUNCTION_CALL       = 1
       NO_CLASS_FOUND            = 2
       NO_CLASSTYPE_FOUND        = 3
       OTHERS                    = 4 .
*IF SY-SUBRC <> 0.
MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
        WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
*ENDIF.
APPEND WA_KLAH TO I_KLAH.
  ENDLOOP.
  LOOP AT I_MARA INTO WA_MARA.
    WA_FINAL-MATNR       = WA_MARA-MATNR.
    WA_FINAL-ZZBASE_CODE = WA_MARA-ZZBASE_CODE.
    APPEND WA_FINAL TO I_FINAL.
    SORT I_MAKT BY MATNR.
   READ TABLE I_MAKT INTO WA_MAKT WITH KEY MATNR = WA_MARA-MATNR BINARY
   SEARCH.
   IF SY-SUBRC EQ 0.
    WA_FINAL-MAKTX = WA_MAKT-MAKTX.
  ENDIF.
    APPEND WA_FINAL TO I_FINAL.
    SORT I_MARC BY MATNR.
   READ TABLE I_MARC INTO WA_MARC WITH KEY MATNR = WA_MARA-MATNR BINARY
   SEARCH.
   IF SY-SUBRC EQ 0.
    WA_FINAL-WERKS = WA_MARC-WERKS.
  ENDIF.
    APPEND WA_FINAL TO I_FINAL.
    SORT I_QMAT BY MATNR.
   READ TABLE I_QMAT INTO WA_MARC WITH KEY MATNR = WA_MARA-MATNR BINARY
   SEARCH.
   IF SY-SUBRC EQ 0.
    WA_FINAL-ART = WA_QMAT-ART.
ENDIF.
    APPEND WA_FINAL TO I_FINAL.
SORT I_MAPL BY MATNR.
READ TABLE I_MAPL INTO WA_MAPL WITH KEY MATNR = WA_MARA-MATNR BINARY
SEARCH.
IF SY-SUBRC EQ 0.
SORT I_PLKO BY PLNTY.
READ TABLE I_PLKO INTO WA_PLKO WITH KEY PLNTY = WA_MAPL-PLNTY BINARY
SEARCH.
ENDIF.
WA_FINAL-VERWE = WA_PLKO-VERWE.
APPEND WA_FINAL TO I_FINAL.
ENDLOOP.
LOOP AT I_KLAH INTO WA_KLAH.
WA_FINAL-CLASS = WA_KLAH-CLASS.
APPEND WA_FINAL TO I_FINAL.
ENDLOOP.
LOOP AT I_FINAL INTO WA_FINAL.
WRITE:/ WA_FINAL-MATNR,
        WA_FINAL-MAKTX,
        WA_FINAL-ZZBASE_CODE,
        WA_FINAL-WERKS,
        WA_FINAL-CLASS,
        WA_FINAL-ART,
        WA_FINAL-VERWE.
ENDLOOP.
This is my program. it is giving out put.but it is taking lot of time for execution. what might be the porblem.pls let me know.
Thanks,

Hi Mythily,
Try the following code.
TYPES: BEGIN OF ty_mara,
         matnr TYPE matnr, " Material Number
         zzbase_code TYPE zbase_code, " Base Code
       END OF ty_mara,
       BEGIN OF ty_makt,
         matnr TYPE matnr, " Material
         maktx TYPE maktx, " Material Description
       END OF ty_makt,
       BEGIN OF ty_marc,
         matnr TYPE matnr , " Material Number
         werks TYPE werks_d, " Plant
       END OF ty_marc,
       BEGIN OF ty_qmat,
         art   TYPE qpart  , " Inspection Type
         matnr TYPE matnr  , " Material Number
         werks TYPE werks_d, "Plant
       END OF ty_qmat,
       BEGIN OF ty_mapl,
         matnr TYPE matnr    , " Material
         werks TYPE werks_d  , "Plant
         plnty TYPE plnty    , " Task List Type
         plnnr TYPE plnnr    , " Key for Task List Group
         plnal TYPE plnal    , " Group Counter
         zkriz TYPE dzkriz   , " Counter for additional criteria
         zaehl TYPE cim_count, " Internal counter
       END OF ty_mapl,
       BEGIN OF ty_plko,
         plnty TYPE plnty    , " Task List Type
         plnnr TYPE plnnr    , " Key for Task List Group
         plnal TYPE plnal    , " Group Counter
         zaehl TYPE cim_count, " Internal counter
         verwe TYPE pln_verwe, " Task list usage
       END OF ty_plko,
       BEGIN OF ty_klah,
         class TYPE klasse_d, " Class Number
       END OF ty_klah,
       BEGIN OF ty_final,
         matnr TYPE matnr, " Material Number
         maktx TYPE maktx, " Material Description
         zzbase_code TYPE zbase_code, " Base Code
         werks TYPE werks_d, " Plant
         class TYPE klasse_d, " Class Number
         art TYPE qpart, " Inspection Type
         verwe TYPE pln_verwe, " Task list usage
         message TYPE string, " Message
       END OF ty_final.
DATA: i_mara     TYPE STANDARD TABLE OF ty_mara ,
      i_makt     TYPE HASHED   TABLE OF ty_makt
        WITH UNIQUE KEY matnr,
      i_marc     TYPE SORTED   TABLE OF ty_marc
        WITH NON-UNIQUE KEY matnr,
      i_qmat     TYPE SORTED   TABLE OF ty_qmat
        WITH NON-UNIQUE KEY matnr werks,
      i_mapl     TYPE SORTED   TABLE OF ty_mapl
        WITH NON-UNIQUE KEY matnr werks,
      i_mapl_tmp TYPE STANDARD TABLE OF ty_mapl ,
      i_plko     TYPE SORTED   TABLE OF ty_plko
        WITH NON-UNIQUE KEY plnty
                            plnnr
                            plnal,
      i_final    TYPE STANDARD TABLE OF ty_final,
      wa_mara TYPE ty_mara,
      wa_makt TYPE ty_makt,
      wa_marc TYPE ty_marc,
      wa_qmat TYPE ty_qmat,
      wa_mapl TYPE ty_mapl,
      wa_plko TYPE ty_plko,
      wa_klah TYPE ty_klah,
      wa_final TYPE ty_final.
DATA: v_mtart TYPE mara-mtart,
      v_matnr TYPE mara-matnr,
      v_zzbase_code TYPE mara-zzbase_code,
      v_werks TYPE t001w-werks,
      v_beskz TYPE marc-beskz.
SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
SELECT-OPTIONS: s_mtart FOR v_mtart DEFAULT 'halb' TO 'zraw',
                s_matnr FOR v_matnr,
                s_zzbase FOR v_zzbase_code,
                s_werks FOR v_werks OBLIGATORY,
                s_beskz FOR v_beskz.
SELECTION-SCREEN END OF BLOCK b1.
START-OF-SELECTION.
  SELECT matnr
         zzbase_code
    FROM mara
    INTO TABLE i_mara
    WHERE mtart       IN s_mtart "Material Type
    AND   matnr       IN s_matnr. "Material
    AND   zzbase_code IN s_zzbase."Base Code
  IF NOT i_mara[] IS INITIAL.
    SELECT matnr
           maktx
      FROM makt
      INTO TABLE i_makt
      FOR ALL ENTRIES IN i_mara
      WHERE matnr EQ i_mara-matnr
      AND   spras EQ sy-langu.
    SELECT matnr
           werks
      FROM marc
      INTO TABLE i_marc
      FOR ALL ENTRIES IN i_mara
      WHERE matnr EQ i_mara-matnr
      AND   werks IN s_werks "plant
      AND   beskz IN s_beskz."Procurement Type
    IF sy-subrc EQ 0.
      SELECT art
             matnr
             werks
        FROM qmat
        INTO TABLE i_qmat
        FOR ALL ENTRIES IN i_marc
        WHERE matnr EQ i_marc-matnr
        AND   werks EQ i_marc-werks.
      SELECT matnr
             werks
             plnty
             plnnr
             plnal
             zkriz
             zaehl
        FROM mapl
        INTO TABLE i_mapl
        FOR ALL ENTRIES IN i_marc
        WHERE matnr EQ i_marc-matnr
        AND   werks EQ i_marc-werks.
      IF NOT i_mapl[] IS INITIAL.
        i_mapl_tmp[] = i_mapl[].
        SORT i_mapl_tmp BY plnty
                           plnnr
                           plnal.
        DELETE ADJACENT DUPLICATES FROM i_mapl_tmp
          COMPARING
            plnty
            plnnr
            plnal.
        SELECT plnty
               plnnr
               plnal
               zaehl
               verwe
          FROM plko
          INTO TABLE i_plko
          FOR ALL ENTRIES IN i_mapl_tmp
          WHERE plnty EQ i_mapl_tmp-plnty
          AND   plnnr EQ i_mapl_tmp-plnnr
          AND   plnal EQ i_mapl_tmp-plnal.
      ENDIF.
    ENDIF.
  ENDIF.
  LOOP AT i_mara INTO wa_mara.
    wa_final-matnr       = wa_mara-matnr.
    wa_final-zzbase_code = wa_mara-zzbase_code.
    READ TABLE i_makt INTO wa_makt
      WITH KEY matnr = wa_mara-matnr
      TRANSPORTING
        maktx.
    IF sy-subrc EQ 0.
      wa_final-maktx = wa_makt-maktx.
    ENDIF.
    REFRESH i_final.
    LOOP AT i_marc INTO wa_marc
      WHERE matnr EQ wa_mara-matnr.
      CLEAR wa_klah-class.
      CALL FUNCTION 'CLFC_BATCH_ALLOCATION_TO_CLASS'
        EXPORTING
          material            = wa_mara-matnr
          plant               = wa_marc-werks
          classtype           = '023'
        IMPORTING
          class               = wa_klah-class
        EXCEPTIONS
          wrong_function_call = 1
          no_class_found      = 2
          no_classtype_found  = 3
          OTHERS              = 4.
      IF sy-subrc EQ 0.
        wa_final-class = wa_klah-class.
      ENDIF.
      READ TABLE i_qmat
        WITH KEY matnr = wa_mara-matnr
                 werks = wa_marc-werks
                 TRANSPORTING NO FIELDS.
      IF sy-subrc EQ 0.
        LOOP AT i_qmat INTO wa_qmat
          WHERE matnr EQ wa_mara-matnr
          AND   werks EQ wa_marc-werks.
          wa_final-art = wa_qmat-art.
          READ TABLE i_mapl
            WITH KEY matnr = wa_marc-matnr
                     werks = wa_marc-werks
                     TRANSPORTING NO FIELDS.
          IF sy-subrc EQ 0.
            LOOP AT i_mapl INTO wa_mapl
              WHERE matnr EQ wa_marc-matnr
              AND   werks EQ wa_marc-werks.
              LOOP AT i_plko INTO wa_plko
                WHERE plnty EQ wa_mapl-plnty
                AND   plnnr EQ wa_mapl-plnnr
                AND   plnal EQ wa_mapl-plnal.
                wa_final-verwe = wa_plko-verwe.
                APPEND wa_final TO i_final.
              ENDLOOP.
            ENDLOOP.
          ELSE.
            APPEND wa_final TO i_final.
          ENDIF.
        ENDLOOP.
      ELSE.
        LOOP AT i_mapl INTO wa_mapl
          WHERE matnr EQ wa_marc-matnr
          AND   werks EQ wa_marc-werks.
          LOOP AT i_plko INTO wa_plko
            WHERE plnty EQ wa_mapl-plnty
            AND   plnnr EQ wa_mapl-plnnr
            AND   plnal EQ wa_mapl-plnal.
            wa_final-verwe = wa_plko-verwe.
            APPEND wa_final TO i_final.
          ENDLOOP.
        ENDLOOP.
      ENDIF.
    ENDLOOP.
    CLEAR wa_final.
  ENDLOOP.
  LOOP AT i_final INTO wa_final.
    WRITE:/ wa_final-matnr      ,
            wa_final-maktx      ,
            wa_final-zzbase_code,
            wa_final-werks      ,
            wa_final-class      ,
            wa_final-art        ,
            wa_final-verwe      .
  ENDLOOP.

Similar Messages

  • Interface is taking lots of time for first time execution

    Hello all,
    I have one inbound interface in which i am updating T-code CO01 ,CO15 , MIGO and MB1A respectively
    depending upon the condition in the incoming file.
    When ever i run this interface for the first time it takes lots of time for execution, but when i run the same interface again with the same file it is taking half time of the first time execution.
    I am not able to understand why it is taking lots of time for first execution and after that execution time is redued very much with the same file
    Kindly help
    Thanks
    Sachin Yadav

    thank you santhosh for your reply..
    as this program is in Production system it it taking 3 to 4 hour to execute.
    Previously it was OK but from last 2 to 3 moths it is taking more time.
    when i debug the code it is working fine. I din't find any point at which it is taking more time.
    I am not aware about buffers and SAP memory. can you plz help
    Do you have any idea why this is happening.
    Or how can i rectify the problem?
    Thanks
    Sachin

  • Background job is taking lot of time for processing the job.

    One background job - which is processing Idocs is processing a job for more than 2000+ seconds.. and completed tho.
    But this is happening for the past few days.. is there any way to trouble shoot, or find from any logs of this completed job, to find out why it was taking lot of time for processing.
    Can you please tell me the steps of analyzing / trouble shooting why it was taking lot of time daily.
    Regards,
    Satish.

    Hi Satish,
    Run DB stat from db13 it will improve the performance.
    Check number of idocs. You can send part by part, instead of sending huge data.
    Check SM58 logs
    Suman

  • Taking lot of time for loading

    Hi,
      We are loading data from HR to BI. Connection between HR and BI has been done recently. When I am trying to load data from HR  to BI it taking lot of time--for example to load 5recs its taking 8hrs. Its same for every datasource. Should we change anything in settings to makes IDOCS work proper? Thanks

    You have to isolate the part that is taking the time.
    - Is R/3 extraction quick? (You can check with RSA3 and see how long does it take.)
    - If R/3 extraction is slow, then is the selection using an index? How many records are there in the table / view?
    - Is there a user exit? Is user exit slow?
    You can find out using monitor screen:
    - After R/3 extraction completed, how long did it take to insert into PSA?
    - How long did it take in the update rules?
    - How long did it take to activate?
    Once you isolate the problem area, post your findings here and someone will help you.

  • Function Module Extraction from KONV Table taking lot of time for extractio

    Hi
    I have a requirement wherein i need to get records from KONV Table (Conditions (Transaction Data) ). i need the data corresponding to Application (KAPPL) = 'F'.
    For this i had written one function module but it is taking lot of time (@ 2.5 hrs) for fetching records as there are large number of records in KONV Table.
    I am pasting the Function Module code for reference.
    <b>kindly guide me as to how the extraction performance can be improved.</b>
    <b>Function Module Code:</b>
    FUNCTION ZBW_SHPMNT_COND.
    ""Local interface:
    *"  IMPORTING
    *"     VALUE(I_REQUNR) TYPE  SBIWA_S_INTERFACE-REQUNR
    *"     VALUE(I_ISOURCE) TYPE  SBIWA_S_INTERFACE-ISOURCE OPTIONAL
    *"     VALUE(I_MAXSIZE) TYPE  SBIWA_S_INTERFACE-MAXSIZE OPTIONAL
    *"     VALUE(I_INITFLAG) TYPE  SBIWA_S_INTERFACE-INITFLAG OPTIONAL
    *"     VALUE(I_UPDMODE) TYPE  SBIWA_S_INTERFACE-UPDMODE OPTIONAL
    *"     VALUE(I_DATAPAKID) TYPE  SBIWA_S_INTERFACE-DATAPAKID OPTIONAL
    *"     VALUE(I_PRIVATE_MODE) OPTIONAL
    *"     VALUE(I_CALLMODE) LIKE  ROARCHD200-CALLMODE OPTIONAL
    *"  TABLES
    *"      I_T_SELECT TYPE  SBIWA_T_SELECT OPTIONAL
    *"      I_T_FIELDS TYPE  SBIWA_T_FIELDS OPTIONAL
    *"      E_T_DATA STRUCTURE  ZBW_SHPMNT_COND OPTIONAL
    *"      E_T_SOURCE_STRUCTURE_NAME OPTIONAL
    *"  EXCEPTIONS
    *"      NO_MORE_DATA
    *"      ERROR_PASSED_TO_MESS_HANDLER
    The input parameter I_DATAPAKID is not supported yet !
      TABLES: KONV.
    Auxiliary Selection criteria structure
      DATA: l_s_select TYPE sbiwa_s_select.
    Maximum number of lines for DB table
      STATICS: l_maxsize TYPE sbiwa_s_interface-maxsize.
    Maximum number of lines for DB table
      STATICS: S_S_IF TYPE SRSC_S_IF_SIMPLE,
    counter
              S_COUNTER_DATAPAKID LIKE SY-TABIX,
    cursor
              S_CURSOR TYPE CURSOR.
    Select ranges
      RANGES: L_R_KNUMV  FOR KONV-KNUMV,
              L_R_KSCHL  FOR KONV-KSCHL,
              L_R_KDATU  FOR KONV-KDATU.
    Declaring internal tables
    DATA : I_KONV LIKE KONV OCCURS 0 WITH HEADER LINE.
      DATA : Begin of I_KONV occurs 0,
             MANDT LIKE konv-mandt,
             KNUMV LIKE konv-knumv,
             KPOSN LIKE konv-kposn,
             STUNR LIKE konv-stunr,
             ZAEHK LIKE konv-zaehk,
             KAPPL LIKE konv-kappl,
             KSCHL LIKE konv-kschl,
             KDATU LIKE konv-kdatu,
             KBETR LIKE konv-kbetr,
             WAERS LIKE konv-waers,
             END OF I_KONV.
    Initialization mode (first call by SAPI) or data transfer mode
    (following calls) ?
      IF i_initflag = sbiwa_c_flag_on.
    Initialization: check input parameters
                    buffer input parameters
                    prepare data selection
    The input parameter I_DATAPAKID is not supported yet !
    Invalid second initialization call -> error exit
        IF NOT g_flag_interface_initialized IS INITIAL.
          IF
            1 = 2.
            MESSAGE e008(r3).
          ENDIF.
          log_write 'E'                    "message type
                    'R3'                   "message class
                    '008'                  "message number
                    ' '                    "message variable 1
                    ' '.                   "message variable 2
          RAISE error_passed_to_mess_handler.
        ENDIF.
    Check InfoSource validity
        CASE i_isource.
          WHEN 'X'.
         WHEN 'Y'.
         WHEN 'Z'.
          WHEN OTHERS.
           IF 1 = 2. MESSAGE e009(r3). ENDIF.
           log_write 'E'                  "message type
                     'R3'                 "message class
                     '009'                "message number
                     i_isource            "message variable 1
                     ' '.                 "message variable 2
           RAISE error_passed_to_mess_handler.
        ENDCASE.
    Check for supported update mode
        CASE i_updmode.
    For full upload
          WHEN 'F'.
          WHEN 'D'.
          WHEN OTHERS.
           IF 1 = 2. MESSAGE e011(r3). ENDIF.
           log_write 'E'                  "message type
                     'R3'                 "message class
                     '011'                "message number
                     i_updmode            "message variable 1
                     ' '.                 "message variable 2
           RAISE error_passed_to_mess_handler.
        ENDCASE.
        APPEND LINES OF i_t_select TO g_t_select.
    Fill parameter buffer for data extraction calls
        g_s_interface-requnr    = i_requnr.
        g_s_interface-isource   = i_isource.
        g_s_interface-maxsize   = i_maxsize.
        g_s_interface-initflag  = i_initflag.
        g_s_interface-updmode   = i_updmode.
        g_s_interface-datapakid = i_datapakid.
        g_flag_interface_initialized = sbiwa_c_flag_on.
    Fill field list table for an optimized select statement
    (in case that there is no 1:1 relation between InfoSource fields
    and database table fields this may be far from beeing trivial)
        APPEND LINES OF i_t_fields TO g_t_fields.
    Interpretation of date selection for generic extraktion
       CALL FUNCTION 'RSA3_DATE_RANGE_CONVERT'
         TABLES
           i_t_select = g_t_select.
      ELSE.                 "Initialization mode or data extraction ?
       CASE g_s_interface-updmode.
         WHEN 'F' OR 'C' OR 'I'.
    First data package -> OPEN CURSOR
        IF g_counter_datapakid = 0.
       L_MAXSIZE = G_S_INTERFACE-MAXSIZE.
          LOOP AT g_t_select INTO l_s_select WHERE fieldnm = 'KNUMV'.
            MOVE-CORRESPONDING l_s_select TO l_r_knumv.
            APPEND l_r_knumv.
          ENDLOOP.
          LOOP AT g_t_select INTO l_s_select WHERE fieldnm = 'KSCHL'.
            MOVE-CORRESPONDING l_s_select TO l_r_kschl.
            APPEND l_r_kschl.
          ENDLOOP.
          Loop AT g_t_select INTO l_s_select WHERE fieldnm = 'KDATU'.
            MOVE-CORRESPONDING l_s_select TO l_r_kdatu.
            APPEND l_r_kdatu.
          ENDLOOP.
    *In case of full upload
    Fill field list table for an optimized select statement
    (in case that there is no 1:1 relation between InfoSource fields
    and database table fields this may be far from beeing trivial)
       APPEND LINES OF I_T_FIELDS TO S_S_IF-T_FIELDS.
          OPEN CURSOR G_CURSOR FOR
            SELECT MANDT
                   KNUMV
                   KPOSN
                   STUNR
                   ZAEHK
                   KAPPL
                   KSCHL
                   KDATU
                   KBETR
                   WAERS
            FROM   KONV
            WHERE KNUMV IN l_r_knumv
            AND   KSCHL IN l_r_kschl
            AND   KDATU IN l_r_kdatu
            AND   KAPPL EQ 'F'.
        ENDIF.
        Refresh I_KONV.
        FETCH NEXT CURSOR G_CURSOR
                   APPENDING CORRESPONDING FIELDS OF TABLE I_KONV
                   PACKAGE SIZE S_S_IF-MAXSIZE.
        IF SY-SUBRC <> 0.
          CLOSE CURSOR G_CURSOR.
          RAISE NO_MORE_DATA.
        ENDIF.
        LOOP AT I_KONV.
         IF I_KONV-KAPPL EQ 'F'.
          CLEAR :E_T_DATA.
          E_T_DATA-MANDT = I_KONV-MANDT.
          E_T_DATA-KNUMV = I_KONV-KNUMV.
          E_T_DATA-KPOSN = I_KONV-KPOSN.
          E_T_DATA-STUNR = I_KONV-STUNR.
          E_T_DATA-ZAEHK = I_KONV-ZAEHK.
          E_T_DATA-KAPPL = I_KONV-KAPPL.
          E_T_DATA-KSCHL = I_KONV-KSCHL.
          E_T_DATA-KDATU = I_KONV-KDATU.
          E_T_DATA-KBETR = I_KONV-KBETR.
          E_T_DATA-WAERS = I_KONV-WAERS.
          APPEND E_T_DATA.
       ENDIF.
        ENDLOOP.
        g_counter_datapakid = g_counter_datapakid + 1.
      ENDIF.
    ENDFUNCTION.
    Thanks in Advance
    Regards
    Swapnil.

    Hi,
    one option to investigate is to select the data with a condition on KNUMV (primary IDX).
    Since shipment costs are store in VFKP I would investigate if all your F condition records are used in this table (field VFKP-KNUMV).
    If this is the case then something like
    SELECT *
    FROM KONV
    WHERE KNUMV IN (SELECT DISTINCT KNUMV FROM VFKP)
    or
    SELECT DISTINCT KNUMV
    INTO CORRESPONDING FIELD OF <itab>
    FROM VFKP
    and then
    SELECT *
    FROM KONV
    FOR ALL ENTRIES IN <itab>
    WHERE...
    will definitively speed it up.
    hope this helps....
    Olivier

  • Taking lot of time during execution

    hi... friends..
    i write a driver programe for a smartforms.. but it takes lot of time when its execute..... am sending the part of my  code which taking the time (dat i *** to know at d time of debuging.)
    SELECT * FROM KONV INTO CORRESPONDING FIELDS OF TABLE IT_KONV FOR ALL ENTRIES IN IT_VBRK
               WHERE KNUMV = IT_VBRK-KNUMV
               AND KSCHL IN ('JECS','JEXP','JA1X','ZPR0','ZPKG','ZMQD',
                             'ZTRD','ZDSD','ZMOU','ZPDT','ZIN1','R100',
                             'JEXQ','JEAP','JEAQ','JESP','JESQ','JCEP',
                             'JCEQ','ZNRK','ZB00','ZKF0','JCST','JCSR',
                             'JLST','JIVP','JIVC','JLSR','DIFF','ZEX1','ZPR1').
    LOOP AT IT_KONV.
        IF IT_KONV-KSTAT NE 'X'.
        CASE IT_KONV-KSCHL.
          WHEN 'JECS'.
            TOT_JECS = TOT_JECS + IT_KONV-KWERT.
          WHEN 'JEXP'.
            TOT_JEXP = TOT_JEXP + IT_KONV-KWERT.
          WHEN 'JA1X'.
            TOT_JA1X = TOT_JA1X + IT_KONV-KWERT.
          WHEN 'ZPR0'.
            TOT_ZPR0 = TOT_ZPR0 + IT_KONV-KWERT.
          WHEN 'ZPKG'.
            TOT_ZPKG = TOT_ZPKG + IT_KONV-KWERT.
          WHEN 'ZMQD'.
            TOT_ZMQD = TOT_ZMQD + IT_KONV-KWERT.
          WHEN 'ZTRD'.
            TOT_ZTRD = TOT_ZTRD + IT_KONV-KWERT.
          WHEN 'ZDSD'.
            TOT_ZDSD = TOT_ZDSD + IT_KONV-KWERT.
          WHEN 'ZMOU'.
            TOT_ZMOU = TOT_ZMOU + IT_KONV-KWERT.
          WHEN 'ZPDT'.
            TOT_ZPDT = TOT_ZPDT + IT_KONV-KWERT.
          WHEN 'ZIN1'.
            TOT_ZIN1 = TOT_ZIN1 + IT_KONV-KWERT.
          WHEN 'R100'.
            TOT_R100 = TOT_R100 + IT_KONV-KWERT.
          WHEN 'JEXQ'.
            TOT_JEXQ = TOT_JEXQ + IT_KONV-KWERT.
          WHEN 'JEAP'.
            TOT_JEAP = TOT_JEAP + IT_KONV-KWERT.
          WHEN 'JEAQ'.
            TOT_JEAQ = TOT_JEAQ + IT_KONV-KWERT.
          WHEN 'JESP'.
            TOT_JESP = TOT_JESP + IT_KONV-KWERT.
          WHEN 'JESQ'.
            TOT_JESQ = TOT_JESQ + IT_KONV-KWERT.
          WHEN 'JCEP'.
            TOT_JCEP = TOT_JCEP + IT_KONV-KWERT.
          WHEN 'JCEQ'.
            TOT_JCEQ = TOT_JCEQ + IT_KONV-KWERT.
          WHEN 'ZNRK'.
            TOT_ZNRK = TOT_ZNRK + IT_KONV-KWERT.
          WHEN 'ZB00'.
            TOT_ZB00 = TOT_ZB00 + IT_KONV-KWERT.
          WHEN 'ZKF0'.
            TOT_ZKF0 = TOT_ZKF0 + IT_KONV-KWERT.
          WHEN 'JCST'.
            TOT_JCST = TOT_JCST + IT_KONV-KWERT.
          WHEN 'JCSR'.
            TOT_JCSR = TOT_JCSR + IT_KONV-KWERT.
          WHEN 'JLST'.
            TOT_JLST = TOT_JLST + IT_KONV-KWERT.
          WHEN 'JIVP'.
            TOT_JIVP = TOT_JIVP + IT_KONV-KWERT.
          WHEN 'JIVC'.
            TOT_JIVC = TOT_JIVC + IT_KONV-KWERT.
          WHEN 'JLSR'.
            TOT_JLSR = TOT_JLSR + IT_KONV-KWERT.
          WHEN 'DIFF'.
            TOT_DIFF = TOT_DIFF + IT_KONV-KWERT.
          WHEN 'ZEX1'.
            TOT_ZEX1 = TOT_ZEX1 + IT_KONV-KWERT.
          WHEN 'ZPR1'.
            TOT_ZPR1 = TOT_ZPR1 + IT_KONV-KWERT.
          WHEN OTHERS.
        ENDCASE.
        ENDIF.
        CASE IT_KONV-KSCHL.
          WHEN 'JEXP'.
             TOT_JEXP_DISP = TOT_JEXP_DISP + IT_KONV-KWERT.
          WHEN 'JECS'.
            TOT_JECS_DISP = TOT_JECS_DISP + IT_KONV-KWERT.
          WHEN 'JA1X'.
            TOT_JA1X_DISP = TOT_JA1X_DISP + IT_KONV-KWERT.
        ENDCASE.
        IF IT_KONV-KSCHL = 'JEXP'.
        DUTY_RATE1 =  IT_KONV-KBETR .
        ENDIF.
      ENDLOOP.
    Moderator Message: Post your questions in the relevant forum. Do not use sms-speak.
    Edited by: kishan P on Sep 18, 2010 4:08 PM

    Moderator message - Please see Please Read before Posting in the Performance and Tuning Forum before posting - post locked
    Rob

  • Select statement is taking lot of time for the first time Execution.?

    Hi Experts,
    I am facing the following issue. I am using one select statement to retrieve all the contracts from the table CACS_CTRTBU according to FOR ALL ENTRIES restriction.
    if p_lt_zcacs[] is not initial.
    SELECT
               appl ctrtbu_id version gpart
               busi_begin busi_end tech_begin tech_end
               flg_cancel_obj flg_cancel_vers int_title
             FROM cacs_ctrtbu INTO TABLE lt_cacs FOR ALL ENTRIES IN p_lt_zcacs
                                                    WHERE
                                                    appl EQ gv_appl
                                                    AND ctrtbu_id EQ p_lt_zcacs-ctrtbu_id
                                                    AND  ( flg_cancel_vers EQ '' OR version EQ '000000' )
                                                    AND flg_cancel_obj EQ ''
                                                    AND busi_begin LE p_busbegin
                                                    AND busi_end GT p_busbegin.
    endif.
    The WHERE condition is in order with the available Index. The index has  APPL,CTRTBU_ID,FLG_CANCEL_VERS and FLG_CANCEL_OBJ.
    The technical settings of table CACS_CTRTBU says that the "Buffering is not allowed"
    Now the problem is , for the first time execution of this select statement, with 1.5 lakh entries in P_LT_ZCACS table, the select statement takes 3 minutes.
    If I execute this select statement again, in another run with Exactly the same parameter values and number of entries in P_LT_ZCACS ( i.e 1.5 lakh entries), it gets executed in 3-4 seconds.
    What can be the issue in this case? Why first execution takes longer time?.. Or is there any way to modify the Select statemnt to get better performance.
    Thanks in advance
    Sreejith A P

    Hi,
    >
    sree jith wrote:
    > What can be the issue in this case? Why first execution takes longer time?..
    > Sreejith A P
    Sounds like caching or buffering in some layer down the i/o stack. Your first execution
    seems to do the "physical I/O" where your following executions can use the caches / buffers
    that are filled by your first exectution.
    >
    sree jith wrote:
    > Or is there any way to modify the Select statemnt to get better performance.
    > Sreejith A P
    If modifying your SELECTS statement or your indexes could help depends on your access details:
    does your internal table P_LT_ZCACS  contain duplicates?
    how do your indexes look like?
    how does your execution plan look like?
    what are your execution figures in ST05 - Statement Summary?
    (nr. of executions, records in total, total time, time per execuiton,  records per execution, time per record,...)
    Kind regards,
    Hermann

  • Sharepoint Designer workflow takes long time for execution of action

    Hi All ,
    I have created declarative workflow using SharePoint designer 2010.which is getting executed successfully,But taking lot of time for execution.
    Below are details of it
    workflow contains only one activity "assign Task to User" and workflow will start automatically after uploading document.
    workflow takes 10 minutes to create task for user , 10 minutes to claim task and 10 minutes to execute if any action(Approve or Reject) is taken on task.
    no error in log file or event log related to workflow.
    options tried:
    1.I have tried options  suggested in article(http://www.codeproject.com/Articles/251828/How-to-Improve-Workflow-Performance-in-SharePoint#_rating ),but no luck
    2. Reduced the interval of worflow timer job to 1  from 5 .still no luck
    Any thoughts regarding this would be appreciated.
    ragava_28

    Hi Thuan,
    I have similar issue posted here
    http://social.msdn.microsoft.com/Forums/sharepoint/en-US/82410142-31bc-43a2-b8bb-782c99e082d3/designer-workflow-with-takes-time-to-execute?forum=sharepointcustomizationprevious
    Regards,
    SPGeek03

  • ME2O taking more time for execution

    This has been found sometime ME2O takes very long time for execution. Please refer the below screen shot for selection.
    If you provide the component no, the search time is little less. But still sometimes the execution take more than expected time. This is because SAP standard program search all the deliveries even though these are completed.
    There is SAP note:1815460 - ME2O: Selection of delivery very slow. This will help to improve the execution time a lot.
    Regards,
    Krishnendu.

    THanks for sharing this information,

  • Procedure is taking more time for execution

    hi,
    when i am trying to execute the below procedure it is taking more time for
    execution.
    can you pls suggest the possaible ways to tune the query.
    PROCEDURE sp_sel_cntr_ri_fact (
    po_cntr_ri_fact_cursor OUT t_cursor
    IS
    BEGIN
    OPEN po_cntr_ri_fact_cursor FOR
    SELET c_RI_fAt_id, c_RI_fAt_code,c_RI_fAt_nme,
         case when exists (SELET 'x' FROM A_CRF_PARAM_CALIB t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
         then 'Yes'
                   when exists (SELET 'x' FROM A_EMPI_ERV_CALIB_DETAIL t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM A_IC_CNTRY_IC_CRF_MPG_DTL t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM A_IC_CRF_CNTRYIDX_MPG_DTL t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM A_IC_CRF_RESI_COR t WHERE t.x_axis_c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM A_IC_CRF_RESI_COR t WHERE t.y_axis_c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM A_PAR_MARO_GAMMA_PRIME_CALIB t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM D_ANALYSIS_FAT t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM D_CALIB_CNTRY_RI_FATOR t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM E_BUSI_PORT_DTL t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM E_CNTRY_LOSS_DIST_RSLT t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM E_CNTRY_LOSS_RSLT t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM E_CRF_BUS_PORTFOL_CRITERIA t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM E_CRF_CORR_RSLT t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
                   when exists (SELET 'x' FROM E_HYPO_PORTF_DTL t WHERE t.c_RI_fAt_id = A_IC_CNTR_RI_FAT.c_RI_fAt_id)
                   then 'Yes'
              else
                   'No'
         end used_analysis_ind,
         creation_date, datetime_stamp, user_id
         FROM A_IC_CNTR_RI_FAT
    ORDER BY c_RI_fAt_id_nme DESC;
    END sp_sel_cntr_ri_fact;

    [When your query takes too long...|http://forums.oracle.com/forums/thread.jspa?messageID=1812597]

  • We are running a report ? it is  taking long time for  execution. what step

    we are running a report ? it is  taking long time for  execution. what steps will we do to reduce the execution time?

    Hi ,
    the performance can be improved thru many ways..
    First try to select based on the key fields if it is a very large table.
    if not then create a Secondary index for selection.
    dont perform selects inside a loop , instead do FOR ALL ENTRIES IN
    try to perform may operations in one loop rather than calling different loops on the same internal table..
    All these above and many more steps can be implemented to improve the performance.
    Need to look into your code, how it can be improved in your case...
    Regards,
    Vivek Shah

  • Select query is taking lot of time to fetch data.....

    Select query is taking lot of time to fetch data.
        SELECT algnum atanum  abdatu abzeit abname abenum bmatnr bmaktx bqdatu bqzeit bvlenr bnlenr bvltyp bvlber b~vlpla
               bnltyp bnlber bnlpla bvsola b~vorga INTO TABLE it_final FROM ltak AS a
                       INNER JOIN ltap AS b ON  btanum EQ atanum AND algnum EQ blgnum
                       WHERE a~lgnum = p_whno
                       AND a~tanum IN s_tono
                       AND a~bdatu IN s_tocd
                       AND a~bzeit IN s_bzeit
                       AND a~bname IN s_uname
                       AND a~betyp = 'P'
                       AND b~matnr IN s_mno
                       AND b~vorga <> 'ST'.
    Moderator message: Please Read before Posting in the Performance and Tuning Forum
    Edited by: Thomas Zloch on Mar 27, 2011 12:05 PM

    Hi Shiva,
    I am using two more select queries with the same manner ....
    here are the other two select query :
    ***************1************************
    SELECT * APPENDING CORRESPONDING FIELDS OF TABLE tbl_summary
        FROM ztftelpt LEFT JOIN ztfzberep
         ON  ztfzberep~gjahr = st_input-gjahr
         AND ztfzberep~poper = st_input-poper
         AND ztfzberepcntr  = ztftelptrprctr
        WHERE rldnr  = c_telstra_projects
          AND rrcty  = c_actual
          AND rvers  = c_ver_001
          AND rbukrs = st_input-bukrs
          AND racct  = st_input-saknr
          AND ryear  = st_input-gjahr
          and rzzlstar in r_lstar             
          AND rpmax  = c_max_period.
    and the second one is
    *************************2************************
      SELECT * APPENDING CORRESPONDING FIELDS OF TABLE tbl_summary
        FROM ztftelnt LEFT JOIN ztfzberep
         ON  ztfzberep~gjahr = st_input-gjahr
         AND ztfzberep~poper = st_input-poper
         AND ztfzberepcntr  = ztftelntrprctr
        WHERE rldnr  = c_telstra_networks
          AND rrcty  = c_actual
          AND rvers  = c_ver_001
          AND rbukrs = st_input-bukrs
          AND racct  = st_input-saknr
          AND ryear  = st_input-gjahr
          and rzzlstar in r_lstar                              
          AND rpmax  = c_max_period.
    for both the above table program is taking very less time .... although both the table used in above queries have similar amount of data. And i can not remove the APPENDING CORRESPONDING. because i have to append the data after fetching from the tables.  if i will not use it will delete all the data fetched earlier.
    Thanks on advanced......
    Sourabh

  • Data load taking lot of time

    Hi All,
    I am trying to upload 2LIS_02_SCL data, I am trying to refresh the entire data using Init, it is taking lot of time in Prodcution. This is creating the problem for me for next Back ground Job which runs in the night for delta's. Please can anybody guide me how to speed up the load? This datasource is connected to 2 Infocubes and 1 ODS.
    Regards,
    Rajesh

    Hi Sal,
    I have done the same things as you said, my mistake is
    R/3:
    Locked all R/3 users.
    Deleted from LBWG.
    Filled setup tables using Document Date from 2006 to 2008 (Month wise i have filled).
    BW:
    I have cleaned entire data from 0PUR_C01 and 0PUR_C04.
    Loaded data at a time to 2 Cubes and 1 ODS using Init upload.
    It is started taking long time. Actual problem is load was not finished at the time of Daily load Process Chain starts(Night).
    I have cancelled the job. made available only delta to Process Chain.
    Now problem is escaled, again i started today same Init for 1 Cube only, again taking long time.
    Regards,
    Rajesh

  • Test program running taking much more time on high end server T5440 than low end server  T5220

    Hi all,
    I have written the following program and run on both T5440  [1.4 GHz, 95 GB RAM, 32 cores(s), 256 logical (virtual) processor(s),] and  T5220 [(UltraSPARC-T2 (chipid 0, clock 1165 MH) , 8GB RAM, 1 core, 8 virtual processors )] on same OS version.  I found that T5540 server takes more time than T5220. Please find below the details.
    test1.cpp
    #include <iostream>
    #include <pthread.h>
    using namespace std;
    #define NUM_OF_THREADS 20
    struct ABCDEF {
    char A[1024];
    char B[1024];
    void *start_func(void *)
        long long i = 6000;
        while(i--)
                    ABCDEF*             sdf = new ABCDEF;
                    delete sdf;
                    sdf = NULL;
        return NULL;
    int main(int argc, char* argv[])
        pthread_t tid[50];
        for(int i=0; i<NUM_OF_THREADS; i++)
                    pthread_create(&tid[i], NULL, start_func, NULL);
                    cout<<"Creating thread " << i <<endl;
        for(int i=0; i<NUM_OF_THREADS; i++)
                    pthread_join(tid[i], NULL);
                    cout<<"Waiting for thread " << i <<endl;
    After executing the above program on T5440 takes :
    real 0.78
    user 3.94s
    sys 0.05
    After executing the above program on T5220 takes :
    real 0.23
    user 1.43s
    sys 0.03
    It seems that T5440 which is high end server takes almost 3 times more time than T5220 which is low end server.  
    However, I have one more observation. I tried the following program :
    test2.cpp
    #include <iostream>
    #include <pthread.h>
    using namespace std;
    #define NUM_OF_THREADS 20
    struct ABCDEF {
    char A[1024];
    char B[1024];
    int main(int argc, char* argv[])
        long long i = 6000000;
        while(i--)
            ABCDEF*  sdf = new ABCDEF;
            delete sdf;
            sdf = NULL;
        return 0;
    It seems that T5440 server is fast in this case as compaired to T5220 server.
    Could anyone please help me out the exact reason for this behaviour as my application is slow as well on this T5440 server. I have posted earlier as well for the same issue. 
    Thanks in advance !!!
    regards,
    Sanjay

    You already asked this question...
    48 hours earlier, and in the same Solaris forum space
    Repeating the post isn't going to get you a response any faster, and actually now have people NOT respond because you are not showing any patience.
    These are end-user community forums, not a place to expect Oracle Technical Support.   There is no obligation that there be a response.
    If you have a business-critical issue and hope to get accurate and timely response, then use your service contract credentials to open a Support request.
    This new redundant post is locked.
    Edit:
    It appears that at the same time the O.P. posted this redundant thread, they also posted the same question to at least one other forum web site:
    http://www.unix.com/solaris/229269-test-program-running-taking-much-more-time-high-end-server-t5440-than-low-end-server-t5220.html

  • (Urgent) form taking lots of time to load and fetch the data

    Hi
    I have very serious problem of perfomance. I have installed oracle portal and configured it properly.
    Now except form everything working perfectly. but only forms and links are taking lots of time to load
    as well as for fetching data. I try to tune my sga and aslo findout hits and miss but i didnt find any
    any problem for it. it is ok. can u help me pls. how can i make my form fast.
    My operation system is NT.
    version of database oracle 8.1.7
    Oracle Portal 3.0.8
    Thanks in advance
    raju parmar
    [email protected]
    null

    hi chetan
    Lots of Thanks.
    Now it working perfect.
    Raju
    <BLOCKQUOTE><font size="1" face="Verdana, Arial">quote:</font><HR>Originally posted by Chetan Kashyap ([email protected]):
    The workaround is provided at: http://technet.oracle.com:89/ubb/Forum81/HTML/000395.html <HR></BLOCKQUOTE>
    null

Maybe you are looking for

  • WLC 4404 %OSAPI-3-FILE_OPEN_FAILED

    the WLC 4404 present this logs: *osapiReaper: Oct 02 14:55:11.152: %OSAPI-3-FILE_OPEN_FAILED:  osapi_file.c:370 Failed to open the file : /proc/927/stat.(erno 24) *osapiReaper: Oct 02 14:55:11.152: %OSAPI-3-TASK_GETTIME_FAILED:  osapi_task.c:3431 Fai

  • Photoshop and lightroom deal

    got the 9.99 month deal and i downloaded photoshop but lightroom is not coming up in the creative cloud list

  • I book hard disk retrieval

    my hard disk totally crashed recently and the service centre could not retrieve my files. i read somewhere in the internet that there is a company that can retrieve datas even from disks that had been submerged in water or burned in fire. somehow, i

  • After updating Premiere CS4 to v4.1 - time remapping footages are darken ?

    Time remapping footages are darken When Premiere Pro CS4 export to 'v210 or UYVY'. But Premiere Pro CS4 rendering results are good. It occurs after updates Media Encoder v4.1.0.107. It's fixed or will be update ? system :  Vista x64 ultimateK CPU:Q66

  • Viewing old code in LiveCycle ES3

    I have some forms I created a while ago when I had Acrobat 8 and it's corresponding LiveCycle version.  Fast forward to today, and I need to edit some of the code I added to do things like custom validation, and attaching the form to an email with so