Report correction Urgent

Hi,
I am doing Inventory ageing report. The report is giving correct result if I go with material wise selection upto 100 materials at a time. If I run the same report based on Material Group it is giving wrong result. I am pasting the code.
Kindly correct the report it is urgent. Please help to solve this.
Waiting for quick reply
regards,
Ram
REPORT ZMMR0024 LINE-SIZE 170 NO STANDARD PAGE HEADING .
TYPE-POOLS : SLIS.
TABLES : T001, T023, T001K, MARA, marv, MAKT, MBEW, MSEG, ekpo.
Constants
CONSTANTS : GC_FORMNAME_TOP_OF_PAGE TYPE SLIS_FORMNAME VALUE
'TOP_OF_PAGE'.
Internal Tables
DATA  :  BEGIN OF GT_FINAL OCCURS 0,
         MATKL LIKE MARA-MATKL,
         MATNR LIKE MARA-MATNR,
         LBKUM LIKE MBEW-LBKUM,
         tot_val type p decimals 2,
         MAKTX LIKE MAKT-MAKTX,
         tot_amt type p decimals 2,
         price type p decimals 2,
         meins like mara-meins,
         END OF GT_FINAL,
         DETAIL_FINAL LIKE GT_FINAL OCCURS 0 WITH HEADER LINE.
DATA  :  BEGIN OF MAT_FINAL OCCURS 0,
         MATKL LIKE MARA-MATKL,
         TOT_VAL LIKE MSEG-MENGE,
         TOT_AMT LIKE MBEW-SALK3,
         PRICE LIKE MBEW-SALK3,
         meins like mara-meins,
         END OF MAT_FINAL.
DATA :   BEGIN OF I_MARA OCCURS 0,
         MATNR LIKE MARA-MATNR,
         MATKL LIKE MARA-MATKL,
         MAKTX LIKE MAKT-MAKTX,
         MEINS LIKE MARA-MEINS,
         LBKUM LIKE MBEWH-LBKUM,
         TOT_AMT LIKE MBEW-SALK3,
         END OF I_MARA.
DATA :   BEGIN OF I_MKPF_MSEG OCCURS 0,
         MATNR LIKE MARA-MATNR,
         MBLNR LIKE MSEG-MBLNR,
         ZEILE LIKE MSEG-ZEILE,
         MENGE LIKE MSEG-MENGE,
         BWART LIKE MSEG-BWART,
         BUDAT LIKE MKPF-BUDAT,
         NET_VAL LIKE MSEG-MENGE,
         ebeln like mseg-ebeln,
         ebelp like mseg-ebelp,
         lfbnr like mseg-lfbnr,
         lfpos like mseg-lfpos,
         SHKZG LIKE MSEG-SHKZG,
         meins like mara-meins,
         END OF I_MKPF_MSEG,
         WA_TEMP LIKE I_MKPF_MSEG.
DATA :   BEGIN OF I_MBEWH OCCURS 0,
         MATNR LIKE MARA-MATNR,
         LBKUM LIKE MBEW-LBKUM,
         SALK3 LIKE MBEW-SALK3,
         BWKEY LIKE MBEW-BWKEY,
         END OF I_MBEWH.
DATA :   I_MBEWH1 LIKE I_MBEWH OCCURS 0 WITH HEADER LINE.
DATA :   BEGIN OF I_TEMP OCCURS 0,
         MATNR LIKE MARA-MATNR,
         NET_VAL LIKE MSEG-MENGE,
         meins like mara-meins,
         END OF I_TEMP.
RANGES : RANGE_WERK FOR T001W-WERKS,
         RANGE_DATE FOR SY-DATUM,
         S_BWTAR FOR BWTAR.
DATA :  PERIOD LIKE  BAPI0002_4-FISCAL_PERIOD,
        FISCAL_YEAR LIKE  BAPI0002_4-FISCAL_YEAR,
        CUR_VAL LIKE MSEG-MENGE,
        NET_VAL LIKE MSEG-MENGE,
        TOT_VAL LIKE MSEG-MENGE,
        TOT_QTY LIKE MSEG-MENGE,
        TOT_AMT1 LIKE MBEW-SALK3,
        RES_DATE LIKE SY-DATUM,
        NUM LIKE MBEW-SALK3,
        UOM LIKE MARA-MEINS.
Data declarations for alv
DATA : GV_PAGE TYPE N VALUE 0.
DATA : GT_FIELDCAT         TYPE SLIS_T_FIELDCAT_ALV,
       GT_SORT             TYPE SLIS_T_SORTINFO_ALV,
       GT_FILTER           TYPE SLIS_T_FILTER_ALV,
       GT_SP_GROUP         TYPE SLIS_T_SP_GROUP_ALV,
       GT_EVENTS           TYPE SLIS_T_EVENT WITH HEADER LINE,
       GV_REPID            LIKE SY-REPID,
       GT_LIST_TOP_OF_PAGE TYPE SLIS_T_LISTHEADER,
       GV_SAVE(1)          TYPE C,
       GT_VARIANT          LIKE DISVARIANT,
       GV_DOMNAME          LIKE DD07V-DOMNAME,
       GV_DOMVAL           LIKE DD07V-DOMVALUE_L,
       GW_FIELDCAT         TYPE SLIS_FIELDCAT_ALV.
Selection screen
SELECTION-SCREEN BEGIN OF BLOCK SEL WITH FRAME TITLE TEXT-001.
PARAMETERS     : GS_BUKRS LIKE T001K-BUKRS OBLIGATORY.
SELECT-OPTIONS : GS_MATKL FOR MARA-MATKL,
                 GS_MATNR FOR MARA-MATNR.
PARAMETERS     : gs_ped like s031-spmon OBLIGATORY,
                 GS_DAYS(3) TYPE n,
                 MG1 RADIOBUTTON GROUP GR1,
                 MT2 RADIOBUTTON GROUP GR1.
SELECTION-SCREEN END OF BLOCK SEL.
Validations on selection screen
AT SELECTION-SCREEN ON GS_BUKRS.
  PERFORM F00_VALIDATE_COMPANY_CODE.
AT SELECTION-SCREEN ON GS_MATKL.
  IF NOT GS_MATKL[] IS INITIAL.
    PERFORM F01_VALIDATE_MATERIAL_GROUP.
  ENDIF.
AT SELECTION-SCREEN ON GS_MATNR.
  IF NOT GS_MATNR[] IS INITIAL.
    PERFORM F01_VALIDATE_MATERIAL.
  ENDIF.
AT SELECTION-SCREEN ON GS_days.
  if gs_days = ''.
    gs_days = 0.
  endif.
START-OF-SELECTION.
  GV_REPID = SY-REPID.
  PERFORM F20_EVENTTAB_BUILD CHANGING GT_EVENTS[].
  PERFORM F30_SELECT_PRIMARY_DATA.
  IF MG1 = 'X'.
    PERFORM F11_DATA_FORMAT_GROUP.
    PERFORM F50_MATERIAL_GROUP_DATA.
    PERFORM F40_DISPLAY_REPORT TABLES MAT_FINAL.
  ELSEIF MT2 = 'X'.
    PERFORM F10_DATA_FORMAT_MAT.
    PERFORM F40_DISPLAY_REPORT TABLES GT_FINAL.
  ENDIF.
*&      Form  F20_EVENTTAB_BUILD
FORM F20_EVENTTAB_BUILD CHANGING LT_EVENTS TYPE SLIS_T_EVENT.
  CONSTANTS:  LC_FORMNAME_TOP_OF_PAGE TYPE SLIS_FORMNAME VALUE
              'TOP_OF_PAGE',
              LC_FORMNAME_USER_COMMAND TYPE SLIS_FORMNAME VALUE
              'USER_COMMAND'.
  DATA: LS_EVENT TYPE SLIS_ALV_EVENT.
  CALL FUNCTION 'REUSE_ALV_EVENTS_GET'
    EXPORTING
      I_LIST_TYPE = 0
    IMPORTING
      ET_EVENTS   = LT_EVENTS.
note : lt_events has all the events
  READ TABLE LT_EVENTS WITH KEY NAME = SLIS_EV_TOP_OF_PAGE
  INTO LS_EVENT.
  IF SY-SUBRC = 0.
    MOVE GC_FORMNAME_TOP_OF_PAGE TO LS_EVENT-FORM.
    APPEND LS_EVENT TO LT_EVENTS.
  ENDIF.
  READ TABLE LT_EVENTS WITH KEY NAME =   SLIS_EV_USER_COMMAND
  INTO LS_EVENT.
  IF SY-SUBRC = 0.
    MOVE LC_FORMNAME_USER_COMMAND TO LS_EVENT-FORM.
    APPEND LS_EVENT TO LT_EVENTS.
  ENDIF.
ENDFORM.                    "F20_EVENTTAB_BUILD
*&      Form  F12_E04_COMMENT_BUILD
FORM F12_E04_COMMENT_BUILD USING E04_LT_TOP_OF_PAGE TYPE
SLIS_T_LISTHEADER.
  DATA : LS_LINE TYPE SLIS_LISTHEADER,
         LV_TEXT(100) TYPE C,
         LV_DAYLOW(2) TYPE C,
         LV_MONTHLOW(2) TYPE C,
         LV_YEARHIGH(4) TYPE C,
         LV_DAYHIGH(2) TYPE C,
         LV_MONTHHIGH(2) TYPE C,
         LV_YEARLOW(4) TYPE C,
         LV_DATFORMAT1(10),
         LV_DATFORMAT2(10).
  CONCATENATE  'Company Code :' ' '  GS_BUKRS
  INTO LV_TEXT SEPARATED BY SPACE.
  CLEAR LS_LINE.
  LS_LINE-TYP  = 'H'.
  LS_LINE-INFO = LV_TEXT.
  APPEND LS_LINE TO E04_LT_TOP_OF_PAGE.
  CLEAR LV_TEXT.
  IF NOT GS_MATKL[] IS INITIAL.
    IF GS_MATKL-HIGH IS INITIAL AND NOT GS_MATKL-LOW IS INITIAL.
      CONCATENATE  'Material Group :' ' '  GS_MATKL-LOW
      INTO LV_TEXT SEPARATED BY SPACE.
    ELSE .
      CONCATENATE  'Material Group :' GS_MATKL-LOW ' to'
      GS_MATKL-HIGH INTO LV_TEXT SEPARATED BY SPACE.
    ENDIF.
  ENDIF.
  CLEAR LS_LINE.
  LS_LINE-TYP  = 'H'.
  LS_LINE-INFO = LV_TEXT.
  APPEND LS_LINE TO E04_LT_TOP_OF_PAGE.
  CLEAR LV_TEXT.
  IF NOT GS_MATNR[] IS INITIAL.
    IF GS_MATNR-HIGH IS INITIAL AND NOT GS_MATNR-LOW IS INITIAL.
      CONCATENATE  'Material :' ' '  GS_MATNR-LOW
      INTO LV_TEXT SEPARATED BY SPACE.
    ELSE .
      CONCATENATE  'Material :' GS_MATNR-LOW ' to'
      GS_MATNR-HIGH INTO LV_TEXT SEPARATED BY SPACE.
    ENDIF.
  ENDIF.
  CLEAR LS_LINE.
  LS_LINE-TYP  = 'H'.
  LS_LINE-INFO = LV_TEXT.
  APPEND LS_LINE TO E04_LT_TOP_OF_PAGE.
  CLEAR LV_TEXT.
LV_YEARLOW  = gs_ped+0(4).
LV_MONTHLOW = gs_ped+4(2).
LV_DAYLOW   = gs_ped+6(2).
CONCATENATE LV_DAYLOW LV_MONTHLOW LV_YEARLOW INTO LV_DATFORMAT1
*SEPARATED BY '.'.
  CONCATENATE  'Key month : ' gs_ped
  INTO LV_TEXT SEPARATED BY SPACE.
  CLEAR LS_LINE.
  LS_LINE-TYP  = 'H'.
  LS_LINE-INFO = LV_TEXT.
  APPEND LS_LINE TO E04_LT_TOP_OF_PAGE.
  CLEAR LV_TEXT.
  CONCATENATE  'Number of days :' ' '  GS_DAYS
  INTO LV_TEXT SEPARATED BY SPACE.
  CLEAR LS_LINE.
  LS_LINE-TYP  = 'H'.
  LS_LINE-INFO = LV_TEXT.
  APPEND LS_LINE TO E04_LT_TOP_OF_PAGE.
  CLEAR LV_TEXT.
  GV_PAGE = GV_PAGE + 1.
  CONCATENATE  'PAGE NO : ' ' '  GV_PAGE
  INTO LV_TEXT SEPARATED BY SPACE.
  CLEAR LS_LINE.
  LS_LINE-TYP  = 'H'.
  LS_LINE-INFO = LV_TEXT.
  APPEND LS_LINE TO E04_LT_TOP_OF_PAGE.
ENDFORM.                    "F12_E04_COMMENT_BUILD
      FORM TOP_OF_PAGE                                              *
FORM TOP_OF_PAGE.
  CALL FUNCTION 'REUSE_ALV_COMMENTARY_WRITE'
    EXPORTING
      IT_LIST_COMMENTARY = GT_LIST_TOP_OF_PAGE.
ENDFORM.                    "TOP_OF_PAGE
*&      Form  validate_sales_organization
      text
FORM F00_VALIDATE_COMPANY_CODE .
  SELECT SINGLE BUKRS
      FROM T001
      INTO T001-BUKRS
      WHERE BUKRS = GS_BUKRS.
  IF SY-SUBRC = 0.
  ELSE.
    MESSAGE E000(ZCBOM) WITH 'Please enter the valid material group'.
  ENDIF.
ENDFORM.                    " validate_sales_organization
*&      Form  VALIDATE_PLANT
      text
-->  p1        text
<--  p2        text
FORM F01_VALIDATE_MATERIAL_GROUP.
  SELECT SINGLE MATKL
      FROM T023
      INTO T023-MATKL
      WHERE MATKL IN GS_MATKL.
  IF SY-SUBRC = 0.
  ELSE.
    MESSAGE E000(ZCBOM) WITH 'Please enter the valid material group'.
  ENDIF.
ENDFORM.                    " VALIDATE_PLANT
*&      Form  VALIDATE_MATERIAL
      text
-->  p1        text
<--  p2        text
FORM F01_VALIDATE_MATERIAL.
  SELECT SINGLE MATNR
      FROM MARA
      INTO MARA-MATNR
      WHERE MATNR IN GS_MATNR.
  IF SY-SUBRC = 0.
  ELSE.
    MESSAGE E000(ZCBOM) WITH 'Please enter the valid material '.
  ENDIF.
ENDFORM.                    " VALIDATE_MATERIAL
*&      Form  F40_DISPLAY_REPORT
FORM F40_DISPLAY_REPORT TABLES IT.
  CALL FUNCTION 'REUSE_ALV_LIST_DISPLAY'
    EXPORTING
      I_CALLBACK_PROGRAM      = GV_REPID
      I_CALLBACK_USER_COMMAND = 'USER_COMMAND '
      IT_FIELDCAT             = GT_FIELDCAT[]
      IT_SPECIAL_GROUPS       = GT_SP_GROUP[]
      IT_SORT                 = GT_SORT[]
      I_SAVE                  = GV_SAVE
      IS_VARIANT              = GT_VARIANT
      IT_EVENTS               = GT_EVENTS[]
    TABLES
      T_OUTTAB                = IT.                         "it_1.
  CLEAR:GT_FIELDCAT.
  REFRESH:GT_FIELDCAT.
ENDFORM.                    " F40_DISPLAY_REPORT
*&      Form  F30_SELECT_PRIMARY_DATA
      text
FORM F30_SELECT_PRIMARY_DATA .
subroutine to get the actual data
to get the plants for the given company code
  data : temp_bukrs like BAPI0002_2-COMP_CODE,
         temp_date  like BAPI0002_4-POSTING_DATE.
  data : last_day(2) type n,
         from_date like sy-datum,
         temp_date1 like sy-datum,
         cal_month(2) type n,
         cal_year(4) type n.
  SELECT DISTINCT BWKEY FROM T001K INTO RANGE_WERK-LOW WHERE BUKRS = GS_BUKRS.
    RANGE_WERK-SIGN = 'I'.
    RANGE_WERK-OPTION = 'EQ'.
    APPEND RANGE_WERK.
  ENDSELECT.
*selecting material that is relevant to the selection criteria
  SELECT MARAMATNR MARAMATKL MARAMEINS MAKTMAKTX
         FROM MARA JOIN MAKT
           ON MAKTMATNR = MARAMATNR
         INTO CORRESPONDING FIELDS OF TABLE I_MARA
         WHERE MARA~MATKL IN GS_MATKL
          AND  MARA~MATNR IN GS_MATNR
          AND MAKT~SPRAS = 'EN'.
  temp_bukrs = gs_bukrs.
  cal_month = gs_ped+4(2).
  cal_year  = gs_ped+0(4).
  concatenate cal_year cal_month '01' into temp_date.
*temp_date = temp_date1.
  CALL FUNCTION 'BAPI_COMPANYCODE_GET_PERIOD'
    EXPORTING
      COMPANYCODEID = temp_bukrs
      POSTING_DATE  = temp_date
    IMPORTING
      FISCAL_YEAR   = fiscal_year
      FISCAL_PERIOD = period.
  select single * from marv into marv where bukrs = temp_bukrs.
temp_date1 = temp_date.
  if sy-subrc = 0.
    if ( marv-lfmon ne period or marv-lfgja ne fiscal_year ).
      CALL FUNCTION 'RP_LAST_DAY_OF_MONTHS'
        EXPORTING
          DAY_IN            = temp_date
        IMPORTING
          LAST_DAY_OF_MONTH = from_date
        EXCEPTIONS
          DAY_IN_NO_DATE    = 1
          OTHERS            = 2.
    else.
      from_date = sy-datum.
    endif.
  endif.
to define the range for posting date
  RES_DATE = from_date - GS_DAYS.
  RANGE_DATE-LOW  = RES_DATE.
  RANGE_DATE-HIGH = from_date.
  RANGE_DATE-OPTION = 'BT'.
  RANGE_DATE-SIGN = 'I'.
  APPEND RANGE_DATE.
to select documents and their quantities for the given range of posting dates
with goods movement type 101 105 657 453 459 501 521 and their reversals
  if range_date-low ne range_date-high.
    SELECT MSEG~MATNR MSEG~MBLNR MSEG~ZEILE MSEG~MENGE MSEG~BWART mseg~ebeln mseg~ebelp
           MKPF~BUDAT MSEG~SHKZG
           FROM MKPF
           JOIN MSEG ON MSEG~MBLNR = MKPF~MBLNR
                    AND MSEG~MJAHR = MKPF~MJAHR
                      INTO CORRESPONDING FIELDS OF TABLE I_MKPF_MSEG
                          FOR ALL ENTRIES IN I_MARA
                        WHERE MSEG~MATNR = I_MARA-MATNR
                          AND MSEG~WERKS IN RANGE_WERK
                          AND MKPF~BUDAT IN RANGE_DATE
                          AND MSEG~BWART IN ('101','105','561','501','301','309','951','953','955','957','712','657','658',
                                             '521','522','303','304','102','562','502','952','954','956','958','302').
DELETE  I_MKPF_MSEG WHERE      ( BWART = '309' AND SHKZG = 'H' )
                            OR ( BWART = '303' AND SHKZG = 'H' )
                            OR ( BWART = '304' AND SHKZG = 'S' )
                            OR ( BWART = '657' AND SHKZG = 'H' )
                            OR ( BWART = '658' AND SHKZG = 'S' ).
  endif.
  SORT I_MKPF_MSEG BY MATNR MBLNR.
  LOOP AT I_MKPF_MSEG.
    if i_mkpf_mseg-bwart = '101' or i_mkpf_mseg-bwart = '102'.
      select single * from ekpo  where ebeln = i_mkpf_mseg-ebeln
                                   and ebelp = i_mkpf_mseg-ebelp.
      if ekpo-pstyp = 7.
        delete i_mkpf_mseg where ebeln = i_mkpf_mseg-ebeln
                             and ebelp = i_mkpf_mseg-ebelp.
        CLEAR I_MKPF_MSEG-MENGE.
      endif.
    endif.
    IF ( I_MKPF_MSEG-BWART = '101' OR I_MKPF_MSEG-BWART = '105' OR I_MKPF_MSEG-BWART = '712' OR
         I_MKPF_MSEG-BWART = '657' OR I_MKPF_MSEG-BWART = '453' OR I_MKPF_MSEG-BWART = '459' OR
         I_MKPF_MSEG-BWART = '501' OR I_MKPF_MSEG-BWART = '701' OR
         I_MKPF_MSEG-BWART = '521' OR I_MKPF_MSEG-BWART = '561' ).
      NET_VAL = NET_VAL + I_MKPF_MSEG-MENGE.
    ENDIF.
    IF ( I_MKPF_MSEG-BWART = '102' OR I_MKPF_MSEG-BWART = '106' OR
         I_MKPF_MSEG-BWART = '658' OR I_MKPF_MSEG-BWART = '454' OR
         I_MKPF_MSEG-BWART = '460' OR I_MKPF_MSEG-BWART = '502' OR
         I_MKPF_MSEG-BWART = '522' OR I_MKPF_MSEG-BWART = '562').
      NET_VAL = NET_VAL - I_MKPF_MSEG-MENGE.
    ENDIF.
    WA_TEMP = I_MKPF_MSEG.
    AT END OF MATNR.
      I_TEMP-MATNR  = WA_TEMP-MATNR.
      I_TEMP-NET_VAL = NET_VAL.
      APPEND I_TEMP.
      CLEAR NET_VAL.
    ENDAT.
   ENDIF.
  ENDLOOP.
  SORT I_MARA BY MATNR.
  SORT I_TEMP BY MATNR.
  SELECT MATNR LBKUM SALK3 BWKEY
         FROM MBEWH
         INTO CORRESPONDING FIELDS OF TABLE I_MBEWH
         FOR ALL ENTRIES IN I_MARA
         WHERE MATNR = I_MARA-MATNR
           AND BWKEY IN RANGE_WERK
           AND BWTAR IN S_BWTAR
           AND LFGJA = FISCAL_YEAR
           AND LFMON = PERIOD.
  SELECT MATNR LBKUM SALK3 BWKEY
         FROM MBEW
         INTO CORRESPONDING FIELDS OF TABLE I_MBEWH1
         FOR ALL ENTRIES IN I_MARA
         WHERE MATNR = I_MARA-MATNR
           AND BWKEY IN RANGE_WERK.
            AND LFMON = PERIOD
            AND LFGJA = FISCAL_YEAR.
  SORT I_MBEWH BY MATNR BWKEY.
  SORT I_MBEWH1 BY MATNR BWKEY.
  LOOP AT I_MBEWH.
    LOOP AT I_MBEWH1 WHERE MATNR = I_MBEWH-MATNR
                       AND BWKEY = I_MBEWH-BWKEY.
      DELETE I_MBEWH1.
    ENDLOOP.
  ENDLOOP.
  APPEND LINES OF I_MBEWH1 TO I_MBEWH.
  CLEAR : I_MBEWH1.
  REFRESH I_MBEWH1.
  SORT I_MBEWH BY MATNR.
  LOOP AT I_MBEWH .
    I_MBEWH1 = I_MBEWH.
    AT END OF MATNR.
      SUM.
      I_MBEWH1-LBKUM = I_MBEWH-LBKUM.
      I_MBEWH1-SALK3 = I_MBEWH-SALK3.
      APPEND I_MBEWH1.
    ENDAT.
  ENDLOOP.
  DELETE I_MBEWH1 WHERE LBKUM <= 0.
  LOOP AT I_MARA.
    CLEAR : CUR_VAL,
            NUM,
            TOT_VAL,
            TOT_AMT1,
            I_MBEWH1.
    GT_FINAL-MATNR = I_MARA-MATNR.
    GT_FINAL-MATKL = I_MARA-MATKL.
    GT_FINAL-MAKTX = I_MARA-MAKTX.
    gt_final-meins = I_MARA-MEINS.
    READ TABLE I_MBEWH1 WITH KEY MATNR = I_MARA-MATNR.
    GT_FINAL-LBKUM = I_MBEWH1-LBKUM.
to get the net inward movement vale that is to be subtracted from current value
    READ TABLE I_TEMP WITH KEY MATNR = I_MARA-MATNR.
    IF SY-SUBRC = 0 .
      IF GT_FINAL-LBKUM > 0.
        TOT_VAL = gt_final-lbkum - I_TEMP-NET_VAL.
        if tot_val gt 0.
          GT_FINAL-TOT_VAL = TOT_VAL.
          GT_FINAL-PRICE = I_MBEWH1-SALK3 / gt_final-lbkum."TOT_VAL.
          GT_FINAL-TOT_AMT = GT_FINAL-PRICE * GT_FINAL-TOT_VAL.
          APPEND GT_FINAL.
        endif.
      ENDIF.
    else.
      if gt_final-lbkum > 0.
        gt_final-tot_val = gt_final-lbkum.
        GT_FINAL-PRICE = I_MBEWH1-SALK3 / gt_final-lbkum.
        GT_FINAL-TOT_AMT = GT_FINAL-PRICE * GT_FINAL-TOT_VAL.
        APPEND GT_FINAL.
      endif.
    ENDIF.
  ENDLOOP.
  DELETE GT_FINAL WHERE LBKUM LE 0.
ENDFORM.                    " F30_SELECT_PRIMARY_DATA
*&      Form  f10_DATA_FORMAT
      text
FORM F10_DATA_FORMAT_MAT .
populating the field catalog table
MATNR
  PERFORM F11_E01_FIELDCAT_INIT USING  'MARA' 'MATNR' 'MATNR' '1'
                           TEXT-003 'GT_FINAL' '15'.
MAKTX
  PERFORM F11_E01_FIELDCAT_INIT USING  'MARA' 'MATKL' 'MATKL' '2'
                           TEXT-004 'GT_FINAL' '24'.
DESC
  PERFORM F11_E01_FIELDCAT_INIT USING  'MAKT' 'MAKTX' 'MAKTX' '3'
                           TEXT-005 'GT_FINAL' '35'.
qty
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'TOT_VAL' 'MENGE' '4'
                           TEXT-006 'GT_FINAL' '15'.
MEINS
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'MEINS' 'MEINS' '4'
                           TEXT-008 'GT_FINAL' '15'.
TOTAL COST
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'TOT_AMT' 'SALK3' '5'
                           TEXT-007 'GT_FINAL' '24'.
  PERFORM F12_E04_COMMENT_BUILD USING GT_LIST_TOP_OF_PAGE[].
  GV_SAVE = 'A'.
  CLEAR GT_EVENTS.
  REFRESH GT_EVENTS.
  GT_EVENTS-NAME = 'TOP_OF_PAGE'.
  GT_EVENTS-FORM = 'TOP_OF_PAGE'.
  APPEND GT_EVENTS.
ENDFORM.                    " f10_DATA_FORMAT
*&      Form  F11_E01_FIELDCAT_INIT
      text
FORM F11_E01_FIELDCAT_INIT  USING T1 T2 T3 T4 T5 T6 T7.
  CLEAR GW_FIELDCAT.
  GW_FIELDCAT-REF_TABNAME    = T1.
  GW_FIELDCAT-FIELDNAME      = T2.
  GW_FIELDCAT-REF_FIELDNAME  = T3.
  GW_FIELDCAT-COL_POS        = T4.
  GW_FIELDCAT-SELTEXT_L      = T5.
  GW_FIELDCAT-TABNAME        = T6.
  GW_FIELDCAT-OUTPUTLEN      = T7.
  APPEND GW_FIELDCAT TO GT_FIELDCAT.
ENDFORM.                    " F11_E01_FIELDCAT_INIT
*&      Form  f40_material_group_data
      text
-->  p1        text
<--  p2        text
FORM F50_MATERIAL_GROUP_DATA .
  SORT GT_FINAL BY MATKL.
  LOOP AT GT_FINAL.
    TOT_QTY = GT_FINAL-TOT_VAL + TOT_QTY.
    TOT_AMT1 = GT_FINAL-TOT_AMT + TOT_AMT1.
    UOM = GT_FINAL-MEINS.
    AT END OF MATKL.
      MAT_FINAL-MATKL = GT_FINAL-MATKL.
      MAT_FINAL-TOT_VAL = TOT_QTY.
      MAT_FINAL-TOT_AMT = TOT_AMT1.
      MAT_FINAL-MEINS   = UOM.
      APPEND MAT_FINAL.
      CLEAR : TOT_QTY,
              TOT_AMT1.
    ENDAT.
  ENDLOOP.
ENDFORM.                    " f40_material_group_data
*&      Form  BUILD_DETAIL
      text
-->  p1        text
<--  p2        text
FORM BUILD_DETAIL .
  DETAIL_FINAL[] = GT_FINAL[].
  DELETE DETAIL_FINAL WHERE MATKL NE MAT_FINAL-MATKL.
ENDFORM.                    " BUILD_DETAIL
*&      Form  f11_data_format_group
      text
-->  p1        text
<--  p2        text
FORM F11_DATA_FORMAT_GROUP .
MATNR
PERFORM F11_E01_FIELDCAT_INIT USING  'MARA' 'MATNR' 'MATNR' '1'
                          TEXT-003 'GT_FINAL' '15'.
  REFRESH GT_FIELDCAT[].
MAKTX
  PERFORM F11_E01_FIELDCAT_INIT USING  'MARA' 'MATKL' 'MATKL' '2'
                           TEXT-004 'MAT_FINAL' '24'.
DESC
PERFORM F11_E01_FIELDCAT_INIT USING  'MAKT' 'MAKTX' 'MAKTX' '3'
                          TEXT-005 'GT_FINAL' '35'.
qty
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'TOT_VAL' 'MENGE' '4'
                           TEXT-006 'MAT_FINAL' '15'.
qty
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'MEINS' 'MEINS' '5'
                           TEXT-008 'MAT_FINAL' '15'.
TOTAL COST
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'TOT_AMT' 'SALK3' '6'
                           TEXT-007 'MAT_FINAL' '24'.
  PERFORM F12_E04_COMMENT_BUILD USING GT_LIST_TOP_OF_PAGE[].
  GV_SAVE = 'A'.
  CLEAR GT_EVENTS.
  REFRESH GT_EVENTS.
  GT_EVENTS-NAME = 'TOP_OF_PAGE'.
  GT_EVENTS-FORM = 'TOP_OF_PAGE'.
  APPEND GT_EVENTS.
ENDFORM.                    " f11_data_format_group
*&      Form  DETAIL_FORMAT_FIELDCAT
      text
-->  p1        text
<--  p2        text
FORM DETAIL_FORMAT_FIELDCAT .
  REFRESH GT_FIELDCAT[].
MATNR
  PERFORM F11_E01_FIELDCAT_INIT USING  'MARA' 'MATNR' 'MATNR' '1'
                           TEXT-003 'DETAIL_FINAL' '15'.
MAKTL
  PERFORM F11_E01_FIELDCAT_INIT USING  'MARA' 'MATKL' 'MATKL' '2'
                           TEXT-004 'DETAIL_FINAL' '24'.
MAKTX
  PERFORM F11_E01_FIELDCAT_INIT USING  'MAKT' 'MAKTX' 'MAKTX' '3'
                           TEXT-005 'DETAIL_FINAL' '35'.
qty
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'TOT_VAL' 'MENGE' '4'
                           TEXT-006 'DETAIL_FINAL' '15'.
UOM
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'MEINS' 'MEINS' '5'
                           TEXT-008 'DETAIL_FINAL' '15'.
TOTAL COST
  PERFORM F11_E01_FIELDCAT_INIT USING  '' 'TOT_AMT' 'SALK3' '6'
                           TEXT-007 'DETAIL_FINAL' '24'.
PERFORM F12_E04_COMMENT_BUILD USING GT_LIST_TOP_OF_PAGE[].
  GV_SAVE = 'A'.
CLEAR GT_EVENTS.
REFRESH GT_EVENTS.
GT_EVENTS-NAME = 'TOP_OF_PAGE'.
GT_EVENTS-FORM = 'TOP_OF_PAGE'.
APPEND GT_EVENTS.
ENDFORM.                    " DETAIL_FORMAT_FIELDCAT
      FORM USER_COMMAND                                             *
FORM USER_COMMAND USING R_UCOMM LIKE SY-UCOMM
               RS_SELFIELD TYPE SLIS_SELFIELD.
  CASE R_UCOMM.
    WHEN '&IC1'.                       "doubleclick
      IF RS_SELFIELD-TABNAME = 'MAT_FINAL'.
        READ TABLE MAT_FINAL INDEX  RS_SELFIELD-TABINDEX .
        PERFORM BUILD_DETAIL.
        PERFORM DETAIL_FORMAT_FIELDCAT.
        PERFORM F20_EVENTTAB_BUILD CHANGING GT_EVENTS[].
        PERFORM F40_DISPLAY_REPORT TABLES DETAIL_FINAL.
        CLEAR DETAIL_FINAL[].
      ENDIF.
      CLEAR R_UCOMM.
  ENDCASE.
ENDFORM.                    "USER_COMMAND

Hi,
Any report code for Inventory ageing material group wise. kindly help me.
regards,
Ram

Similar Messages

  • Japanese in reports-- needs urgent help

    I am using aplication server 9.0.2.0.1 basically i want to use report services with it.
    I am facing some problems in generating reports with japanese character. Infracture and application are installed on different m/c character setting for infracture is UTF8.
    Not applied any patch. OS is win2000 pro.
    NLS_LANG for application server in registry is set to JAPANESE_JAPAN.JA16JIS
    Now the problems i am facing are:
    1. In pdf japanese character are comming as junk character but not "?????". I did every thing a/c
    to doc http://otn.oracle.com/products/reports/htdocs/pdfenh.htm#uifont but not working.
    MY M/c default regional setting is Japanese
    2. In HTML i need to change the encoding of browser to UTF8 to get the report correctly. What can be done to this?
    so that one will not have to change the encoding.
    Now when i envoked the servlet for displaying environment variable NSL_LANG is displayed as JAPANESE_JAPAN.UTF8 and not JA16SJIS. PDF characters are displayed as html before changing the encoding of browser to UTF8.
    Can any one let me know how to change that to JA16SJIS i have already tried changing that in registry!!
    Can any one please help me with this??
    Thanks in advance.
    Thanks and regards,

    Dear Sripathy!!
    As i have already mentioned changing NLS_LANG to SJIS on server m/c is not reflecting so font alising is not working. i changed it in registry. It is showing as UTF8 on the environment setting page. Can u tell me how to change that in SJIS for using the first option.
    for using the second option it works only with true type font. but in my case it showing as type1 what should i do??
    Since we already have the lisence for the said version i can't go for the third option.
    If you can help me with this will be of great help.
    You can directly send me the option on [email protected]
    Thanks in advance

  • Captivate Quiz Not Reporting Correctly in LMS

    I am using Captivate 5.0 to publish a project to an EKP LMS. I am able to get the file to show complete in the LMS, but the quiz is not reporting correctly. Instead of a percentage it is reporting the number of points earned. Is there any way to have a percentage reported instead? I would appreciate any suggestions.  Grace

    Hi Grace,
    Can you check the Highlighted part and reset your Radio button to 'Percentage'--
    Thanks,
    Anjaneai

  • HELP! Capital One not reporting correctly

    Hello everyone,I filed my case BK 7 on 05/15/2015, had my 341 meeting, and am now patiently awaiting my discharge to arrive in the mail.  I've been monitoring my credit report via CreditKarma and have been noticing most of my accounts being updated as, IIB, and closed with zero balances. Capital One, however, is not showing "included in bankruptcy." The balance was updated to $0, but the payment status shows, "Collection/Charge Off." I called Capital One and they told me they sold the account to a collection agency and there was nothing they could do to report the account as IIB.  They said that when they had the account, they could have reported it correctly, but since they sold the account, they only report information from when they owned the account.  They gave me the new account owner and told me this is who I should contact. I understand what the rep is saying, but I can't believe that this account can not be updated to report as IIB.  Will this account continue to report on my CR as a charge off?  Has anyone else run into this issue?  Please help!  I am trying to get my reports as cleaned up as possible before my discharge. Thank you in advance for your repies!

    0REDSOX7 wrote:
    It is valid because they sold the debt to a collection agency prior to your filing.  They do not own it anymore.  So they report it as Collections/Charge Off. If/When the new creditor decides to report it to your credit report, it will have to say zero balance, and IIB.  And yes, the CA will be able to report it even if it was discharged (so long as reporting is accurate) as it was sold/transferred prior to your filing.With all do respect I disagree wholeheartedly with this. Yes, creditors can and do report accts previously sold/charged off prior to filing, as such. However I do not feel that it has to end this way. My recent experience with getting an original creditor (Credit One) to report as iib/0/closed, is a testament to this. Basically, I had 2 creditors reporting to Equifax that my CH7 discharged accounts were 'sold/transferred/charged off'. Naturally, like the OP, I was concerned and didn't think this was right. So, I filed an initial online dispute with Equifax, against the entries for both creditors. Ultimately Equifax found in favor of the creditors, stating that they were reporting correctly. I was LIVID! After that, I filed a second dispute, this time via certified mail and providing copies of my Schedule F inclusion of both creditors, as well as a copy of my discharge order. Similarly, Equifax again found in favor of the creditors and refused to adjust the entries. Here is where it gets better and where I hope it gives you something to look forward to: I gathered all of my documentation up and called Equifax on the phone. My initial motive for placing the call to Equifax was to get an answer to one simple question: "How could anything that the original creditors report to you, supersede documents from a discharged US Bankruptcy order?' I spoke to a halfbrained CSR at first and asked exactly that question. After haggling a bit, his ultimate answer was that he couldn't disclose any information to me on what response was given from the original creditors. This is a clear violation of law. The CB's must provide to anyone who disputes a credit entry, the exact data included in the response from the creditor. Hearing "I cannot disclose" from this CSR sent me into stratospheric anger. I asked to speak to a supervisor. The call took a better turn. After reviewing my schedule F inclusion of the creditors and the discharge papers, the Equifax supervisor agreed that the creditors were reporting unfairly and inaccurately. The supervisor has the 'Specialty Department' make the two entries for these creditors immediately update to 'iib/0/closed'.  All is well with that aspect of my story. My point is, don't lie down and just give up OP. Just because the original creditor doesnt' have to play ball, doesn't mean you can't get it reported the way you need it to. Be persistent. Gather your papers and call them. Don't lay down and accept it.

  • Is crystal reports correct for me / my needs?

    i'm wondering if crystal reports is correct for my needs.  i don't mind investing the time / money to figure this out, but i really can't waste any time so i thought i'd ask the question first
    is crystal reports correct for my needs?
    some detail of my needs:
    1.  the report would be similar to an IKEA catalog: lots of pictures, different layouts (so different reports merged into one). reports need to "look bitchin'". needs to be "printer ready" in regards to size, crop lines, page numbers, etc.  my main concern here is basically "how limiting is crystal reports in data placement on the page"?
    2.  the data would come from a relatively large db (MS SQL, Oracle, mySQL, and maybe others).  size: about 40 million record main table, with supporting tables (i.e., relational). the db is not encrypted and is accessible if you have the main password.
    3.  i would like to send the reports to something like PDF, but also to excel and text file.
    4.  i would like to offer the reports to my clients as part of my own software package, so hopefully this consists of an .exe file only (no updates required, etc).
    i would prefer to talk to a live person about this, or ideally see a quick demo of what is possible with crystal reports.  is this possible?

    Hello,
    Pictures can be a problem, they take up a lot of report space. I assume your pictures are in the database? Large reports get very large quickly with pictures ( ole object ).
    What you could do is download the trial version of CR 2008 and the sample reports:
    Go to this link: http://www.sdn.sap.com/irj/boc and download the trial version of CR XI R2 and use your XI keycode, then apply the patches which you can get to by clicking on the BusinessObjects tab above, then Downloads.
    Direct link to the Trial version: http://www.sap.com/solutions/sapbusinessobjects/sme/freetrials/index.epx
    I also suggest you call Sales, they can send you links for demo's etc.
    https://smpdl.sap-ag.de/~sapidp/012002523100005852352008E/cr_xi_xtreme_rep_smpl_en.zip
    https://smpdl.sap-ag.de/~sapidp/012002523100006010272008E/feature_smpl.zip
    This may be of help also:
    https://smpdl.sap-ag.de/~sapidp/012002523100006010012008E/demo_smpl.zip
    Thank you
    Don

  • REPORT DOES NOT RUN CORRECTLY , URGENT PLEASE HELP

    Hi,
    I am trying to run a report from visul basic screen, but it does not run correctly. Here is how I am running the report. There is a screen developed in VB This screen prompts the user for user id and password. Once it gets that, it connects to the oracle database and pulls out a column from a table. And passes that value as a parameter to the report. Now I am calling the the report for each individual value . There are 21 value being pulled out of the database and it invokes the report 21 times. So there are 21 report engines gets started. Is there a better way to do that ? Secondly when I pass the parameter , some parameters does not pass correctly I guess , because its not generating any out put . Like out of 21 may be 10 or 11 reports gets generated correctly but rest of the reports are blank. I debug the screen i saw that the parameter value is correct, everything seems good. But still the reports are comming blank. Any Idea why it is so ? The command line that i am using in VB screen is
    Shell "C:\progra~1\ora95_2\bin\rwrun60.exe P:\Business_Analysis_&_Reporting_Tool\Test_REPORT_Templates\STORE_TYPES\Baby_Distribution_Report.Rdf USERID=" & UID & "/" & PWD & "@cposp201 DESFORMAT=PDF DESTYPE=FILE DESNAME=" & txtPath.Text & Replace(strName, " ", "_") & ".PDF BRND='" & adoRecBrand!Brand & "' PRINTJOB=NO PARAMFORM=NO"
    In the above command " adoRecBrand!Brand " is the parameter thats being passed. This is actually a recordset and brand is the column in it. When I debug the screen , I see the value also there. But the report comes out blank. Please help. This is urgent.
    Thanks
    Feroz

    The way you call reports is not scalable. If you have 100 records come back from database, you would end up launch 100 engines at the same times, which probably will blow up your machine. You should use oracle reports server to do that. You can either use rwcli60 to submit the job to reports server, or invoke rwcgi60 from URL.
    I am afraid some of reports engine failed to start and you get nothing back in your case.
    After switch to use reports server achitecture, if you still see some report is blank in your application, then you can run that report with that special set of parameters manually and see if any problem with the report itself.
    Hope this helps.
    Thanks,
    -Shaun

  • Report error ORA-00936 (correction) urgent

    I wrote a quey
    select cardno,name,incharge,phone,fax,email from agreement
    ORDER BY &SORT;
    and getting an erro ora-00936 missing expression,
    why this error is shown,
    i want to make a lexical paramater , and want to give end user the option to choose from a list (to order by) the report,
    please tell me the solution

    Hello,
    http://www.oracle.com/webapps/online-help/reports/10.1.2/topics/htmlhelp_rwbuild_hs/rwwhthow/whatare/dmobj/sq_a_lexical_references.htm
    You create a lexical reference by typing an ampersand (&) followed immediately by the column or parameter name. A default definition is not provided for lexical references. Therefore, you must do the following:
    Before you create your query, define a column or parameter in the data model for each lexical reference in the query. For columns, you must set the Value if Null property, and, for parameters, you must set the Initial Value property. Reports Builder uses these values to validate a query with a lexical reference.
    Create your query containing lexical references.
    Regards

  • Report -very urgent

    Hi gurus,
      Can any one check the code .Iam not getting the output correctly .some garbage values it is taking .Kindly check and reply me it is very urgent for me.
    REPORT  Z_MARPOSS.
    TABLES : EKPO ,
             EKET.
    DATA : BEGIN OF ITAB OCCURS 2,
           EBELN LIKE EKET-EBELN,
           END OF ITAB .
    DATA : BEGIN OF ITAB1 OCCURS 2,
           MATNR LIKE EKPO-MATNR,
           TXZ01 LIKE EKPO-TXZ01,
           MENGE LIKE EKET-MENGE,
           WEMNG LIKE EKET-WEMNG,
           MOBMNG LIKE EKET-MENGE,
           END OF ITAB1.
       SELECT-OPTIONS MEINDT FOR EKET-EINDT.
       SELECT EBELN INTO TABLE ITAB FROM EKET WHERE EINDT IN MEINDT.
       LOOP AT ITAB.
       clear itab1-matnr.
       clear itab1-txz01.
      SELECT MATNR TXZ01 INTO CORRESPONDING FIELDS OF ITAB1 FROM EKPO WHERE EBELN = ITAB-EBELN.
       APPEND ITAB1.
       ENDSELECT.
       ENDLOOP.
       LOOP AT ITAB.
       CLEAR ITAB1-MENGE .
       CLEAR ITAB1-WEMNG .
       SELECT MENGE WEMNG INTO CORRESPONDING FIELDS OF ITAB1 FROM EKET WHERE EBELN = ITAB-EBELN.
       APPEND ITAB1.
       ENDSELECT.
       ENDLOOP.
    top-of-page .
    write : 50 'REPORT FOR STOCK OF PURCHASING MATERIALS' .
    uline .
    write : /2 'MATERIAL.' , 13 sy-vline , 14 'DESCRIPTION', 60 sy-vline , 61 'TOTAL QUANTITY' , 78 SY-VLINE , 79 'DEL QTY' , 95 SY-VLINE , 96 'REM QTY'.
    uline .
    END-OF-SELECTION.
    LOOP AT ITAB1.
    ITAB1-MOBMNG = ITAB1-MENGE - ITAB1-WEMNG.
    MODIFY ITAB1. "Update the Record
    WRITE : /  ITAB1-MATNR UNDER 'MATERIAL' ,
              ITAB1-TXZ01 UNDER 'DESCRIPTION' ,
              ITAB1-MENGE UNDER 'TOTAL QUANTITY' ,
              ITAB1-WEMNG UNDER 'DEL QTY' ,
              ITAB1-MOBMNG UNDER 'REM QTY'.
    ENDLOOP.
    thx & Regards,
    sunder

    Hi,
    In your code you are appending new lines at two places and at the end you are trying to display all the four values:
    SELECT MATNR TXZ01 ITO CORRESPONDING FIELDS OF ITAB1 FROM EKPO WHERE EBELN = ITAB-EBELN.
    APPEND ITAB1.
    SELECT MENGE WEMNG INTO CORRESPONDING FIELDS OF ITAB1 FROM EKET WHERE EBELN = ITAB-EBELN.
    APPEND ITAB1.
    For the above two Append Statement , Relate the four fields using modify statement in the second append using correct index values.
    Regards,
    Baburaj

  • Error in week number while running a discoverer reports. URGENT HELP NEEDED

    Hi All,
    we had a requirement of getting the week number for the given date in one of the columns. Here the start date of the year was not always 1-jAN so we had to create a function which returns the week number as an output.
    The problem that we are facing is we are using the Discoverer 4.1.41.05 both at my end and user end. While i am trying to run the report i am getting the right output but while with the same login id when user is trying to get the output he is getting correct data till the data in year 2009 and from 2010 onwards the answer for the week number is coming in lacks. I had suggested the user to re-install the discoverer but still the issue is there.
    If someone know something about this than please reply to the thread and also mail me on [email protected]
    Thanks,
    Sarang.A.Mehta

    I might be late in replying, but hope it might help.
    From your query it seems you are inserting records into interface tables and then calling process order API( probably from some PL/SQL block).
    This is where I am confused, because I hope you understand, that interface tables are for use with Order Import concurrent Program, and for Process ORder API, you need to provide the data as parameter. The api has, header record type and line table type as parameters. So you need to assign correct data to these variables and pass them as parameter when you are calling Process Order API.
    If you are doing the same thing, then post the exact pl/SQL code and error message from the API. That might help diagnose the issue.
    Regards,
    Nitin Darji

  • Cell formulas stop reporting correct values. Numbers 3.5.

    10.10
    Numbers 3.5
    In the same table:
    I have a cell (say #1) with a number value entered say 10.40.
    I have another cell (say cell #2) that is set to equal that cell's value.
    This works and cell 2 reports the correct value of cell 1.
    But once every 10 or so restarts cell 2 stops reporting cell 1's value correctly.
    It reports the previous value after I change Cell 1's value.
    Sometimes deleting cell 2's reference and re-entering it works.
    Other times it just continues to report cell 1's previous value.
    Getting cell 2 to report the current value of cell 1 can be a chore.
    Other cells on the same sheet with more complicated formulas also stop reporting the correct values.
    Many references are for cells in other tables on the same sheet.
    I can spend 30-45 minutes correcting the mess every 10 or so restarts.
    Anyone else have this issue?
    Any suggestions welcome.
    Thanks   ...   Ken

    Nothing like that here.  Have you tried deleting Numbers 3.5 (go to LaunchPad, hold down the mouse button until the icons quiver, and click the x by the Numbers icon) and re-downloading from the Mac App Store?  Also have you tried shutting down and restarting your Mac?
    SG

  • Bug in Reports 6 Urgent

    HI,
    I have Reports (dev 6.0.5). Whenever I use Built in package LIST in my application it compiles but during execution I get an error that package not found...please help URGENT
    TIA
    Anand

    I can't reproduce this with Reports 6i (6.0.8). Are you sure that it's the LIST package that's causing the compilation issues (often this issue can be caused by running against a different database that was compiled against, and data structure changes making automatic compilation impossible).
    If you've checked this out, and still feel that you have a bug then I would suggest that you log an iTAR with Oracle Support.
    Regards,
    Danny

  • Time out error in oracle reports--very urgent

    Hi
    I have this oracle report on 9i which calls 14 other reports and runs them
    via a wrapper report which I run from a URL
    However I get this engine null crashed error or else Engine rwEng-0 is destroyed due to timeout error.
    From what I understand there is a timeout issue happening bcoz reports is taking a long time to run.Hence I increased the value of engineResponseTimeOut but it does not help either.Would you have any other idea to resolve this issue?
    Could someone plz tell me urgently how can this be resolved.This is on Oracle 9i.
    Thanks

    Hi Ravi kanth,
    You are using select * statement which is very time consuming and low performance. Dont use select * instead use select field1 field2.... into table itab  where field1 = s_field.  Use corresponding field names in the select statement.
    Follow the below rules.
    1) Dont use nested select statements
    2) If possible use for all entries in addition
    3) In the where addition make sure you give all the primary key
    4) Use Index for the selection criteria.
    5) You can also use inner joins
    6) You can try to put the data from the first select statement into an Itab and then in order to select the data from the second table use for all entries in.
    7) Use the runtime analysis SE30 and SQL Trace (ST05) to identify the performance and also to identify where the load is heavy, so that you can change the code accordingly
    <b>reward if useful</b>.
    Regards,
    sunil kairam.

  • R12 Accounts Payable Trial balance is reporting incorrectly (urgent)

    the trial balance is reporting penny amounts on invoices that are fully paid how do I correct this issue

    Follow the below steps and Run the Trial Blance and let me know if it helps.
    Thanks
    Girish
    How to Rebuild Trial Balance Data (repopulate XLA_TRIAL_BALANCES)
    1. Navigate: Payables Responsibility > Setup > Accounting Setups > Subledger Accounting Setups > Open Account Balances Listing Definitions
    2. Query up your Report Definition: select Defined By = Accounting Flexfield or Segment (whichever applies in your case), click “Go”
    3. Click on Update icon in the "Actions" column – the definition's update page opens.
    4. "Touch" the definition by simply clicking "Apply" button (without making any change).
    This should start the “Open Account Balances Data Manager” concurrent processes

  • Credit Mgmt Report Needed -Urgent

    Hi,
    I need this report urgently, can anyone help me out in the same :-
    Fields Of The Report
    a) Sr. No.
    b) Business Area
    c) Sales Representative
    d) Customer Code
    e) Customer Name
    f) Sale Order Number
    g) Qty
    h) Delivery No.
    i) Invoice No.
    j) Invoice Amount
    k) Reason For Credit Check Release.
    If any query has to be run, could u pls tell me how to do the same.
    Regrds,
    Binayak

    Hello
    A query may have some limitations. Data inconsistency / transport issues and so on. Definitely as a workaround solution you could try to prepare a query. Take the ABAPper help.
    As a long term solution, develop a new Z report. There could available standard reports, which can be copied and modified easily.
    Suresh

  • Drill Down - Report Painter (Urgent)

    Hi,
    I need to add drill down i.e. transactions CJ74 and CJI4. IN transaction GR52, I added CJ74, CJI4 as  TR and RKPEP003 as RT.
    My problem :
    When I execute the program, and doble click on the O/P row, pop is showing all the three options i.e
    1. CJ74
    2. CJI4
    3. RKPEP003
    If I select 1st two, it is throwing me out of the report.
    In the last case, it is going to the o/p of report RKPEP003  and not displaying any data as it is taking the default values as they are when I execute RKPEP003 pgm in SE38 and it is not taking values from the row/column I selected in the report painter output.
    Can you please let me know how to correct this.
    Thanks in advance.
    Regards,
    Kiran.

    Hi,
    Since the report is running on the server, the output shall be as well. I don't think you can use desname to specify a local folder as the server knows nothing about local machine. It only has acces to it's resources.
    The user will need to generate the report and then save to local disk. You could also think about other delivery methods such as email.
    Hope that helps.

Maybe you are looking for

  • A few problems with new Pearl 3G 9105

    Device info Carrier: 02 Model info and OS version earl 3G, 9105 Apps and free space: 125.6MB free (1.5GB free in Media Card) Did a battery pull fix your issue? no Apps installed and their version if possible.  No Apps installed Hello, I recently purc

  • Can't access gmail after ios 8.1.2 installation

    I've been living and working in China and using iphone for the past 5 years without any problem accessing any of my gmail accounts.  But for the past couple of weeks after I upgraded to iOS to 8.1.2 on my iphone 5S and my ipad air 2, I noticed I don'

  • AE shows WD External disk in Utility, does not show in Finder

    Hi, I just bought an AE (802.11n). The setup was relatively easy. I updated both the software Airport Utility (5.3.2) and Firmware (7.3.2). When I connect my freshly formatted (HFS+ Case-Sensitive + Journaled) external WD 120Gb HD (which has an exter

  • Inventory Mangement with SnapShots

    Hi experts, I've been trying to implement the SnapShot scenario following the How To paper and I'm not able to create the update rules from 2LIS_03_BX to ODS ODSSNAP and the Cube ICSNAP1. I can not see the key figures to implement rhe uodate routines

  • Mac Pro Can't write temporary files to 10.4 Server?

    We run a file server on an old G4 tower to a network of about 8 Macs. We are having problems with our first Intel machine. We have a 3ghz Mac pro that appears to work fine except for one problem. The server doesn't allow the Mac pro to automatically