Raw material cost report for production of finished produt.?(urgent..REWARD

Hi,
any one can help in this issue.
i am not getting the raw materila cost & manfacture conversion cost for  for the bom of FG - SFG - SFG - SFG- RAW
FG - finished goods,
SFG - semi finished goods
RAW - raw material.
plz provide the solution.
raw material  and manfacture conversion cost is calculated in PERFORM z_process_data. subroutine.
REPORT z_co_production_cost_nsk.
TABLES: afko, bkpf, t001w , caufv.
TYPE-POOLS: kkblo,
            slis.
DATA: d_datefrom LIKE sy-datum,
      d_dateto LIKE sy-datum,
      d_repid LIKE sy-repid,
      d_uname LIKE sy-uname,
      d_returncode TYPE i,
      d_tabix TYPE i,
      d_kokrs LIKE tka01-kokrs,
      d_waers LIKE tka01-waers,
      wa_fieldcatalog TYPE slis_fieldcat_main,
      wa_listevents TYPE slis_alv_event,
      wa_listlayout TYPE slis_layout_alv,
      wa_print_info TYPE slis_print_alv,
      wa_listheader TYPE slis_listheader,
      d_headerlines TYPE i.
DATA: BEGIN OF t_caufv OCCURS 0,
        aufnr TYPE caufv-aufnr,
        werks TYPE caufv-werks,
        objnr TYPE covp-objnr,
        gamng TYPE caufv-gamng,
        plnbez TYPE caufv-plnbez,
        rsnum TYPE caufv-rsnum,
      END OF t_caufv.
*Added by Anand Bothra on 24/11/2003
DATA: t_ab_caufv LIKE t_caufv OCCURS 0 WITH HEADER LINE.
DATA: t_temp_caufv LIKE t_caufv OCCURS 0 WITH HEADER LINE.
DATA: BEGIN OF t_afpo OCCURS 0,
        aufnr TYPE afpo-aufnr,
        posnr TYPE afpo-posnr,
        wemng TYPE afpo-wemng,
        amein TYPE afpo-amein,
        charg TYPE afpo-charg,
      END OF t_afpo.
DATA: BEGIN OF t_afpo1 OCCURS 0,
        aufnr TYPE afpo-aufnr,
        refaufnr TYPE afpo-aufnr,
        objnr TYPE caufv-objnr,
        rsnum TYPE afko-rsnum,
        wemng TYPE afpo-wemng,
        werks TYPE afpo-dwerk,
        charg TYPE afpo-charg,
      END OF t_afpo1.
DATA: BEGIN OF t_makt OCCURS 0,
        matnr TYPE makt-matnr,
        maktx TYPE makt-maktx,
      END OF t_makt.
DATA: t_fieldcatalog TYPE slis_t_fieldcat_alv,
      t_listevents TYPE slis_t_event,
      t_sortsequence TYPE slis_t_sortinfo_alv,
      t_listheader TYPE slis_t_listheader.
DATA: BEGIN OF t_production_costs OCCURS 0,
        objnr TYPE covp-objnr,       " Object Number
        kstar TYPE covp-kstar,       " Cost Element
        wkgbtr TYPE covp-wkgbtr,     " Cost of Line Item in CO area curr
        mbgbtr TYPE covp-mbgbtr,     " Quantity of Line Item
        matnr TYPE covp-matnr,       " Material Number
        kokrs TYPE covp-kokrs,       " Controlling Area
        belnr TYPE covp-belnr,       " Cost Accounting Document
        buzei TYPE covp-buzei,       " Item Number in Document
      END OF t_production_costs.
DATA: BEGIN OF t_production_costs1 OCCURS 0,
        objnr TYPE covp-objnr,       " Object Number
        kstar TYPE covp-kstar,       " Cost Element
        wkgbtr TYPE covp-wkgbtr,     " Cost of Line Item in CO area curr
        mbgbtr TYPE covp-mbgbtr,     " Quantity of Line Item
        kokrs TYPE covp-kokrs,       " Controlling Area
        belnr TYPE covp-belnr,       " Cost Accounting Document
        buzei TYPE covp-buzei,       " Item Number in Document
      END OF t_production_costs1.
DATA t_production_costs2 LIKE t_production_costs1
     OCCURS 0 WITH HEADER LINE.
DATA: BEGIN OF t_suborders OCCURS 0,
        aufnr TYPE caufv-aufnr,
        prevaufnr TYPE caufv-aufnr,
        objnr TYPE covp-objnr,
        rsnum TYPE caufv-rsnum,
      END OF t_suborders.
DATA: BEGIN OF t_outputtab OCCURS 0,
        plnbez LIKE afko-plnbez,             " Material Number
        objnr LIKE caufv-objnr,              " Object Number
        maktx LIKE makt-maktx,               " Material Description
        charg LIKE afpo-charg,               " Batch Number
        aufnr LIKE afko-aufnr,               " Production Order Number
        gamng LIKE caufv-gamng,              " Total Order Quantity
        wemng LIKE afpo-wemng,               " Goods Receipt Quantity
        amein LIKE afpo-amein,               " Unit of Measure
        yield TYPE p DECIMALS 2,             " Percentage Yield
        totalrmcost TYPE p DECIMALS 2,       " Total Raw Material Cost
        totalpmcost TYPE p DECIMALS 2,       " Total Packing Mat. Cost
        mfgconvcost TYPE p DECIMALS 2,       " Manu. Conversion Cost
        pkgconvcost TYPE p DECIMALS 2,       " Packing Conv. Cost
        rmperunit TYPE p DECIMALS 2,         " Raw Cost per unit
        pmperunit TYPE p DECIMALS 2,         " Pack Mat cost per unit
        ccperunit TYPE p DECIMALS 2,         " Conv Cost per unit
        totperunit TYPE p DECIMALS 2,        " Total Cost per unit
        waers LIKE tka01-waers,              " Currency Key for CO Area
      END OF t_outputtab.
*Added by Anand Bothra on 24/11/2003.
DATA: t_ab_outputtab LIKE t_outputtab OCCURS 0 WITH HEADER LINE,
      t_temp_outputtab LIKE t_outputtab OCCURS 0 WITH HEADER LINE.
BEGIN OF INSERTION VIP110703
DATA:wa_prev_outputtab LIKE LINE OF t_outputtab,
     wa_production_costs LIKE LINE OF t_production_costs.
DATA:prev_totmatqty TYPE p DECIMALS 2,
     prev_tot_mfgconv_cst TYPE p DECIMALS 2,
     grand_mat_qty TYPE p DECIMALS 2 ,
     tmp_aufnr TYPE caufv-aufnr.
DATA: BEGIN OF t_suborders_propcost OCCURS 0,
        aufnr TYPE caufv-aufnr,
        prevaufnr TYPE caufv-aufnr,
        objnr TYPE covp-objnr,
        rsnum TYPE caufv-rsnum,
        proprmcost TYPE p DECIMALS 2,
        prop_mfg_convcost TYPE p DECIMALS 2,
      END OF t_suborders_propcost.
DATA: wa_suborders LIKE LINE OF t_suborders.
END   OF INSERTION VIP110703
BEGIN OF INSERTION VIP111003
DATA: prev_aufnr TYPE caufv-aufnr,
      prev_matnr TYPE mara-matnr,
      curr_matnr TYPE mara-matnr.
DATA: bln_suborder ,
      ratio TYPE p DECIMALS 5.
BEGIN OF INSERTION VIP111003
*Added by Anand Bothra on 28/11/2003
DATA: d_flag TYPE c.
SELECTION-SCREEN BEGIN OF BLOCK zblock1 WITH FRAME TITLE text-001.
SELECT-OPTIONS: s_plnbez FOR afko-plnbez,
                s_aufnr FOR afko-aufnr,
"Added By Vivek on 29.11.2005
                s_auart FOR caufv-auart obligatory.
PARAMETERS p_werks LIKE t001w-werks OBLIGATORY.
SELECTION-SCREEN END OF BLOCK zblock1.
SELECTION-SCREEN BEGIN OF BLOCK zblock2 WITH FRAME TITLE text-002.
SELECT-OPTIONS: s_monat FOR bkpf-monat NO-EXTENSION OBLIGATORY.
PARAMETERS p_gjahr LIKE bkpf-gjahr OBLIGATORY.
SELECTION-SCREEN END OF BLOCK zblock2.
SELECTION-SCREEN BEGIN OF BLOCK zblock3 WITH FRAME TITLE text-022.
PARAMETERS: p_detsum RADIOBUTTON GROUP rad,
            p_sum RADIOBUTTON GROUP rad.
SELECTION-SCREEN END OF BLOCK zblock3.
INITIALIZATION.
  d_repid = sy-repid.
  d_uname = sy-uname.
p_werks = 'G001'.
AT SELECTION-SCREEN OUTPUT.
LOOP AT SCREEN.
   IF screen-name EQ 'P_WERKS'.
     screen-input = 0.
     MODIFY SCREEN.
   ENDIF.
ENDLOOP.
AT SELECTION-SCREEN ON s_monat.
  IF s_monat-high IS INITIAL.
    IF NOT ( s_monat-low BETWEEN 1 AND 12 ).
      MESSAGE e398(00) WITH text-023 text-024 space space.
    ENDIF.
  ELSE.
    IF ( ( s_monat-low LT 1 ) OR ( s_monat-high GT 12 ) ).
      MESSAGE e398(00) WITH text-023 text-024 text-025 space.
    ENDIF.
  ENDIF.
START-OF-SELECTION.
  PERFORM z_get_period_dates.
  PERFORM z_select_prod_orders.
  PERFORM z_select_prod_costs.
  PERFORM z_select_addl_prod_costs.
  PERFORM z_select_mat_desc.
END-OF-SELECTION.
  IF d_returncode EQ 0.
    PERFORM z_process_data.
*Added by Anand Bothra on 24/11/2004.
    PERFORM z_select_to_print.
    PERFORM z_prepare_fieldcat.
    PERFORM z_get_alv_events.
    PERFORM z_define_sortsequence.
    PERFORM z_define_layout.
    PERFORM z_display_list.
*Added by Anand Botra on 25/11/2003.
    PERFORM z_export_to_excel.
    PERFORM z_send_mail_and_download.
  ELSE.
    MESSAGE i017(p5).
  ENDIF.
*&      Form  Z_GET_PERIOD_DATES
      text
-->  p1        text
<--  p2        text
FORM z_get_period_dates.
Determine the date range from the fiscal period range and
fiscal year entered on the selection screen
  DATA: d_firstdate LIKE sy-datum,
        d_lastdate LIKE sy-datum,
        t_dates LIKE scscp_period_str OCCURS 0 WITH HEADER LINE.
  CALL FUNCTION 'FIRST_AND_LAST_DAY_IN_YEAR_GET'
    EXPORTING
      i_gjahr        = p_gjahr
      i_periv        = 'V3'
    IMPORTING
      e_first_day    = d_firstdate
      e_last_day     = d_lastdate
    EXCEPTIONS
      input_false    = 1
      t009_notfound  = 2
      t009b_notfound = 3
      OTHERS         = 4.
  CALL FUNCTION 'CSCP_PARA1_GET_PERIODS'
    EXPORTING
      i_datuv    = d_firstdate
      i_datub    = d_lastdate
      i_timeunit = 'M'
    TABLES
      et_dates   = t_dates.
  SORT t_dates BY sindex.
  DELETE t_dates INDEX 1.
  LOOP AT t_dates.
    SUBTRACT: 1 FROM t_dates-sindex,
              1 FROM t_dates-datub.
    MODIFY t_dates TRANSPORTING sindex datub.
  ENDLOOP.
  CLEAR: d_datefrom,
         t_dates.
  READ TABLE t_dates WITH KEY sindex = s_monat-low.
  d_datefrom = t_dates-datuv.
  CLEAR d_dateto.
  IF s_monat-high IS INITIAL.
    d_dateto = t_dates-datub.
  ELSE.
    CLEAR t_dates.
    READ TABLE t_dates WITH KEY sindex = s_monat-high.
    d_dateto = t_dates-datub.
  ENDIF.
ENDFORM.                    " Z_GET_PERIOD_DATES
*&      Form  Z_SELECT_PROD_ORDERS
      text
-->  p1        text
<--  p2        text
FORM z_select_prod_orders.
Select all production orders as per the selection criteria provided
  DATA: d_dlv_code LIKE jstat-stat,
        d_teco_code LIKE jstat-stat,
        t_status LIKE jstat OCCURS 0 WITH HEADER LINE.
  SELECT SINGLE name1 INTO t001w-name1 FROM t001w WHERE werks = p_werks.
if s_plnbez-low eq space and s_plnbez-high eq space.
endif.
  SELECT aufnr werks objnr gamng rsnum plnbez
  INTO CORRESPONDING FIELDS OF
  TABLE t_caufv FROM caufv
  WHERE aufnr IN s_aufnr
AND   auart IN ('PP01', 'LL02') : BY VIVEK
  AND   auart in s_auart " Added By Vivek on 29.11.2005
  AND   werks = p_werks
  AND   plnbez IN s_plnbez
  AND   getri BETWEEN d_datefrom AND d_dateto
  ORDER BY aufnr.
  d_returncode = sy-subrc.
  IF d_returncode NE 0.
    STOP.
  ENDIF.
Filter out only those production orders that have a status
DLV (Delivered) or TECO (Technically Confirmed).
  CLEAR: d_dlv_code,
         d_teco_code.
  PERFORM z_get_status_code USING 'DLV' CHANGING d_dlv_code.
  PERFORM z_get_status_code USING 'TECO' CHANGING d_teco_code.
  LOOP AT t_caufv.
    REFRESH t_status.
    CALL FUNCTION 'STATUS_READ'
         EXPORTING
          CLIENT           = SY-MANDT
              objnr            = t_caufv-objnr
             only_active      = 'X'
     IMPORTING
          OBTYP            =
          STSMA            =
          STONR            =
        TABLES
             status           = t_status
        EXCEPTIONS
             object_not_found = 1
             OTHERS           = 2
    IF sy-subrc EQ 0.
      CLEAR t_status.
      READ TABLE t_status WITH KEY stat = d_dlv_code.
      IF sy-subrc NE 0.
        CLEAR t_status.
        READ TABLE t_status WITH KEY stat = d_teco_code.
        IF sy-subrc NE 0.
          DELETE t_caufv.
        ENDIF.
      ENDIF.
    ELSE.
      DELETE t_caufv.
    ENDIF.
  ENDLOOP.
  IF t_caufv[] IS INITIAL.
    d_returncode = 4.
    STOP.
  ENDIF.
Added by Anand Bothra on 24/11/2003**********
  t_ab_caufv[] = t_caufv[].
Added by Anand Bothra on 28/11/2003.
  IF ( s_plnbez-low EQ space AND s_plnbez-high EQ space ).
    IF ( s_aufnr-low EQ space AND s_aufnr-high EQ space ).
      d_flag = 'N'.
    ELSE.
      d_flag = 'Y'.
    ENDIF.
  ELSE.
    d_flag = 'Y'.
  ENDIF.
  IF d_flag = 'Y'.
Added by Anand Bothra on 21/11/2003.**********
*Get the batch number of the entered order
    DATA: itab_afpo LIKE afpo OCCURS 100 WITH HEADER LINE.
    DATA: BEGIN OF t_ab_charg OCCURS 0,
*Added by Anand on 27/11/2003
            aufnr LIKE afpo-aufnr,
            charg LIKE afpo-charg,
            END OF t_ab_charg.
    LOOP AT t_caufv.
      SELECT aufnr charg FROM afpo INTO t_ab_charg WHERE aufnr =
  t_caufv-aufnr.
        APPEND t_ab_charg.
        CLEAR t_ab_charg.
      ENDSELECT.
    ENDLOOP.
IF sy-subrc = 0.
   SELECT * FROM afpo INTO TABLE itab_afpo WHERE charg = d_ab_charg.
ENDIF.
    LOOP AT t_ab_charg.
      SELECT * FROM afpo INTO itab_afpo WHERE charg = t_ab_charg-charg.
        APPEND itab_afpo.
        CLEAR itab_afpo.
      ENDSELECT.
    ENDLOOP.
    CLEAR t_caufv.
    REFRESH t_caufv.
*Get all the orders with the same batch number.
    LOOP AT itab_afpo.
      SELECT aufnr werks objnr gamng rsnum plnbez
      INTO CORRESPONDING FIELDS OF
      t_caufv FROM caufv WHERE aufnr = itab_afpo-aufnr.
        APPEND t_caufv.
      ENDSELECT.
    ENDLOOP.
    CLEAR t_caufv.
    SORT t_caufv BY aufnr.
delete adjacent duplicates from t_caufv comparing all fields.
  ENDIF.
  SELECT aufnr posnr wemng amein charg INTO TABLE t_afpo
  FROM afpo FOR ALL ENTRIES IN t_caufv
  WHERE aufnr = t_caufv-aufnr.
  d_returncode = sy-subrc.
  IF d_returncode NE 0.
    STOP.
  ENDIF.
  SORT t_afpo BY aufnr.
ENDFORM.                    " Z_SELECT_PROD_ORDERS
*&      Form  Z_SELECT_MAT_DESC
      text
-->  p1        text
<--  p2        text
FORM z_select_mat_desc.
Get the Description of all materials
  SELECT matnr maktx INTO TABLE t_makt FROM makt
  FOR ALL ENTRIES IN t_caufv
  WHERE matnr = t_caufv-plnbez
  AND   spras = sy-langu.
ENDFORM.                    " Z_SELECT_MAT_DESC
*&      Form  Z_PROCESS_DATA
      text
-->  p1        text
<--  p2        text
FORM z_process_data.
Process the data from all production orders and prepare the output
table for display appropriately
  DATA: d_mbgbtr TYPE p DECIMALS 3,
        loop_cnt TYPE i.
  REFRESH t_outputtab.
  LOOP AT t_caufv.
    CLEAR t_outputtab.
    MOVE-CORRESPONDING t_caufv TO t_outputtab.
    CLEAR t_makt.
    READ TABLE t_makt WITH KEY matnr = t_caufv-plnbez.
    IF sy-subrc EQ 0.
      MOVE t_makt-maktx TO t_outputtab-maktx.
    ENDIF.
    CLEAR t_afpo.
    READ TABLE t_afpo WITH KEY aufnr = t_caufv-aufnr.
    IF sy-subrc EQ 0.
      MOVE: t_afpo-wemng TO t_outputtab-wemng,
            t_afpo-amein TO t_outputtab-amein,
            t_afpo-charg TO t_outputtab-charg.
    ENDIF.
    IF t_outputtab-gamng NE 0.
      COMPUTE t_outputtab-yield =
      ( t_outputtab-wemng / t_outputtab-gamng ) * 100.
    ENDIF.
    APPEND t_outputtab.
  ENDLOOP.
  SORT t_production_costs BY objnr kstar.
  LOOP AT t_production_costs.
    AT NEW objnr.
      CLEAR: d_mbgbtr, d_tabix, t_outputtab.
      READ TABLE t_outputtab WITH KEY objnr = t_production_costs-objnr.
      MOVE sy-tabix TO d_tabix.
      " Add up the Raw Material and Manufacturing Conversion
      " Costs from the previous stage production order
      CLEAR loop_cnt .
      LOOP AT t_suborders WHERE aufnr = t_outputtab-aufnr.
     commented by anand bothra on 20/11/2003
        ADD 1 TO loop_cnt.
        IF loop_cnt > 1.
          EXIT.
        ENDIF.
        LOOP AT t_production_costs1 WHERE objnr = t_suborders-objnr.
          CASE t_production_costs1-kstar.
            WHEN '0005000000' OR '0005010000'.     " Raw Material Cost
BEGIN OF deletion VIP110703
          ADD t_production_costs1-wkgbtr TO t_outputtab-totalrmcost.
END   OF deletion VIP110703
              ADD t_production_costs1-wkgbtr TO prev_totmatqty.
            WHEN '0000500100'.      " Manufacturing Conversion Cost
              ADD t_production_costs1-wkgbtr TO prev_tot_mfgconv_cst.
BEGIN OF deletion VIP110703
            ADD t_production_costs1-wkgbtr TO t_outputtab-mfgconvcost.
END   OF deletion VIP110703
          ENDCASE.
        ENDLOOP.
BEGIN OF INSERTION VIP110703
       READ TABLE t_production_costs INTO wa_production_costs
       WITH KEY objnr = t_production_costs-objnr
                  matnr = wa_prev_outputtab-plnbez.
       IF sy-subrc = 0.
         IF  ( wa_production_costs-mbgbtr NE
                               wa_prev_outputtab-wemng )  .
           prev_totmatqty = ( prev_totmatqty /
                              wa_prev_outputtab-wemng ) *
                             wa_production_costs-mbgbtr.
           prev_tot_mfgconv_cst = ( prev_tot_mfgconv_cst /
                              wa_prev_outputtab-wemng ) *
                              wa_production_costs-mbgbtr.
         ENDIF.
       ENDIF.
       LOOP AT t_suborders_propcost
               WHERE prevaufnr = wa_prev_outputtab-aufnr.
         t_suborders_propcost-proprmcost = prev_totmatqty.
         t_suborders_propcost-prop_mfg_convcost = prev_tot_mfgconv_cst
         MODIFY t_suborders_propcost.
       ENDLOOP.
       clear: prev_totmatqty,
               prev_tot_mfgconv_cst.
END   OF INSERTION VIP110703
BEGIN OF INSERTION VIP111003
        CLEAR: wa_prev_outputtab,
               wa_production_costs.
        READ TABLE t_outputtab INTO wa_prev_outputtab
        WITH KEY aufnr = t_suborders-prevaufnr.
        ratio = 1.
        IF sy-subrc = 0.
          READ TABLE t_production_costs INTO wa_production_costs
          WITH KEY objnr = t_outputtab-objnr
                     matnr = wa_prev_outputtab-plnbez.
          IF sy-subrc = 0.
            IF  ( wa_production_costs-mbgbtr NE
                                  wa_prev_outputtab-wemng ) .
              ratio = wa_production_costs-mbgbtr /
                      wa_prev_outputtab-wemng.
              prev_totmatqty = ( prev_totmatqty /
                                 wa_prev_outputtab-wemng ) *
                                wa_production_costs-mbgbtr.
              prev_tot_mfgconv_cst = ( prev_tot_mfgconv_cst /
                                 wa_prev_outputtab-wemng ) *
                                 wa_production_costs-mbgbtr.
            ENDIF.
          ENDIF.
        ENDIF.
        LOOP AT t_suborders_propcost
                WHERE prevaufnr = wa_prev_outputtab-aufnr
                AND aufnr = t_outputtab-aufnr.
          t_suborders_propcost-proprmcost = prev_totmatqty.
          t_suborders_propcost-prop_mfg_convcost = prev_tot_mfgconv_cst.
          MODIFY t_suborders_propcost.
        ENDLOOP.
*Commented by Anand Bothra on 20/11/2003.
        CLEAR: prev_totmatqty,
                prev_tot_mfgconv_cst.
BEGIN OF INSERTION VIP111003
      ENDLOOP.
    ENDAT.
    AT END OF kstar.
      SUM.
      CASE t_production_costs-kstar.
        WHEN '0000500200'.    " Packing Conversion Costs
          t_outputtab-pkgconvcost = t_production_costs-wkgbtr.
        WHEN '0005000500'.   " Semi-Finished Cost/Quantity
          MOVE t_production_costs-mbgbtr TO d_mbgbtr.
        WHEN '0005050000' OR '0005050001' OR '0005050002'.
          " Packing Mat Costs
          ADD t_production_costs-wkgbtr TO t_outputtab-totalpmcost.
        WHEN '0005000000' OR '0005010000'.
          ADD t_production_costs-wkgbtr TO t_outputtab-totalrmcost.
        WHEN '0000500100'.      " Manufacturing Conversion Cost
          ADD t_production_costs-wkgbtr TO t_outputtab-mfgconvcost.
      ENDCASE.
    ENDAT.
    AT END OF objnr.
      MOVE d_waers TO t_outputtab-waers.
Calculations for the Production Order
      " Determine the RM Cost/Unit and Mfg Conv Cost/Unit
      CLEAR t_afpo1.
      READ TABLE t_afpo1 WITH KEY aufnr = t_outputtab-aufnr.
      IF ( ( sy-subrc EQ 0 ) AND ( t_afpo1-wemng NE 0 ) ).
BEGIN OF insertion VIP110703
       tmp_aufnr = t_production_costs-objnr+2(12).
       LOOP AT t_suborders_propcost
       WHERE aufnr = tmp_aufnr  .
        ADD t_suborders_propcost-proprmcost TO t_outputtab-totalrmcost
         ADD t_suborders_propcost-prop_mfg_convcost  TO
              t_outputtab-mfgconvcost.
       ENDLOOP.
END   OF insertion VIP110703
BEGIN OF insertion VIP111003
        CLEAR: t_suborders_propcost , tmp_aufnr.
        READ TABLE t_suborders_propcost
        WITH KEY aufnr = t_outputtab-aufnr.
        IF sy-subrc = 0.
         t_suborders_propcost-proprmcost =
             t_suborders_propcost-proprmcost * ratio.
          ADD t_suborders_propcost-proprmcost
                TO t_outputtab-totalrmcost.
         t_suborders_propcost-prop_mfg_convcost =
             t_suborders_propcost-prop_mfg_convcost * ratio.
          ADD t_suborders_propcost-prop_mfg_convcost
               TO t_outputtab-mfgconvcost.
          tmp_aufnr = t_suborders_propcost-prevaufnr.
          bln_suborder = 'T'.
          WHILE bln_suborder = 'T'.
            CLEAR: t_suborders_propcost .
            READ TABLE t_suborders_propcost
            WITH KEY aufnr = tmp_aufnr.
            IF sy-subrc = 0.
              t_suborders_propcost-proprmcost =
                t_suborders_propcost-proprmcost * ratio.
              ADD t_suborders_propcost-proprmcost
                    TO t_outputtab-totalrmcost.
              t_suborders_propcost-prop_mfg_convcost =
                  t_suborders_propcost-prop_mfg_convcost * ratio.
              ADD t_suborders_propcost-prop_mfg_convcost
                   TO t_outputtab-mfgconvcost.
              tmp_aufnr = t_suborders_propcost-prevaufnr.
            ELSE.
              bln_suborder = 'F'.
              CLEAR tmp_aufnr.
            ENDIF.
          ENDWHILE.
        ENDIF.
END   OF insertion VIP111003
END   OF deletion VIP110703
       t_outputtab-mfgconvcost = ( t_outputtab-mfgconvcost /
                                   t_afpo1-wemng ) * d_mbgbtr.
       t_outputtab-totalrmcost = ( t_outputtab-totalrmcost /
                                   t_afpo1-wemng ) * d_mbgbtr.
END   OF deletion VIP110703
      ENDIF.
      IF t_outputtab-wemng NE 0.
        t_outputtab-rmperunit = t_outputtab-totalrmcost /
                                t_outputtab-wemng.
        " PM Cost Per Unit = Total PM Cost / Quantity Delivered
        t_outputtab-pmperunit = t_outputtab-totalpmcost
                                / t_outputtab-wemng.
        " Conv Cost Cost Per Unit = (Manu Conv Cost + Pack Conv Cost)
        "                           / Qty Delv
        t_outputtab-ccperunit = ( t_outputtab-mfgconvcost
                                + t_outputtab-pkgconvcost )
                                / t_outputtab-wemng.
      ENDIF.
      " Total Cost Per Unit = (RM Cost per unit + PM Cost per Unit
      "                       + Conv Cost per unit)
      t_outputtab-totperunit = t_outputtab-rmperunit
                               + t_outputtab-pmperunit
                               + t_outputtab-ccperunit.
Update the calculated values in the internal table
      CHECK d_tabix GT 0.
      MODIFY t_outputtab INDEX d_tabix
                         TRANSPORTING totalrmcost totalpmcost
                                      mfgconvcost pkgconvcost
                                      rmperunit pmperunit
                                      ccperunit totperunit waers.
BEGIN OF DELETION VIP110703
     MOVE t_outputtab TO wa_prev_outputtab.
END   OF DELETION VIP110703
    ENDAT.
  ENDLOOP.
ENDFORM.                    " Z_PROCESS_DATA
*&      Form  Z_DISPLAY_LIST
      text
-->  p1        text
<--  p2        text
FORM z_display_list.
Display the Report
  CALL FUNCTION 'REUSE_ALV_LIST_DISPLAY'
      EXPORTING
        I_INTERFACE_CHECK        = ' '
         i_callback_program       = d_repid
        I_CALLBACK_PF_STATUS_SET = ' '
        I_CALLBACK_USER_COMMAND  = ' '
        I_STRUCTURE_NAME         =
         is_layout                = wa_listlayout
           it_fieldcat              = t_fieldcatalog
        IT_EXCLUDING             =
        IT_SPECIAL_GROUPS        =
           it_sort                  = t_sortsequence
        IT_FILTER                =
        IS_SEL_HIDE              =
        I_DEFAULT                = 'X'
        I_SAVE                   = ' '
        IS_VARIANT               = ' '
         it_events                = t_listevents
        IT_EVENT_EXIT            =
         is_print                 = wa_print_info
        IS_REPREP_ID             =
        I_SCREEN_START_COLUMN    = 0
        I_SCREEN_START_LINE      = 0
        I_SCREEN_END_COLUMN      = 0
        I_SCREEN_END_LINE        = 0
        I_BYPASSING_BUFFER       =
        I_BUFFER_ACTIVE          =
   IMPORTING
        E_EXIT_CAUSED_BY_CALLER  =
        ES_EXIT_CAUSED_BY_USER   =
       TABLES
            t_outtab                 = t_outputtab
      EXCEPTIONS
           program_error            = 1
           OTHERS                   = 2
  IF sy-subrc <> 0.
MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
        WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
  ENDIF.
  SET PF-STATUS 'Z_AB_STANDARD'.
ENDFORM.                    " Z_DISPLAY_LIST
*&      Form  Z_FILL_FIELDCATALOG
      text
-->  p1        text
<--  p2        text
FORM z_fill_fieldcatalog USING      p_rownum LIKE sy-curow
                                    p_colnum LIKE sy-cucol
                                    p_fieldname TYPE slis_fieldname
                                    p_tabname TYPE slis_tabname
                                    p_reffield TYPE dd03p-fieldname
                                    p_reftable TYPE dd03p-tabname
                                    p_qfield TYPE slis_fieldname
                                    p_qtab TYPE slis_tabname
                                    p_sum
                                    p_stext
                                    p_mtext
                                    p_ltext
                                    p_datatype
                                    p_outputlen.
Prepare the fields for ALV list output
  CLEAR wa_fieldcatalog.
  wa_fieldcatalog-row_pos = p_rownum.
  wa_fieldcatalog-col_pos = p_colnum.
  wa_fieldcatalog-fieldname = p_fieldname.
  wa_fieldcatalog-tabname = p_tabname.
  wa_fieldcatalog-ref_fieldname = p_reffield.
  wa_fieldcatalog-ref_tabname = p_reftable.
  wa_fieldcatalog-qfieldname = p_qfield.
  wa_fieldcatalog-qtabname = p_qtab.
  wa_fieldcatalog-do_sum = p_sum.
  wa_fieldcatalog-seltext_s = p_stext.
  wa_fieldcatalog-seltext_m = p_mtext.
  wa_fieldcatalog-seltext_l = p_ltext.
  wa_fieldcatalog-datatype = p_datatype.
  wa_fieldcatalog-outputlen = p_outputlen.
  APPEND wa_fieldcatalog TO t_fieldcatalog.
ENDFORM.                    " Z_FILL_FIELDCATALOG
*&      Form  Z_PREPARE_FIELDCAT
      text
-->  p1        text
<--  p2        text
FORM z_prepare_fieldcat.
Append all the display fields into the field catalog internal table
First Row
  PERFORM z_fill_fieldcatalog USING 1 1 'PLNBEZ' 'T_OUTPUTTAB'
                                    space 'AFKO' space space
                                    space space space space space
                                    0.
  PERFORM z_fill_fieldcatalog USING 1 2 'MAKTX' 'T_OUTPUTTAB'
                                    space 'MAKT' space space
                                    space space space space space
                                    0.
  PERFORM z_fill_fieldcatalog USING 1 3 'CHARG' 'T_OUTPUTTAB'
                                    space 'AFPO' space space
                                    space space space space space
                                    0.
Second Row
  PERFORM z_fill_fieldcatalog USING 2 1 'AUFNR' 'T_OUTPUTTAB'
                                    space 'AFKO' space space
                                    space space space space space
                                    0.
  PERFORM z_fill_fieldcatalog USING 2 2 'GAMNG' 'T_OUTPUTTAB'
                                    space 'CAUFV' 'AMEIN' space
                                    'X' space space space space
                                    0.
  PERFORM z_fill_fieldcatalog USING 2 3 'WEMNG' 'T_OUTPUTTAB'
                                    space 'AFPO' 'AMEIN' space
                                    'X' space space space space
                                    0.
  PERFORM z_fill_fieldcatalog USING 2 4 'AMEIN' 'T_OUTPUTTAB'
                                    space 'AFPO' space space
                                    space space space space space
                                    0.
  PERFORM z_fill_fieldcatalog USING 2 5 'YIELD' 'T_OUTPUTTAB'
                                    space space space space
                                    space text-010 text-010 text-010
                                    'QUAN' 17.
Third Row
  PERFORM z_fill_fieldcatalog USING 3 1 'TOTALRMCOST' 'T_OUTPUTTAB'
                                    space space space space
                                    'X' text-011 text-011 text-011
                                    'CURR' 21.
  PERFORM z_fill_fieldcatalog USING 3 2 'TOTALPMCOST' 'T_OUTPUTTAB'
                                    space space space space
                                    'X' text-012 text-012 text-012
                                    'CURR' 21.
  PERFORM z_fill_fieldcatalog USING 3 3 'MFGCONVCOST' 'T_OUTPUTTAB'
                                    space space space space
                                    'X' text-013 text-013 text-013
                                    'CURR' 21.
  PERFORM z_fill_fieldcatalog USING 3 4 'PKGCONVCOST' 'T_OUTPUTTAB'
                                    space space space space
                                    'X' text-014 text-014 text-014
                                    'CURR' 21.
Fourth Row
  PERFORM z_fill_fieldcatalog USING 4 1 'RMPERUNIT' 'T_OUTPUTTAB'
                                    space space space space
                                    space text-015 text-015 text-015
                                    'CURR' 21.
  PERFORM z_fill_fieldcatalog USING 4 2 'PMPERUNIT' 'T_OUTPUTTAB'
                                    space space space space
                                    space text-016 text-016 text-016
                                    'CURR' 21.
  PERFORM z_fill_fieldcatalog USING 4 3 'CCPERUNIT' 'T_OUTPUTTAB'
                                    space space space space
                                    space text-017 text-017 text-017
                                    'CURR' 21.
  PERFORM z_fill_fieldcatalog USING 4 4 'TOTPERUNIT' 'T_OUTPUTTAB'
                                    space space space space
                                    space text-018 text-018 text-018
                                   'CURR' 21.
ENDFORM.                    " Z_PREPARE_FIELDCAT
*&      Form  Z_GET_ALV_EVENTS
      text
-->  p1        text
<--  p2        text
FORM z_get_alv_events.
Returns table of possible events for a list type
  REFRESH t_listevents.
  CALL FUNCTION 'REUSE_ALV_EVENTS_GET'
   EXPORTING
        I_LIST_TYPE     = 0
      IMPORTING
           et_events       = t_listevents
      EXCEPTIONS
           list_type_wrong = 1
           OTHERS          = 2
  IF sy-subrc <> 0.
MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
        WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
  ELSE.
    CLEAR: wa_listevents, d_tabix.
    READ TABLE t_listevents WITH KEY name = slis_ev_top_of_page
    INTO wa_listevents.
    d_tabix = sy-tabix.

Hi Sai,
      You can try using MB51, use filter movement type 261. Add a filter for the posting date coverage.
Then proceed. Click on the icon DETAIL LIST.
Then click on the SUBTOTAL, add MATERIAL as a Criteria. The click the column AMOUNT IN LC.
You should see the total issuances to per material.
I hope this helps.
Heinrick Palad

Similar Messages

  • Raw material not using for production

    Dears
    I have a raw material which will be a line item for different FERT
    But some particular FERT i don't want to this raw material is use for costing and planning and consumption
    Please tell me how we can map this
    I try  in BOM Item status we can select not relevent for costing as well as in material master can be select asP D ,But the problem is that in some FERT i will use this raw material for costing as well as planing ,consumption etc...
    Any hints please...
    Abu Fathima

    Bulk material is normally included in the BOM for information purpose. It normally has not impact on planning, costing, consumption. Materials like grease, washers etc are used as bulk. For what you asked in your first post, bulk material concept suits the best.
    You need to remember that if you set bulk material indicator in BOM (it is set in BOM only if in certain fert materials you don't want that component material to be planned costed and consumed) or material master ( for all Ferts), it will not get copied to component overview of production (meaning, you cannot see it in production order, but you can see it in BOM).
    But you can make it appear in production order by changing the setting Excl. Bulk Material in BOM explosion in OPPQ  and/or OPPR. In this case when you create production order it will appear in the component overview and it will also appear in the order reservation but... movement allowed field will be blank , meaning you cannot post good consumption for the bulk material even if it appears in component overview. So it is not visible in MD04 or MD05.
    Another thing to note is there is a third place you can set bulk indicator, you can set any material as bulk in component overview in CO02, it will not be planned, costed or consumed.
    You do not control those things with item catagory in BOM
    For R&D, the normal procedure is creating an Engineering BOM (Usage 2). But if you want to use production BOM's for R&D also, you need to go to OS20 and for BOM Usage 1 (for Prodution), change + to .(period)  and now go to CS02 and uncheck production relevant for the items you want to not to be considered for production (planning and consumption) and uncheck costing. Then check Engineering/Design Relevant. This should fulfill your need and also looks politically correct because you're just not bulking it out.
    Edited by: Jeevan Sagar on Feb 24, 2012 12:54 AM
    Edited by: Jeevan Sagar on Feb 24, 2012 12:59 AM

  • Raw Material Costing with Overhead, Product Cost Planning

    Hi,
    I have an issue applying overhead to purchased raw materials. We need to apply this overhead for only a certain materials. So, I have defined a overhead key/overhead Group, and assigned the group in the material master of the raw material. The overhead is 2% freight on raw material costs.
    In the std.costing variant, I have assigned the costing sheet under Overhead on material components tab of the corresponding valuation variant. I have also included the Freight OH in the cost component structure.
    However, when I run the costing with CK11N for the raw material, it is showing only the raw material cost, not the overhead.
    What could be the problem?
    I appreciate your help.
    Thanks,
    Ram

    Is the overhead rate a percentage type or quantity based?
    Have you maintained both actual and plan rates (1 & 2) under define % based OH rates or Qty based OH rates accordingly?
    Does the validity date (in define OH rates )cover the date of costing?
    Is the Costing sheet assigned to the valuation variant at plant level?
    Is the OH base in the costing sheet includes the cost element of the raw material?

  • Standard Vs Actual Cost report for Production Order

    Hi Expert,
    I have an requirement that i need report for Standard Cost (CK40N) and Actual cost (261 Movement) for multiple production order or Multiple Material.
    Please suggest standard report if available or FS for creating Z Report.
    Regards,
    Pranav

    Hi Pranav
    There are Standard reports
    Option 1
    You can use Product Drilldown reports in KKO0
    For this:-
    a. Do settings in OKN0 - assign a Cost Comp Structure and Choose Material group = Product Group
    b. Run KKRV to collect data and then use KKO0 reports
    I have replied this in SCN many times.. You can search here. Just google as "SCN" "Ajay Maheshwari" "OKN0" and you can see some posts answered by me
    Option 2
    You can use Summarization Hierarchy KKBC_HOE
    For this
    a. Set up Summ Hierarchy in KKR0.
    b. Run KKRC
    c. Run KKBC_HOE report
    Br Ajay M

  • Break up of raw material cost for released finished materials

    Hi All,
    I have searched various threads before posting this question.
    Is there any standard report available to view the breakup of raw material cost for a release finished material.
    I have cost component split report but it shows everything in raw materials.... is there any report to show a break up of this raw materials cost.
    If there is no standard report can you please how I should develop a customized report.
    Thanks,
    Srini

    Dear Srinivas,
    You will get the cost breakup in the following report:
    CK84_99 - Itemization
    CK86_99 - Costed Multilevel BOM
    CK80_99 - Cost Components
    You will get the same information in CK13N
    From the standard SAP,  no report will show breakup for all the materials in single report at a time.
    We have developed the report through ABAP functionality
    Regards,
    Pavan Kumar Arvapally

  • Raw material cost not coming KE30 profitability report

    Dear Gurus,
    We have two material type for our finished product for one material type without having cost release for current period we can't release the billing document for accounts but in other material type we can release the billing document for account without releasing the cost for current period.
    This occurs with problem that in KE30 we are not receiving the raw material cost & administration cost. Please suggest what should I do to correct this?
    Thanks in advance.

    Hi,
    I already assigned costing key to material type (FERT,HALB) but bifurcation of COGM not flow to CO-PA.
    In T.code KEPR
    1.All F/V i maintained as 3 is it ok or i need to maintain it 1 or 2.
    2.In T.code KE4J
    Record type = F i maintained for FERT,HALB category materials & assigned in Costing key
    Earlier before release i assigned in T.code ke4i
    Condition type             Value fields
    VPRS                          Stock value
    Then some value flow to copa
    After i release i removed stock value from ke30 report and added material cost ,sub contracting cost,material overhead but no value flown CO-PA.
    Pl check
    Regards,
    Debashis

  • How the raw material cost is picked in product cost in case of split materi

    how the raw material cost is picked in product cost in case of split material in BOM

    Hi
    In case of Std cost (CK11N), the planned price or MAP that you enter in the Parent accounting View will be considered for the cost calcualtoin purpose
    Parent view means the view which is above the 2 or more valuation types which consists of avg value of all other val types
    Ajay M

  • Price list change according to raw material cost

    Dear Experts,
    We are currently working in a client where for those products for which the raw material is the main component as the cost of the raw materials varies with a high frequency (daily or weekly) the list price (the price we want to invoice to customers) should be updated accordingly and automatically with a specific mark up.
    Have you found a similar requirement in any client? If yes, could you explain us from a functional perspective how (SAP standard functionality or custom development with a detailed explanation of the solution) you solved this requirement?
    Is there any procedure to do regular massive updates of Finished Good price lists based on the actual variation (and/or expected variation) of raw materials cost?
    Thanks in advance for your help.
    M.Baig

    Hi Baig,
    It is possible to determine the price based on the raw material cost. I dont know whether you are using Moving average price or standard price for the raw material cost.
    Whatever be the  method, when you create the sales order, it is possible to take the raw material cost on the date of order creation using one of teh cost condition types like VPRS. You can use this condition type as statistical.
    You can also have another condition type which is the mark up on this cost.
    Now you can calculate your grossprice using another condition type which total up the cost in VPRS condition type adn the mark up %, either through just configuration or by means of a calculation type routine created in VOFM adn then assigning the same for the gross price condition type.
    I you have any concerns, pls lemme know.

  • Raw material inventory report

    Hi SAP GURUS,
    1) Is there any standard Raw Material Inventory report that shows value by inventory type (scrap, alloys, principal supplies,  spare parts and minor supplies, WIP, finished goods, graphite, and the reserves for those material types
    2) A report that shows Scrap receipts by plant u2013 by material and also a report that shows the recycled scrap receipts by type.  Would like it to show quantity in lbs and gross tons as well as the value and average cost per gross ton
    Thanks
    Anusha
    Edited by: anusha vemulapati on Jan 19, 2009 3:25 PM
    Edited by: anusha vemulapati on Jan 19, 2009 3:25 PM

    You try with this report. And selection option is there, select which option you required
    Tcode: S_P00_07000139.
    It may help full.
    Regards
    Jrp.

  • Raw material cost estimates

    HI experts,
    Currently we have the following scenario:
    There are some raw materials which are procured externally, and these materials are maintained with price control S
    Well, the problem is that the standard cost for the material consists of a few more components, for example:
    The standard price for the material X is 20 USD which consists of:
    - the price of the material itself : 15 USD
    - the import duty : 5 USD
    let's say if the actual import duty happened during IR is 6 USD, how can we get the variance from the difference between the import duty? I am unfamiliar with raw material cost estimate, but seeing that the import duty will be captured using condition type in PO, i assumed that we can use raw material cost estimates with this, and use the COPA report with record type B for this case.
    Could anyone give any suggestions regarding this case? It is better if it comes with step to step guide.
    Thank you very much in advance
    Regards,
    Erwin

    Hi Erwin
    1. The ideal design would have been Price Control V if the material is outright purchased... There by not leaving any scope for variances... You would agree that it is best to valuate inventory @ actuals as far as possible
    2. If you want to retain S, then release your Std cost as many times as the Base Price of 15 or Import duty of 5 usd changes... This will also avoid variances during MIGO.. However, it will throw up inventory revaluation figure each time u release new cost estimate
    Else, the variances will be updated to CO or COPA as per your choice in OKB9.... The record type will be B
    Are you not able to update variance to COPA?
    br, Ajay M

  • How to update only Raw material cost(CK11n) in Material Master ?

    Hi Everybody,
    My client has a requirement where only raw material costs from the BOM should get updated in Material Master (Accounting 1 view in Standard Price field).
    But in Receipe & BOM for the Process Order, the client wants all Packing Materials and activites to be maintained.
    Pls help me in this regards,
    Ankita

    Hi Jagdish,
    Let me put it this way to explain you my problem.
    When running CK11n,
    Total Cost is =
    Total Raw Materials used Cost = QTY from BOM * Price from   Material Master
    +
    Total Packing Materials used Cost = QTY from BOM * Price from   Material Master
    +
    Total Utility cost = Qty from receipe * price in KP26
    When viewing the cost componenet view in CK11n tcode, I can view the break up as follows
    Raw Material Cost = XX rs
    Packing Material Cost = XX rs
    Overheads = XX rs
    Total cost = sum of all above XX rs ( this is the cost which gets updated when realasing price thru t code CK40n)
    But my client wants that at time of price relase, system should relase only total raw materil cost as standard price for the Finished Good in Material Master Accounting 1 view.
    I hope now you are getting me.
    Regards,
    Ankita

  • Reg. Process cost and raw material cost added

    Dear Friends
    Please consider our below scenario
    PO is created and stock is maintained in unrestricted (Raw material)
    and then Production order is created for Cut pcs and Raw material is issued to production order through 261 mvt type
    next Cut pcs is received against the production order through 101 Mvt type. Now operation cost is not added with the Raw material cost, only the Raw material cost is represents in MIGO-> FOOTER  - QUANTITY->Quantity in LC field.  What to do to calculate the process cost too.
    When we receive the cut pcs what we attached as component to the cutpcs's cost is calculated, the charge for Cutting is not calculated. we want both cutpcs charge(10.00 per pc)+component cost(raw mat. 180.00 per 1 kg)
    Cut pcs    10 pcs * 10 Rs   = 100 Rs
    Raw mat  10 kg * 180  Rs = 1800 Rs
    the total cost is 1900 Rs should come in that field
    Thanks
    Rajakumar.K

    Please give solution
    Thanks
    Rajakumar.K

  • Reg. Process cost and raw material cost add

    Dear Friends
    We are doing subcontracting that is E  &  L combination main material is Semifinished and component is Raw material, when I do goods receipt component is going to consumption through 543 mvt type(process order consumption),but the raw material cost and process cost is not added only the process cost is comming. what to do in this case. Pls help me, how to add both of cost.
    Thanks
    Rajakumar.K

    hi,
    What is the price control in accounting view you have maintained for semifinished? If it is S then it will not get updated.  Only if it is V, system will capture raw material & process cost to the Semi Finished.
    regards,
    JP

  • Reg.Calculate Raw material cost(Fabric)+Process cost(semifinished -cutting)

    Dear Friends
    Please consider our below scenario
    In AFS, PO is created and stock is maintained in unrestricted (Raw material)
    and then Production order is created for Cut pcs and Raw material is issued to production order through 261 mvt type
    next Cut pcs is received against the production order through 101 Mvt type. Now operation cost is not added with the Raw material cost, only the Raw material cost is represents in MIGO-> FOOTER - QUANTITY->Quantity in LC field. What to do to calculate the process cost too.
    When we receive the cut pcs what we attached as component to the cutpcs's cost is calculated, the charge for Cutting is not calculated. we want both cutpcs charge(10.00 per pc)+component cost(raw mat. 180.00 per 1 kg)
    Cut pcs 10 pcs * 10 Rs = 100 Rs
    Raw mat 10 kg * 180 Rs = 1800 Rs
    the total cost is 1900 Rs should come in that field
    Thanks
    Rajakumar.K

    Hi,
    Process cost is picked up though the activity you maintained in the routing.
    Pre requites
    1. Activity planning should be done through KP26.
    2. Work center should have right formula
    3. The standard value key which you using in routing should be there in workcenter formula.
    In production order ---> Goto -
    > Cost -
    > Cost analysis
    check whether you getting activity cost(In yours case Cutting cost)
    Regards,
    Vishal

  • Error reading material cost estimate for sales order (KE292)

    Dear All,
    I have an issue with billing. we are posting july month transactions, the material cost is maintained through MR21. When releasing billing document for accounting we are getting error message like"Error reading the material cost estimate for sales order "11"
    Message no. KE292
    Diagnosis
    In Profitability Analysis (CO-PA), the system tried to valuate item 000010 of sales order 11 by reading the corresponding product cost estimate.
    However, no product cost estimate could be found for this sales order item.
    The system accessed product costing for product AMLFP011011XX00P using costing key YB3 as defined in the
    CO-PA Customizing settings.
    System Response
    The system cannot process the document any further.
    Procedure
    Check your Customizing settings."
    We cross checked with other client as a current date and we ran cost estimate through CK40N with same material. and we posted entries. Here it is working fine. but in above process it is not working. Can you pls guide me where i missed.
    Regards,
    Nagaraju,

    Hi,
    When the Costing Key is assigned to the material types in the COPA customizing, then system expects Cost estimation when billing is released to Accounts.
    If you dont run cost estimation but update the material master through MR21, system will not accept as in the Costing key configuration you must have selected the Current Standard price field for the valuation.
    Hence, try to run cost estimation and then do releasing.
    Thanks & Regards
    Ravi Kumar

Maybe you are looking for