Daily stock statement by location in dp value

hi guys,
iam using the t.code mb52 for daily stock statement by location in dp value report. i have to dipspaly the date wise 4 locations i.e ( snt,sabh,sarawak,departement). these are the 4 locations and i want total sum of snt sabah etc of cost in date wise. so how to find out the cost of particular locations.
Thanks & Regards,
praveen.

Perfect - many thanks for the quick response. Points have been awarded.

Similar Messages

  • Daily Stock Statements by location  in dp value report

    hi guys,
    iam using the t.code mb52 for daily stock statement by location in dp value report. i have to dipspaly the date wise 4 locations i.e ( snt,sabh,sarawak,departement). these are the 4 locations and i want total sum of snt sabah etc of cost  in date wise. so how to find out the cost of particular locations.
    Thanks & Regards,
    praveen.

    Perfect - many thanks for the quick response. Points have been awarded.

  • STOCK STATEMENT STORAGE LOCATION WISE

    Dear All,
    Ca we able to take Stock Value on storage location wise for the particular date.
    Thank You,
    Warm Regards
    Mani.

    Hi,
    Stock statement storage location wise can be get, by using T-Code MB5B.
    But Quantity can be gettable on storage location basis. However value can be gettable on Plant level.
    First you have to take the plant stock on any particular date in which you can get Plant Qty and Plant Value. Please divide Plant value by Plant Qty, you can get Rate of each material. After that take storage location wise stock and multiply with Rate.
    Please note that in SAP prices are maintained on Plant level basis. Hence, it is a small workaround.
    Secondly you get Monthend Stock of any month at storage location level with value using T-code mc.9
    Hope this will help you.
    Please reward if useful.
    Ishu

  • Report for stock statement

    hi guy's,
       i am doing report for the stock statement .... my issue is in MB5B if i reverse some document it shows as it move's to issue QTY and my receipt is same but my closing stock is correct ...is there any std report avalible ....
    thank's in advance

    Use this code :
    TABLES : MSEG,MKPF,MARA,MAKT,BEWART,MSLB,BSIM.
    TYPE-POOLS : SLIS.
    DATA : IT_FLDCAT TYPE SLIS_T_FIELDCAT_ALV,
           IT_LIST_HEADER TYPE SLIS_T_LISTHEADER,
           IT_EVENTS TYPE SLIS_T_EVENT,
           GS_LAYOUT TYPE SLIS_LAYOUT_ALV,
           WA_SORT TYPE SLIS_SORTINFO_ALV,
           IT_SORT TYPE SLIS_T_SORTINFO_ALV,
           REPID LIKE SY-REPID,
           FRM_DATE(10),TO_DATE(10),
           DISPTEXT(255),DISPTEXT2(255).
    TYPES : BEGIN OF ST_OPBAL,
             MATNR LIKE MSEG-MATNR,
             MAKTX LIKE MAKT-MAKTX,
             BATCH LIKE MSEG-CHARG,
             BWART LIKE MSEG-BWART,
             MENGE LIKE MSEG-MENGE,
             ZEILE LIKE MSEG-ZEILE,
             WERKS LIKE MSEG-WERKS,
             SOBKZ LIKE MSEG-SOBKZ,
             BUDAT LIKE MKPF-BUDAT,
             SHKZG LIKE MSEG-SHKZG,
             DMBTR LIKE MSEG-DMBTR,
             MBLNR LIKE MSEG-MBLNR,
             LGORT LIKE MSEG-LGORT,
           END OF ST_OPBAL.
    DATA : OPBAL TYPE ST_OPBAL OCCURS 0 WITH HEADER LINE,
           TMP_OPBAL TYPE ST_OPBAL OCCURS 0 WITH HEADER LINE.
    DATA : BEGIN OF BAL_NOREF OCCURS 0,
              MATNR LIKE MARA-MATNR,
              SHKZG LIKE MSEG-SHKZG,
              DMBTR LIKE MSEG-DMBTR,
           END OF BAL_NOREF.
    DATA : BEGIN OF OPBAL2 OCCURS 0,
             SNO(3)      TYPE N,
             MATNR       LIKE MSEG-MATNR,
             MAKTX       LIKE MAKT-MAKTX,
             OP_BAL      LIKE MSEG-MENGE,
             OP_STKVAL   LIKE MSEG-DMBTR,   "NEW
             REC         LIKE MSEG-MENGE,
             T_OPBAL_REC LIKE MSEG-MENGE,
             REC_STKVAL  LIKE MSEG-DMBTR,   "NEW
             ISS         LIKE MSEG-MENGE,
             ISS_STKVAL  LIKE MSEG-DMBTR,   "NEW
             SALES       LIKE MSEG-MENGE,
             T_ISS       LIKE MSEG-MENGE,
             CL_BAL      LIKE MSEG-MENGE,
             BATCH       LIKE MSEG-CHARG,
             SUBCON      LIKE MSEG-MENGE,
             CL_STKVAL   LIKE MSEG-DMBTR,
           END OF OPBAL2.
    DATA  SERNO(4) TYPE C.
    DATA OPTOT  TYPE P DECIMALS 3.
    DATA RECTOT TYPE P DECIMALS 3.
    DATA ISSTOT TYPE P DECIMALS 3.
    DATA TOTALL TYPE P DECIMALS 3.
    DATA FLG        TYPE N.
    DATA FLAG       TYPE N.
    DATA STOCKVAL        TYPE MSEG-DMBTR.
    DATA REC_STOCKVAL    TYPE MSEG-DMBTR.
    DATA ISS_STOCKVAL    TYPE MSEG-DMBTR.
    DATA CL_STKVAL       TYPE MSEG-DMBTR.
    SELECTION-SCREEN BEGIN OF BLOCK X WITH FRAME.
         SELECT-OPTIONS: P_MATNR FOR MSEG-MATNR,
                         P_MGRP  FOR MARA-MATKL,
                         P_DATE FOR MKPF-BUDAT,
         P_PLANT FOR MSEG-WERKS DEFAULT  'NB01' OBLIGATORY NO INTERVALS
                                                    NO-EXTENSION .
         SELECT-OPTIONS: P_STLOC FOR MSEG-LGORT NO INTERVALS NO-EXTENSION.
    SELECTION-SCREEN END OF BLOCK X.
    INITIALIZATION.
       REPID = SY-REPID.
       PERFORM FILL_FLDCAT USING IT_FLDCAT.
       PERFORM FILL_EVENTS USING IT_EVENTS.
       PERFORM FILL_LAYOUT USING GS_LAYOUT.
    START-OF-SELECTION.
      CONCATENATE P_DATE-LOW6(2) '.' P_DATE-LOW4(2) '.' P_DATE-LOW+0(4)
      INTO FRM_DATE.
      CONCATENATE P_DATE-HIGH6(2) '.' P_DATE-HIGH4(2) '.' P_DATE-HIGH+0(4)
      INTO TO_DATE.
      CONCATENATE TEXT-003 FRM_DATE' TO : ' TO_DATE INTO DISPTEXT.
      CONCATENATE TEXT-004 P_PLANT-LOW ' Storage Location : ' P_STLOC-LOW
      INTO DISPTEXT2.
      PERFORM FILL_HEADER USING IT_LIST_HEADER.
      SELECT  A~MATNR
              F~MAKTX
              A~CHARG
              A~BWART
              A~MENGE
              A~ZEILE
              A~WERKS
              A~SOBKZ
              D~BUDAT
              A~SHKZG
              A~DMBTR
              A~MBLNR
              A~LGORT
              INTO TABLE OPBAL
       FROM MKPF AS D JOIN MSEG AS A
               ON DMBLNR = AMBLNR  AND
                  DMJAHR = AMJAHR
            JOIN MARA AS E
               ON EMATNR = AMATNR
            JOIN MAKT AS F
               ON FMATNR = AMATNR
       WHERE   A~MATNR IN P_MATNR
         AND   A~WERKS IN P_PLANT
         AND   A~KZBEW IN (' ','B')
         AND   E~MATKL IN P_MGRP
         AND   A~BWART NOT IN ('541','542','321','322','121')
         AND   A~KZVBR NOT IN ('A')
         AND   D~BUDAT LE P_DATE-HIGH.
    LOOP AT OPBAL WHERE BWART EQ '544' AND LGORT EQ ''.
       TMP_OPBAL = OPBAL.
       APPEND TMP_OPBAL.
    ENDLOOP.
    DELETE OPBAL WHERE ( BWART EQ '309' AND DMBTR EQ 0  ).
    DELETE OPBAL WHERE ( BWART NE '543' AND LGORT EQ '' ).
    LOOP AT TMP_OPBAL.
       OPBAL = TMP_OPBAL.
       APPEND OPBAL.
    ENDLOOP.
    STOCKVAL = 0.
    SORT OPBAL BY MATNR BATCH BUDAT.
    LOOP AT OPBAL.
      SELECT SINGLE LBLAB INTO MSLB-LBLAB FROM MSLB
                            WHERE MATNR = OPBAL-MATNR.
      IF OPBAL-BUDAT LT P_DATE-LOW.
         IF OPBAL-SHKZG = 'H'.
            OPTOT = OPTOT - OPBAL-MENGE.
         ELSEIF OPBAL-SHKZG = 'S'.
            OPTOT = OPTOT + OPBAL-MENGE.
         ENDIF.
    For the duration   II part  *****************
      ELSEIF OPBAL-BUDAT IN P_DATE.
         IF OPBAL-SHKZG = 'H'.
            ISSTOT      = ISSTOT + OPBAL-MENGE.
         ELSEIF OPBAL-SHKZG = 'S'.
            RECTOT = RECTOT + OPBAL-MENGE.
         ENDIF.
      ENDIF.
    AT END OF BATCH. " modified for chek
       READ TABLE OPBAL INDEX SY-TABIX.
       CLEAR BAL_NOREF. REFRESH BAL_NOREF.
       SELECT MATNR SHKZG SUM( DMBTR )
         INTO TABLE BAL_NOREF
         FROM BSIM
        WHERE BUDAT LT P_DATE-LOW  AND
              MATNR EQ OPBAL-MATNR AND
              BWTAR EQ OPBAL-BATCH AND
              BWKEY IN P_PLANT     AND
              BLART IN ('RE','WE','WA','PR')
        GROUP BY MATNR SHKZG.
       LOOP AT BAL_NOREF.
          IF BAL_NOREF-SHKZG = 'H'.
             STOCKVAL = STOCKVAL - BAL_NOREF-DMBTR.
          ELSE.
             STOCKVAL = STOCKVAL + BAL_NOREF-DMBTR.
          ENDIF.
       ENDLOOP.
       CLEAR BAL_NOREF. REFRESH BAL_NOREF.
       SELECT MATNR SHKZG SUM( DMBTR )
         INTO TABLE BAL_NOREF
         FROM BSIM
        WHERE BUDAT IN P_DATE AND
              MATNR EQ OPBAL-MATNR AND
              BWTAR EQ OPBAL-BATCH AND
              BWKEY IN P_PLANT     AND
              BLART IN ('RE','WE','WA','PR')
        GROUP BY MATNR SHKZG.
       LOOP AT BAL_NOREF.
          IF BAL_NOREF-SHKZG = 'H'.
             ISS_STOCKVAL = ISS_STOCKVAL + BAL_NOREF-DMBTR.
          ELSE.
             REC_STOCKVAL = REC_STOCKVAL + BAL_NOREF-DMBTR.
          ENDIF.
       ENDLOOP.
       " MSLB-LBLAB (STOCK WITH SUBCONTRACTOR).
       CL_STKVAL       = STOCKVAL + REC_STOCKVAL - ISS_STOCKVAL.
       TOTALL =  OPTOT + RECTOT - ISSTOT.
       IF OPTOT = '0'   AND RECTOT = '0'  AND ISSTOT = '0'.
          FLG = 1.
       ENDIF.
       IF FLG = 1.
          CLEAR FLG.
       ELSE.
          SERNO = SERNO + 1.
          OPBAL2-SNO         = SERNO.
          OPBAL2-MATNR       = OPBAL-MATNR.
          OPBAL2-MAKTX       = OPBAL-MAKTX.
          OPBAL2-OP_BAL      = OPTOT.
          OPBAL2-REC         = RECTOT.
          OPBAL2-T_OPBAL_REC = OPTOT + RECTOT.
          OPBAL2-ISS         = ISSTOT.
          OPBAL2-T_ISS       = ISSTOT.
          OPBAL2-CL_BAL      = TOTALL.
          OPBAL2-BATCH       = OPBAL-BATCH.
          OPBAL2-SUBCON      = MSLB-LBLAB.
          OPBAL2-OP_STKVAL   = STOCKVAL.
          OPBAL2-ISS_STKVAL  = ISS_STOCKVAL.
          OPBAL2-REC_STKVAL  = REC_STOCKVAL.
          OPBAL2-CL_STKVAL   = CL_STKVAL.
          APPEND OPBAL2.
       ENDIF.
      OPTOT = 0.
      RECTOT = 0.
      ISSTOT = 0.
      STOCKVAL = 0.
      ISS_STOCKVAL = 0.
      REC_STOCKVAL = 0.
      CL_STKVAL    = 0.
    ENDAT.
    ENDLOOP.
      WA_SORT-SPOS = 1.
      WA_SORT-FIELDNAME = 'MATNR'.
      WA_SORT-UP = 'X'.
    WA_SORT-SUBTOT = 'X'.
    APPEND WA_SORT TO IT_SORT.
    CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
        EXPORTING
          I_CALLBACK_PROGRAM = REPID
          IT_FIELDCAT        = IT_FLDCAT
          IT_EVENTS          = IT_EVENTS
          IS_LAYOUT          = GS_LAYOUT
          IT_SORT            = IT_SORT
        TABLES
          T_OUTTAB           = OPBAL2.
    FORM FILL_FLDCAT USING P_FLDCAT TYPE SLIS_T_FIELDCAT_ALV.
       PERFORM FILL_PARAM_FLDCAT USING  1 'SNo'          'SNO'       ' ' 'X'
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  2 'Material No.' 'MATNR'     ' ' 'X'
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  3 'Description'  'MAKTX'     ' ' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  4 'Op.Bal'      'OP_BAL'     'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  5 'Op.Stock Val' 'OP_STKVAL' 'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  6 'Receipts'     'REC'       'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  7 'Total'     'T_OPBAL_REC'  'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  8 'Rect.Val.' 'REC_STKVAL'   'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  9 'Issues'    'ISS'          'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 10 'Iss. Val.' 'ISS_STKVAL'   'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 11 'Cl. Bal.'     'CL_BAL'    'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 12 'Cl.Stock Val' 'CL_STKVAL' 'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 13 'BATCH '       'BATCH'     ' ' ' '
       'OPBAL2' P_FLDCAT.
    ENDFORM.
    FORM FILL_PARAM_FLDCAT USING VALUE(P_COL) VALUE(P_TEXT) VALUE(P_FLDNAME)
                           VALUE(P_DOSUM) VALUE(P_NOZERO) VALUE(P_TABNAME)
                           PP_FLDCAT TYPE SLIS_T_FIELDCAT_ALV.
       DATA : WA_FLDCAT TYPE SLIS_FIELDCAT_ALV.
       CLEAR WA_FLDCAT.
         WA_FLDCAT-COL_POS   = P_COL.
         WA_FLDCAT-SELTEXT_M = P_TEXT.
         WA_FLDCAT-FIELDNAME = P_FLDNAME.
         WA_FLDCAT-TABNAME   = P_TABNAME.
         WA_FLDCAT-DO_SUM    = P_DOSUM.
         WA_FLDCAT-NO_ZERO   = P_NOZERO.
       APPEND WA_FLDCAT TO PP_FLDCAT.
    ENDFORM.
    FORM FILL_HEADER USING P_IT_LIST_HEADER TYPE SLIS_T_LISTHEADER.
      DATA: LS_LINE TYPE SLIS_LISTHEADER.
      CLEAR LS_LINE.
      LS_LINE-TYP = 'S'.
      LS_LINE-INFO = TEXT-002.
      APPEND LS_LINE TO P_IT_LIST_HEADER.
      CLEAR LS_LINE.
      LS_LINE-TYP = 'S'.
      LS_LINE-INFO = DISPTEXT.
      APPEND LS_LINE TO P_IT_LIST_HEADER.
      CLEAR LS_LINE.
      LS_LINE-TYP = 'S'.
      LS_LINE-INFO = DISPTEXT2.
      APPEND LS_LINE TO P_IT_LIST_HEADER.
    ENDFORM.
    FORM FILL_EVENTS USING P_IT_EVENTS TYPE SLIS_T_EVENT.
       DATA LS_EVENT TYPE SLIS_ALV_EVENT.
       MOVE 'TOP_OF_PAGE' TO LS_EVENT-FORM.
       MOVE 'TOP_OF_PAGE' TO LS_EVENT-NAME.
       APPEND LS_EVENT TO P_IT_EVENTS.
    ENDFORM.
    FORM TOP_OF_PAGE.
      CALL FUNCTION 'REUSE_ALV_COMMENTARY_WRITE'
       EXPORTING
         IT_LIST_COMMENTARY       = IT_LIST_HEADER.
    ENDFORM.
    FORM FILL_LAYOUT USING P_GS_LAYOUT TYPE SLIS_LAYOUT_ALV.
       P_GS_LAYOUT-COLWIDTH_OPTIMIZE = 'X'.
       P_GS_LAYOUT-ZEBRA             = 'X'.
       P_GS_LAYOUT-FLEXIBLE_KEY      = 'X'.
    ENDFORM.
    FOR TESTING PURPOSE.
    *SORT OPBAL BY BUDAT.
    *CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
       EXPORTING
         I_CALLBACK_PROGRAM = REPID
         IT_FIELDCAT        = IT_FLDCAT
         IT_EVENTS          = IT_EVENTS
       TABLES
         T_OUTTAB           = OPBAL.
    *FORM FILL_FLDCAT USING P_FLDCAT TYPE SLIS_T_FIELDCAT_ALV.
      PERFORM FILL_PARAM_FLDCAT USING  1 'MBLNR'        'MBLNR'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  2 'CREDIT/DEBIT' 'SHKZG'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  3 'MOV.TYP.'     'BWART'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  4 'ST.LOC.'     'LGORT'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  5 'STOCK VAL'    'DMBTR'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  6 'POS.DATE'     'BUDAT'
      'OPBAL' P_FLDCAT.
    *ENDFORM.

  • Re:Query for Stock Statement for a particular item..!!!!

    Dear SAP Experts,
    I need a stock statement query  for a particular item which contains:
    1.ItemCode
    2.Item Description
    3.Item Price
    4.Opening
    5.Receipts
    6.Issues
    7.Closing
    8. Value
    The selection criteria are:
    1.Warehouse code
    2.Item Name
    3.Posting Date
    Plz give me a good solution for this issue.
    With Regards,
    Revathy

    Check this
    Declare @FromDate Datetime
    Declare @ToDate Datetime
    set @FromDate =
        (Select min(S0.Docdate) from OINM S0 where S0.Docdate >='[%0]')
    set @ToDate =
        (Select max(S1.Docdate) from OINM S1 where S1.Docdate <='[%1]')
    select * from
        SELECT T0.itemcode,
        min(T0.Dscription) as 'Item Description',
        min(B1.ItmsGrpNam) as 'Item Group', W1.Whscode, C1.Location,
        (isnull((
            Select sum(isnull(inqty,0))
            from OINM O1
            where O1.itemcode=T1.itemcode
            and O1.Warehouse=W1.Whscode
            and O1.docdate<@FromDate ),0)-
        isnull((
            Select sum(isnull(outqty,0))
            from OINM O1
            where O1.itemcode=T1.itemcode
            and O1.Warehouse=W1.Whscode
            and O1.docdate<@FromDate),0)
        ) as [Opening Stock],
        isnull((
            Select sum(isnull(inqty,0))
            from OINM O1
            where O1.itemcode=T1.itemcode
            and O1.Warehouse=W1.Whscode
            and O1.docdate>=@FromDate
            and O1.docdate<=@ToDate and O1.inqty>0
            and O1.transtype in (20,18)),0
        ) as [Purchase Quantity],
        isnull((
            Select sum(isnull(outqty,0))
            from OINM O1
            where O1.itemcode=T1.itemcode and O1.Warehouse=W1.Whscode
            and O1.docdate>=@FromDate and O1.docdate<=@ToDate
            and O1.outqty>0 and O1.transtype in (21,19)),0
        ) as [Purchase Return Quantity],
       isnull((
            Select sum(isnull(outqty,0))
            from OINM O1
            where O1.itemcode=T1.itemcode and O1.Warehouse=W1.Whscode
            and O1.docdate>=@FromDate and O1.docdate<=@ToDate and O1.outqty>0
            and O1.transtype in (13,15)),0
        ) as [sale Quatity],
        (isnull
            Select sum(isnull(inqty,0))
            from OINM O1
            where O1.itemcode=T1.itemcode and O1.Warehouse=W1.Whscode
            and O1.docdate<=@ToDate),0
            isnull((
                Select sum(isnull(outqty,0))
                from OINM O1
                where O1.itemcode=T1.itemcode and O1.Warehouse=W1.Whscode
                and O1.docdate<=@ToDate),0)
        ) as [Closing Stock]
        FROM OINM T0
        INNER JOIN OITM T1 ON T0.ItemCode = T1.ItemCode
        INNER JOIN OITW T2 ON T1.ItemCode = T2.ItemCode
        INNER JOIN OITB B1 ON T1.ItmsGrpCod=B1.ItmsGrpCod
        INNER JOIN OWHS W1 ON T2.WhsCode = W1.WhsCode
        INNER JOIN OLCT C1 ON W1.Location=C1.Code
        Group by T1.itemcode, T0.Itemcode, W1.WhsCode, C1.Location
    ) a
    where (a.[Opening Stock]
            +a.[Purchase Quantity]
            + a.[Purchase Return Quantity]
            +a.[sale Quatity]+a.[Closing Stock]
           ) !=0
    Regards,
    Bala

  • Stock balances by location

    Hi I wonder if you can help. I have ran tcode MB5L which provides me with a list of all stock by material code, providing quantity and value. In order to find out which storage location, I can double click on the items, and it shows the storage location, which is via tcode MMBE. However MMBE is for stock balances by location for individual material codes only. Is there one I can run for all stock balances by storage location?

    Perfect - many thanks for the quick response. Points have been awarded.

  • Stock report in BW (valuated stock and Storage Location level)

    Dear All,
                Regards.We got an situation here,
    Case 1:  R3 (MB5B) (Both "Storage loc" and "Valuated stock" shows the same Stock Qty)
    1).The BW Stock Report shows values the Correct Values for "Receipt Qty" and "Issue Qty" with the Correct  "Quantity total Stock" aswell.
    Case 2 :   R3 (MB5B) (Stock is different between "Storage Loc" and "Valuated Stock")
    1).The BW Stock Report shows the  "Quantity Total Stock according to VALUATED STOCK Level(MB5B),but  the "Receipt Qty" and "Issue Qty" according to STORAGE LOCATION Level(MB5B) .
    We followed the "How to Handle Inventory "Doc with the proper sequence of Loading of Infosources and Compression.The data is sitting fine at the cube level.
    It would be great if someone can throw some Light on this issue,on how the Query shows a COMBO of both Valuated stock and Storage Location stock....Held up with this issue for quite sometime..Had a look at the   Oss Note (589024)...........
    Manythanks
    Arun

    HI,
    In Inventory we have two quantity fields given to satisfy the requirement.
    Valuated stock Qty - 0VALSTCKQTY
    Storage Location qty - 0TOTALSTCK
    You can make use of them based on your requirement. Hope this helps for you.
    Thanks,
    Arun

  • Valuated Stocks at Storage location Level

    Hi Gurus,
    Our client wants to develop a report on Quantity and Value of the Stocks at Storage location level. Is there any standard table/T.code where we can see this? We have tried in the Standard reports too.
    We have tried this getting from various tables like MARA,MARC,MARD,s031 & S032. But it is hitting the performance heavily. Please advice if anything can be done on this.
    with regards,
    Saakithyan

    Refer this link
    http://wiki.sdn.sap.com/wiki/display/ERPSCM/StockTablesandStockTypes
    check reports: MC.9 ,S_p00_07000139 also if it fits

  • Stock at Storage Location

    Hello there,
      Could anyone tell me the possibility of populating stock at storage location. I am using 2lis_03_BF and 2lis_03_UM for populating the Material Movements cube in BW 3.5. When we checked the data all the values for materials are populated against Plant level and the quantities at Plant - Storage location level.
      I have implemented the SAP How to Document for populating the values at storage location level but I have two issues on this.
    1. The actual values of materials are not accurate when displayed at Plant-Storage location level. Because they are calculated using Average value formula as per the note. How to realize the actual values at storage location level also taking into consideration the respective revaluation done at plant level?
    2. If I run the report for all Plants - storage locations it is either timing out or taking a lot of time to display. We are maintaining 45 plants and 10 storage locations.
    Could anyone tell me how to realize these values at storage location in an efficient way if possible.
    Thanks in advance,
    Raj

    Hi Anil,
    Thanks for the reply. Yes I did implement that note to get the values at storage location level. The values I am getting are not accurate after following this note. Example It is displaying the value of the material equally for all storage location which are valuated at different prices. ( Taking average values).
    Also If the material was revaluated the price correction is created at plant level and it is not taking the correction into consideration for displaying the individual values i.e against respective storage location. But I am getting the total result at storage location accurately.
    Is it possible in BW to display the values at storage location accurately as in R/3.
    Thanks,
    Raj

  • Stock Statement

    Hi,
    As our customer requirement we need a report "Stock Statement" for given period (From date - To date) with the following columns
    Item
    Opening Stock Qty
    Opening stock Value
    Receipt Qty
    Receipt Value
    Issue (Consumption) Qty.
    Issue (Consumption) Value
    Closing stock qty
    Closing stock value.
    Expecting your valuable solutions and it would be rewarded fully.
    Thanks & Regards,
    Venkatesan G.

    Hi,
    I had this problem last week (to know the initial stock for a given item and a past date). The only way which I found to solve it ,was to recalculate the initial stock.
    To do it, I used two tables (OINM and OITW). Here is an excerpt of my query, which does only what you asked for:
    DECLARE @ItemCode varchar(15)
    DECLARE @StartDate smalldatetime
    SELECT @ItemCode = $[$38.1.0], @StartDate = $[$12.1.Date]
    -- Before inserting the misc. operations, we have first to recalculate the initial stock
    -- We have to do the following:
    -- - Add or deduce, from the actual stock, all the movements which are stored in the OINM table
    SELECT W0.ItemCode, @StartDate, W0.WhsCode, W0.OnHand - ISNULL (SUM (I0.InQty - I0.OutQty), 0), 0
    FROM OITW W0 LEFT OUTER JOIN OINM I0 ON W0.ItemCode = I0.ItemCode AND W0.WhsCode = I0.Warehouse
    WHERE I0.DocDuedate >= @StartDate
    GROUP BY W0.ItemCode, W0.WhsCode, W0.OnHand
    HAVING W0.ItemCode = @ItemCode AND W0.OnHand - ISNULL (SUM (I0.InQty - I0.OutQty), 0) >= 0
    UNION
    SELECT W0.ItemCode, @StartDate, W0.WhsCode, 0, -(W0.OnHand - ISNULL (SUM (I0.InQty - I0.OutQty), 0))
    FROM OITW W0 LEFT OUTER JOIN OINM I0 ON W0.ItemCode = I0.ItemCode AND W0.WhsCode = I0.Warehouse
    WHERE I0.DocDuedate >= @StartDate
    GROUP BY W0.ItemCode, W0.WhsCode, W0.OnHand
    HAVING W0.ItemCode = @ItemCode AND W0.OnHand - ISNULL (SUM (I0.InQty - I0.OutQty), 0) < 0
    Just don't forget to give correct values to the two variables, since in my case they were taken from the Invoice window.
    In my case, I was in need of this to show the evolution of an item's stock during time.
    Regards,
    Eric

  • Material wise Daily Stock Report

    Hi ABAP Guru's
    I got a requirement to develop an report which lists the stock(Opening Stock and Closing stock) for each material of a plant in given date range.whose Values to be matched with either MB5B or MC.9 Tcodes.I have found few tables for Stock like MBEW,MARD but those values are not matching with the Transactions.Can u tell me exactly how can i develop this report.? I'll be very thankful if u do the same.
    Thanks and Regards,
    Rahul.

    Hi
    In MC.9 it will show both stock quantity and value in storage locationwise.But from MBEW you will get it only in plantwise not in storage locationwise. In S032 you can see quantity field is always correct but value field will be wrong because it's not correctly updating there. To match with MC.9 what you have to do is you should calculate both quantity and value logically in the program. In detail you can get quantity and unit price from the MBEW table (Check unit price field i forgotten) and see the quantity in each storage location and then do a multiplication... Also check the movement type values are mathing or not all the time..U Can Use MB51 transaction for this purpose.....Also take values from table s032, and mard...
    Before doing "Stock Ledger Report" take care of so many things..From Mbew you are getting current stock quantity and value in "Plantwise". Give today's date in MC.9 or in MB5B or in MC50(check all plants cumulated checkbox), i am very sure this figure's will match...Now if you need to display only todays quantity and value you can direclt display this..But if you want a perfect stock ledger report this one will not work..I mean if u need the faculity like get the stock quantity and value of a material in the past date no table's will store this entry you have to apply logic.
                         The logic is you know today's stock quantity and value..Also you know all the Purchase and consumption happened in this period.(Bwart in mseg table)..Now do back-calculation until your date reaches..Be clear with the point, for eg: 01.01.2007's opening stock = 31.12.2006's closing stock. And Yesterdays closing stock = todays' stock + All the purchase - all the consumption..(Purchase and consumption you can calculate from bwart field..) ...Like this do back-calculation upto your selection-screen date....You can get it...Revert back if you are still not able to solve this, because i have done it previously...
    Reward All helpfull answers...

  • Tracking Daily Stock Qty. in Z Report

    Hi,
    I have a query.
    I want to track Daily Stock of a particular Material as on the posting date of that report i.e. date when i will run the report.
    Getting a period wise Report is not a problem, but getting it as on date is a problem.
    Need support for this.
    Thanks in advance,
    Harris P.

    Hi,
    Yes, i am aware of the values which i can get through MB5B.
    But it is confirmed that we are going ahead with a Z Report i.e. Daily Production Report in which i want Opg and Clsg Stock.
    Eg
    If i am running a Report as on today i.e. 17.07.09 then it should give Opg Stock as on Today 17.07, time 00:00 midnite i.e. Closing Stock as on 16.07 and also give Closing Stock as on 17.07, time 00:00 midnite.
    We are arriving at the Closing Stock as per this logic: *Opg Stk + Receipts - Issues = Closing Stock*
    Hence if we get the Opg Stock values, closing stock will not be a problem.
    Thanks for immediate response
    Harris
    Edited by: Harris Panchal on Jul 17, 2009 12:54 PM

  • What are the list of .stock by storage location

    hi, iwant to devlop the report to stock by storage location.give me description about a report to list of .stock by storage location. what are the functional spects for this report, what are the tables and fields we have to used for this report plz give me sample report.

    Dear Radha Krishna,
    You can either use program RMMMBESTN (from SE38) or TCode MMBE. However, you can copy the above program into a 'Z' program and change the logic if your requirement is not served by the standard report or you want to enhance the same.
    Go through standard Reports:
    MMBE Stock Overview
    MB52 List of Warehouse Stocks on Hand
    MB53 Display Plant Stock Availability
    MB54 Consignment Stocks
    MB5B Stocks for Posting Date
    MB5K Stock Consistency Check
    MB5L List of Stock Values: Balances
    MB5T Stock in transit CC
    MB5W List of Stock Values
    MBBS Display valuated special stock
    MBLB Stocks at Subcontractor
    MBSF Release Blocked Stock via Mat. Doc.
    MBW1 Special stocks via WWW
    MC.1 INVCO: Plant Anal. Selection: Stock
    MC.5 INVCO: SLoc Anal. Selection, Stock
    MC.9 INVCO: Material Anal.Selection,Stock
    MC.D INVCO: MRP Cntrllr.Anal.Sel. Stock
    MC.H INVCO: Business Area Anal.Sel. Stock
    MC.L INVCO: Mat.Group Analysis Sel. Stock
    MC.P INVCO: Division Analysis Sel. Stock
    MC.T INVCO: Mat.Type Anal.Selection Stock
    MC48 INVCO: Anal. of Current Stock Values
    MC49 INVCO: Mean Stock Values
    MC50 INVCO: Analysis of Dead Stock
    MC8M Read Opening Stocks
    MCB) INVCO: Long-Term Stock Selection
    MCC4 Set Up INVCO Info Structs.from Stock
    MCH: RIS: STRPS/Mvmts + Stock - Selection
    MCKJ Selection version tree: Stock
    MCKR User-spec. sel. vers. tree: Stock
    MCNB BW: Initialize Stock Balances
    MCSK Call Standard Analyses of Stocks
    MD04 Display Stock/Requirements Situation
    ME27 Create Stock Transport Order
    ME2O SC Stock Monitoring (Vendor)
    MF65 Stock Transfer for Reservation
    MI35 Batch Input: Post Zero Stock Balance
    MIQ1 Batch Input: PhInvDoc. Project Stock
    MM73 Special Stocks: Preparation
    MM74 Archive Special Stocks
    MM75 Display Archive of Special Stocks
    MMBE_OLD Stock Overview
    MMN1 Create Non-Stock Material &
    MS04 Planning Scenario: Stock/Reqmts List
    MS29 Calculate Sim. Initial Stock
    Tables:
    MKPF Header: Material Document
    MSEG Document Segment: Material
    IKPF Header: Physical Inventory Document
    ISEG Physical Inventory Document Items
    SBSE Stock Mngmt Levels for Inventory Sampling
    SKPF Header Data: Inventory Sampling
    SLGH Elements of Stock Population
    SSCH Strata of Inventory Sampling
    T156 Movement Type
    MSKA Sales Order Stock
    MSKAH Sales Order Stock: History
    MSKU Special Stocks with Customer
    MSKUH Special Stocks at Customer: History
    MSLB Special Stocks with Vendor
    MSLBH Special Stocks at Vendor: History
    MSPR Project Stock
    MSPRH Project Stock: History
    MSSAH Total Sales Order Stocks: History
    MSSL Total Special Stocks with Vendor
    MSSQ Project Stock Total
    MSSQH Total Project Stocks: History
    http://goldenink.com/abap/files_in_sap.html
    http://www.erpgenie.com/abap/tables.htm
    Regards,
    Naveen.

  • Daily Stock

    Hi,
       we need to deliver Stock report on daily wise , But the standard cube(0RT_C36) is on week , it has 0calweek .
    0calweek has refernce feild posting date
    Thanks for ur help in advance
    Regards
    Chakravarthy

    If you have posting date in your data source, just use posting date as a characteristic in your cube and map it from the posting date itself.
    You can display the daily stocks using posting date. Create a bex query on the info-cube and create a variable for posting date and make it user entry / default value and mandatory in the selection screen.
    Hope it helps.
    Thanks
    Soumya

  • Tables MARDH and MSEG - daily stock position

    Hi gurus of MM.
    I'm from BW and posted a thread about data from MM:
    Thread: 1876587
    As I understand, I can calculate the stock for a given date directly from tables MKPF (field BUDAT) and MSEG.
    MSEG has normal movement and also the initial stock value (posted as movement type: field BWART = 561), so this is possible.
    But I still didn't understand what's the logic to fill the different types of stock: fields LABST (unrestricted), UMLME (in transfer), INSME (quality inspection), EINME (restricted), SPEME (blocked) and RETME (returns).
    With MSEG I arrived to the total value.
    Which is coherent with the values that I found in MARD and MARDH  (the sum of these types of stock).
    What's the logic to distribute total value among these types of stock ???
    Thanks in advance.
    César Menezes

    Dear Amit
    I'm looking for technical information.
    But if you can also indicate some documents that explain the business rules I'd appreciate.
    The technical question is:
    Using tables MKPF and MSEG (basically fields BUDAT, MENGE and SHKZG) I can arrive to the values in tables MARD and MARDH.
    But until now I can arrive only to the totals of MARD and MARDH (the sum of fields LABST, UMLME, INSME, EINME, SPEME and RETME).
    The question is: what's the logic to arrive to each type of stock: LABST (unrestricted) and so on.
    I'm doing this because I need a daily stock position.
    MARD has a position at the moment, I can't use it to a report like: stock at day 10 plus movement of day 11 equal stock at day 11.
    MARDH has a montly, not a daily position.
    And I saw that I can arrive to daily stock position using only MKPF and MSEG.
    Thanks
    César Menezes

Maybe you are looking for

  • Music on iPad can't be deleted

    Hi. After disabling all Music Playlists in iTunes, I started a sync and expected the iPad to have 0 Songs. However there were still 7 songs on the iPad. I cannot delete them by right-left sweep, which usually shows the red Delete button. Also, Settin

  • How to create a Connection to UDB Database through OIM APIs.?

    Hi, In our OIM (9.1.0.2) implementation, there is a need to connect to a UDB database to execute some select queries and get the data. Is there any way in which I can do this? I tried creating an ITResource to have all static database related informa

  • Lightbox Widget - what am I doing wrong?

    Hello. I was wondering if someone could look at the code on my test page and tell me why the Lightbox widget works in Preview and not in the browser. I'm sure it's something very easy to fix but I've tried everything and have limited knowledge. Here

  • Art work for a whole play list

    Hi I have lots of songs in a play list i want to know how to assign an art work for all of them in one step instead of assigning image to each song one by one Kindest Regards

  • Hellp with new itunes download

    i just bought the new ipod nano today..and obv you have to download the new version of itunes, but whenever i click on the download now button it just brings me to a blank page..same thing with the quicktime. i downloaded the newest version of intern