UoM in  Bill of Materials Report.

Hi,
Is any body know how to add Inv, UoM in following report or
How to take Inv UoM in its PLD or any SQL Query for such type of report.
Production Reports -->Bill of Materials Report.
Regards,
Rajesh

Hi Rajesh,
You need to use/bring field invtryuom from table oitm.
Hope this helps..
BR
Samir Gandhi

Similar Messages

  • How to develop a new bill of materials report(BOM) in SBO?

    Dear all
    On sbo, there is a report of BOM in production, the BOM report can explore to Class1.Class2.. ClassN,, but the report is with fixed format, now I need add more columns into the report, how to do? if not, can I write and SQL script to get it again.
    thank you.

    Hello Barend,
    From your SQL trace, I got below sql script, those will generate many report, but in the Bill of materials report, there just is only one report,
    so, could you let me know how to merger those sql together to get a one on sql and generate one report, thanks.
    Alex
    SET TRANSACTION ISOLATION LEVEL READ COMMITTED
    go
    SELECT T0.Code, T1.ItemName, T0.TreeType, T0.Qauntity, T0.Qauntity, T1.LastPurCur, T1.ExitWH, T0.Qauntity, T0.Code, T0.PriceList FROM  [dbo].[OITT] T0 ,  [dbo].[OITM] T1  WHERE T1.ItemCode >= N'400 440L'  AND  T1.ItemCode <= N'400 440L'  AND  T0.Code = T1.ItemCode  AND  T1.Canceled <> N'Y'   ORDER BY T0.Code
    go
    SELECT T0.Code, T1.ItemName, T1.TreeType, T0.Quantity, T0.Price, T0.Currency, T0.Warehouse, T1.TreeQty, T0.Father, T0.PriceList FROM  [dbo].[ITT1] T0 ,  [dbo].[OITM] T1  WHERE T0.Code = T1.ItemCode  AND  T0.Father = N'400 440L'   ORDER BY T0.Father,T0.ChildNum
    go
    SELECT T0.Code, T1.ItemName, T1.TreeType, T0.Quantity, T0.Price, T0.Currency, T0.Warehouse, T1.TreeQty, T0.Father, T0.PriceList FROM  [dbo].[ITT1] T0 ,  [dbo].[OITM] T1  WHERE T0.Code = T1.ItemCode  AND  T0.Father = N'19-01220B-03-00'   ORDER BY T0.Father,T0.ChildNum
    go
    SELECT T0.Code, T1.ItemName, T1.TreeType, T0.Quantity, T0.Price, T0.Currency, T0.Warehouse, T1.TreeQty, T0.Father, T0.PriceList FROM  [dbo].[ITT1] T0 ,  [dbo].[OITM] T1  WHERE T0.Code = T1.ItemCode  AND  T0.Father = N'19-01220B-02-00'   ORDER BY T0.Father,T0.ChildNum
    go
    SELECT T0.Code, T1.ItemName, T1.TreeType, T0.Quantity, T0.Price, T0.Currency, T0.Warehouse, T1.TreeQty, T0.Father, T0.PriceList FROM  [dbo].[ITT1] T0 ,  [dbo].[OITM] T1  WHERE T0.Code = T1.ItemCode  AND  T0.Father = N'30-90000B-03-00'   ORDER BY T0.Father,T0.ChildNum
    go
    SELECT T0.Code, T1.ItemName, T1.TreeType, T0.Quantity, T0.Price, T0.Currency, T0.Warehouse, T1.TreeQty, T0.Father, T0.PriceList FROM  [dbo].[ITT1] T0 ,  [dbo].[OITM] T1  WHERE T0.Code = T1.ItemCode  AND  T0.Father = N'19-012205-02-00'   ORDER BY T0.Father,T0.ChildNum
    go
    SELECT T0.Code, T1.ItemName, T1.TreeType, T0.Quantity, T0.Price, T0.Currency, T0.Warehouse, T1.TreeQty, T0.Father, T0.PriceList FROM  [dbo].[ITT1] T0 ,  [dbo].[OITM] T1  WHERE T0.Code = T1.ItemCode  AND  T0.Father = N'19-012205-01-00'   ORDER BY T0.Father,T0.ChildNum
    go
    SELECT T0.Code, T1.ItemName, T1.TreeType, T0.Quantity, T0.Price, T0.Currency, T0.Warehouse, T1.TreeQty, T0.Father, T0.PriceList FROM  [dbo].[ITT1] T0 ,  [dbo].[OITM] T1  WHERE T0.Code = T1.ItemCode  AND  T0.Father = N'30-900005-02-00'   ORDER BY T0.Father,T0.ChildNum
    go
    SELECT T0.*  FROM [dbo].[CSHS] T0 WHERE T0.FormID = N'679'  AND  T0.Refresh = N'Y' 
    go
    SELECT T0.*  FROM [dbo].[CSHS] T0 WHERE T0.FormID = N'679' 
    go

  • Query to replicate the Bill of Materials Report

    I'm looking to recreate the Bill of Materials report as a query, mostly because i cannot add any new database fileds to the pld report.
    As i cannot amend/change the screen layout or PLD i would like to recreate the report as a  query but have struggled to get a query to show the expanded layers of the BoM as the report does.

    Following is one I wrote to find cost vs sell price & GP for Production BOM's.
    You may be able to modify it to include what you need?
    {SELECT T0.[Father],
    sum ( T2.[AvgPrice]* T0.[Quantity]) as [Cost],T3.[Price] AS [Sales Price], 
    (t3.Price - sum(T2.[AvgPrice] * T0.Quantity)) as [GP] ,
    (t3.Price - sum(T2.[AvgPrice] * T0.Quantity))/sum (case when isnull(T2.[AvgPrice],0)= 0 then 1 else isnull(T2.[AvgPrice],0) end * T0.[Quantity])*100 AS [GP%]
    FROM ITT1 T0  INNER JOIN OITT T1 ON T0.Father = T1.Code INNER JOIN OITM T2 ON T0.Code = T2.ItemCode INNER JOIN ITM1 T3 ON T1.Code = T3.ItemCode
    WHERE (T1.[TreeType] = 'P' or  T1.[TreeType] = 's') and  T3.[PriceList] = 1
    GROUP BY T0.[Father],T3.[Price]}

  • Program for Bills of Materials

    Hi all,
    Could you please tell me is there any program available in SAP for 'Bills of Materials'?
    Thanks.

    Dev,
    if u give ur  mail id i can farward some program to u
    u can check this program
    REPORT ZMM00120_AUDIT .
    CHANGE HISTORY                                                       *
    Date      Level  Description.                               Author   *
    03/02/05  46C    AUDIT REPORT FOR BOM COMPONENTS           EIFERTGE
    SYSTEM DETAILS                                                       *
    ABAP DETAILS                                                         *
      Title           : BOM COMPONENT AUDIT
    TABLES: MAST, STKO, STAS.
    DATA: BEGIN OF ZAUDIT OCCURS 0,
             MATNR LIKE MAST-MATNR,
             WERKS LIKE MAST-WERKS,
             STLNR LIKE MAST-STLNR,
             STLAL LIKE STKO-STLAL,
             ZZLIFNR LIKE STKO-ZZLIFNR,
             ZZSEASON LIKE STKO-ZZSEASON,
             ZZEKORG LIKE STKO-ZZEKORG,
             END OF ZAUDIT.
    DATA: Z_STLNR LIKE STKO-STLNR.
    *ALV GRID WORKING STORAGE                                   "GLE03/05
    TYPE-POOLS: SLIS.
    DATA:       ALV_FIELDCAT TYPE SLIS_T_FIELDCAT_ALV WITH HEADER LINE,
                ALV_LAYOUT   TYPE SLIS_LAYOUT_ALV,
                ALV_LAYOUT_L TYPE SLIS_LAYOUT_ALV,
                ALV_FIELDCAT_L TYPE SLIS_T_FIELDCAT_ALV WITH HEADER LINE,
                ALV_LAYOUT_B TYPE SLIS_LAYOUT_ALV,
                ALV_FIELDCAT_B TYPE SLIS_T_FIELDCAT_ALV WITH HEADER LINE,
                ALV_STATUS TYPE SLIS_FORMNAME VALUE 'XXXXXXX',
                ALV_USER_COMMAND TYPE SLIS_FORMNAME
                              VALUE 'USER_COMMAND_ALV',
                ALV_GRID_TITLE TYPE LVC_TITLE,
                ALV_GRID_SETTINGS TYPE LVC_S_GLAY,
                ALV_VARIANT TYPE DISVARIANT,
                CALL-REPID LIKE SY-REPID.
    Ereignisse                                                *
    DATA:      ET_EVENTS TYPE SLIS_T_EVENT,
               ET_EVENTS_REST TYPE SLIS_T_EVENT.
    DATA:      ET_EVENT_EXIT       TYPE   SLIS_T_EVENT_EXIT.
    DATA:      S_PRINT             TYPE   SLIS_PRINT_ALV.
    DATA: IT_LIST_COMMENTARY TYPE SLIS_T_LISTHEADER,
          C-TEXT(15) TYPE C,   " TYPE slis_entry,
          IT_LIST_COMMENTARY_LINE TYPE SLIS_LISTHEADER.
    DATA: KEYINFO  TYPE SLIS_KEYINFO_ALV.
    SELECT-OPTIONS: S_MATNR FOR MAST-MATNR,
                    S_WERKS FOR MAST-WERKS.
    Start of selection                                                   *
    START-OF-SELECTION.
    SELECT * INTO CORRESPONDING FIELDS OF TABLE ZAUDIT
      FROM STKO INNER JOIN MAST
        ON STKOSTLNR = MASTSTLNR
       WHERE MATNR IN S_MATNR
         AND WERKS IN S_WERKS
         AND MAST~STLAN =  'S'.
    LOOP AT ZAUDIT.
      SELECT SINGLE STLNR INTO Z_STLNR FROM STAS
        WHERE STLNR = ZAUDIT-STLNR
          AND STLAL = ZAUDIT-STLAL.
      IF SY-SUBRC = 0.
       DELETE ZAUDIT.
      ENDIF.
    ENDLOOP.
    End of Selection                                                     *
    END-OF-SELECTION.
    Ereignisse fühlen                                       *
      DATA:  ET_EVENTS_LINE TYPE SLIS_ALV_EVENT.
      CLEAR ET_EVENTS_LINE.
      ET_EVENTS_LINE-NAME = SLIS_EV_TOP_OF_PAGE.
      ET_EVENTS_LINE-FORM = 'EVENT_TOP_OF_LIST'.
      APPEND ET_EVENTS_LINE TO ET_EVENTS.
      CLEAR ET_EVENTS_LINE.
      ET_EVENTS_LINE-NAME = SLIS_EV_TOP_OF_LIST.
      ET_EVENTS_LINE-FORM = 'EVENT_TOP_OF_LIST'.
      APPEND ET_EVENTS_LINE TO ET_EVENTS.
      CLEAR ET_EVENTS_LINE.
      ET_EVENTS_LINE-NAME = slis_ev_after_line_output.
      ET_EVENTS_LINE-FORM = 'AFTER_LINE_OUTPUT'.
      APPEND ET_EVENTS_LINE TO ET_EVENTS.
    event exist                                           *
      DATA:      ET_EVENT_EXIT_LINE  TYPE   SLIS_EVENT_EXIT.
      IF 'A' = 'A'.
        CLEAR  ET_EVENT_EXIT_LINE.
        ET_EVENT_EXIT_LINE-UCOMM = '&IC'.
        ET_EVENT_EXIT_LINE-BEFORE = 'X'.
        APPEND  ET_EVENT_EXIT_LINE TO ET_EVENT_EXIT.
      ENDIF.
      IF NOT ZAUDIT[] IS INITIAL.
        PERFORM ALV_GRID_DISPLAY.
      ENDIF.
          FORM EVENT_TOP_OF_LIST                                        **
    FORM EVENT_TOP_OF_LIST.
      DATA: DUMMY.
      DATA: S-TIME(8) TYPE C,
           S-DATE(10) TYPE C,
            SEPARATOR(3) TYPE C VALUE SPACE.
    S_PRINT-NO_PRINT_LISTINFOS = 'X'.            "NO PRT TOTALS/SUBTOTALS
    S_PRINT-NO_PRINT_SELINFOS = 'X'.            "NO PRINT ???
      CLEAR IT_LIST_COMMENTARY_LINE.
      REFRESH IT_LIST_COMMENTARY.
      IT_LIST_COMMENTARY_LINE-TYP = 'H'.
      clear IT_LIST_COMMENTARY_LINE-INFO.
      WRITE  'W O L V E R I N E  W O R L D  W I D E , I N C.'  TO
         IT_LIST_COMMENTARY_LINE-INFO.
      APPEND IT_LIST_COMMENTARY_LINE TO IT_LIST_COMMENTARY.
      clear IT_LIST_COMMENTARY_LINE-INFO.
       IT_LIST_COMMENTARY_LINE-INFO = 'BOM Component Audit'.
       APPEND IT_LIST_COMMENTARY_LINE TO IT_LIST_COMMENTARY.
       clear IT_LIST_COMMENTARY_LINE-INFO.
      IT_LIST_COMMENTARY_LINE-TYP = 'A'.
      CONCATENATE 'EXECUTED BY:' SY-UNAME INTO
            IT_LIST_COMMENTARY_LINE-INFO SEPARATED BY ' '.
      APPEND IT_LIST_COMMENTARY_LINE TO IT_LIST_COMMENTARY.
      CLEAR  IT_LIST_COMMENTARY_LINE-INFO.
      WRITE SY-DATUM TO IT_LIST_COMMENTARY_LINE-INFO.
      WRITE SY-UZEIT TO S-TIME.
      CONCATENATE 'Date:' IT_LIST_COMMENTARY_LINE-INFO
                  'Time:' S-TIME
         INTO IT_LIST_COMMENTARY_LINE-INFO SEPARATED BY SEPARATOR.
      WRITE SY-PAGNO TO C-TEXT LEFT-JUSTIFIED NO-ZERO.
      CONCATENATE 'PAGE:' C-TEXT INTO C-TEXT SEPARATED BY ' '.
      IT_LIST_COMMENTARY_LINE-INFO+50 = C-TEXT.
      APPEND IT_LIST_COMMENTARY_LINE TO IT_LIST_COMMENTARY.
      CALL FUNCTION 'REUSE_ALV_COMMENTARY_WRITE'
           EXPORTING
                IT_LIST_COMMENTARY = IT_LIST_COMMENTARY
           EXCEPTIONS
                OTHERS             = 1.
    ENDFORM.
    *&      Form  ALV_GRID_DISPLAY
    FORM ALV_GRID_DISPLAY.
      CLEAR: S_PRINT, ALV_LAYOUT.
    s_print-print = 'X'.                "DIRECT TO PRINT NO DISPLAY
      CALL-REPID = SY-REPID.
    ALV_GRID_SETTINGS-NO_COLWOPT = 'X'.
      ALV_LAYOUT-colwidth_optimize = 'X'.        "MINIMIZE COL WIDTHS
      ALV_LAYOUT-ZEBRA = 'X'.                    "ZEBRA PRINT
      ALV_FIELDCAT-TABNAME = ZAUDIT.
      ALV_FIELDCAT-FIELDNAME = 'MATNR'.
      ALV_FIELDCAT-SELTEXT_L = 'Material'.
      APPEND ALV_FIELDCAT.
      CLEAR ALV_FIELDCAT.
      ALV_FIELDCAT-TABNAME = ZAUDIT.
      ALV_FIELDCAT-FIELDNAME = 'ZZLIFNR'.
      ALV_FIELDCAT-SELTEXT_L = ' Vendor#  '.
      ALV_FIELDCAT-JUST = 'R'.
    ALV_FIELDCAT-LZERO = 'X'.
      ALV_FIELDCAT-NO_ZERO = 'X'.
      APPEND ALV_FIELDCAT.
      CLEAR ALV_FIELDCAT.
      ALV_FIELDCAT-TABNAME = ZAUDIT.
      ALV_FIELDCAT-FIELDNAME = 'WERKS'.
      ALV_FIELDCAT-SELTEXT_S = 'Plant'.
      APPEND ALV_FIELDCAT.
      CLEAR ALV_FIELDCAT.
      ALV_FIELDCAT-TABNAME = ZAUDIT.
      ALV_FIELDCAT-FIELDNAME = 'ZZEKORG'.
      ALV_FIELDCAT-SELTEXT_S = 'Pur. Org'.
      APPEND ALV_FIELDCAT.
      CLEAR ALV_FIELDCAT.
      ALV_FIELDCAT-TABNAME = ZAUDIT.
      ALV_FIELDCAT-FIELDNAME = 'ZZSEASON'.
      ALV_FIELDCAT-SELTEXT_l = 'Season'.
      APPEND ALV_FIELDCAT.
      CLEAR ALV_FIELDCAT.
       PERFORM GET_ALV_VARIANT.
      CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
        EXPORTING
          I_CALLBACK_PROGRAM                = CALL-REPID
          I_CALLBACK_USER_COMMAND           = ALV_USER_COMMAND
        I_STRUCTURE_NAME                  = 'ZFOB_ALV'
          I_GRID_TITLE                      = ALV_GRID_TITLE
          I_GRID_SETTINGS                   = ALV_GRID_SETTINGS
          IS_LAYOUT                         =  ALV_LAYOUT
          IT_FIELDCAT                       =  ALV_FIELDCAT[]
          I_DEFAULT                         = 'X'
          I_SAVE                            = 'A'
          IS_VARIANT                        = ALV_VARIANT
          IT_EVENTS                         = ET_EVENTS
          IT_EVENT_EXIT                     = ET_EVENT_EXIT
          IS_PRINT                          = S_PRINT           "GLE02/05
        TABLES
          T_OUTTAB                          =  ZAUDIT
        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.
    ENDFORM.                    " ALV_GRID_DISPLAY
    *&      Form  GET_ALV_VARIANT
    FORM GET_ALV_VARIANT.
      ALV_VARIANT-REPORT = CALL-REPID.
      ALV_VARIANT-USERNAME = SY-UNAME.
      CALL FUNCTION 'REUSE_ALV_VARIANT_DEFAULT_GET'
           EXPORTING  "USER DEFINED VARIANT
                I_SAVE        = 'A'
           CHANGING
                CS_VARIANT    = ALV_VARIANT
           EXCEPTIONS
                WRONG_INPUT   = 1
                NOT_FOUND     = 2
                PROGRAM_ERROR = 3
                OTHERS        = 4.
      IF SY-SUBRC <> 0.    "GET DEFAULT VARIANT
        CLEAR ALV_VARIANT-USERNAME.
        CALL FUNCTION 'REUSE_ALV_VARIANT_DEFAULT_GET'
             EXPORTING
                  I_SAVE        = 'A'
             CHANGING
                  CS_VARIANT    = ALV_VARIANT
             EXCEPTIONS
                  WRONG_INPUT   = 1
                  NOT_FOUND     = 2
                  PROGRAM_ERROR = 3
                  OTHERS        = 4.
        IF SY-SUBRC <> 0.
          CLEAR ALV_VARIANT.
        ENDIF.
      ENDIF.
    ENDFORM.                    " GET_ALV_VARIANT
    *&      Form  USER_COMMAND_ALV
    FORM USER_COMMAND_ALV USING R_UCOMM LIKE SY-UCOMM
                                RS_SELFIELD TYPE SLIS_SELFIELD.
      RS_SELFIELD-REFRESH = 'X'.
      CASE R_UCOMM.
       WHEN 'PICK' OR '&IC1'.
         IF RS_SELFIELD-fieldNAME = 'BELNR'.
           SET PARAMETER ID 'GJR' FIELD ACCTDTLS-GJAHR.
           CALL TRANSACTION 'FB03' AND SKIP FIRST SCREEN.
         ENDIF.
        RS_SELFIELD-COL_STABLE = 'X'.     "SET CURSOR TO CURRENT POSTITION
         RS_SELFIELD-ROW_STABLE = 'X'.
         ALV_LAYOUT-INFO_FIELDNAME    = 'DISPLAY-COL'.
        WHEN '&RNT'.                       "Print
          CALL FUNCTION 'REUSE_ALV_BLOCK_LIST_DISPLAY'
               EXPORTING
                    IS_PRINT = S_PRINT.
      ENDCASE.
    ENDFORM.
    Regards,
    Naveen

  • Substitute Ingredient when out of stock  in Bill of Materials?

    Hi, Is there a way to have substitute items in a bill of materials? If an ingredient is out of stock could sap business one suggest an alternative ingredient when making a production order?
    Thank you.

    Hi Jose ..
    The issue is that alternative items functionality is not implemented in the Product Trees as if it is possible to use in sales documents (ctrl + tab)
    In this case, what you can do is check the stock and if one is not covered, the teacher would have to open the product and from there check your Alternative for manual update on the Product Trees
    Regards,

  • Transfer a UDF textfield from bill of materials to a PO via FMS

    Dear community,
    I really do need your help: for one of our costumers we created a UDF within the lines of the bill of materials in order to fill in some information concerning the components of the product (actually the lines are filled with production steps). When creating a production order we want to take that information as well into the PO.
    We installed 8.8 Pl 17  - there is already a comment field which is copied from The Bill of materials to the PO. unfortunately it can only be filled with a maximum  of 254 characters - not enough for my purpose...
    I already created a query and connected it to my datafields - it works pretty fine as long as We do not use the same item (production step) more than once within the bill of materials. As soon as I use it more often the query does not work as expected. the reason is properly that I am not able to use the line number of the component in my query...
    any ideas how I can upgrade my query? I will attach the written query within the next couple of days - unfortunately I do not have access to it at the moment.
    I really hope you can give me some advice - otherwise I get in trouble
    Thanks in advance and  have a great weekend,
    daniel
    Edited by: Daniel Ebi on Jan 14, 2011 7:17 PM

    Dear Daniel,
    You may try this FMS query:
    SELECT T0.U_UDF FROM ITT1 T0
    WHERE T0.Father = $[owor.itemcode\] and T0.code = $[wor1.itemcode\]
    If you have same itemcode more than one in a single BOM, change T0.code = $[wor1.itemcode\] to
    T0.Linenum=$[WOR1.LineNum\]
    This question belongs to the main form. It is nothing to do with add-on.
    Thanks,
    Gordon

  • Adding user defined field in print layout design of Bill of matrial Report

    I want to add "Drawing No" which is user defined field in Bill of Material report need immediate help .

    Hi,
    If you add the UDF in BOM-Title then the UDF will be in OITT table.
    If you add the UDF in BOM-Rows then the UDF will be in ITT1 table.
    You will find BOM-Title or BOM-Rows in Production Module (ie., in User Defined Fields --> Manage User Fields)
    In PLD, You can print the UDF if you search in the above said tables.
    Raja.S

  • Someone please help me Design the database of bill of materials

    I want to design the database of bill of materials which contain item and amount.
    So the amount of child will depend on amount of parent in term of ratio. For example
    A(1)               A(2)
    |         ---->     |
    B(2)               B(4)
    My problem is when i try to add the parent and child . Let A is the parent of B , If i try to add A to be the child of C
    I want B to come along with A as well. For example
    A                       C
    |     C  --->        |           For this I have to store the relation of all item in  my list to check that this item have a child or not if yes
    B                             A              The child must come along with its parent , What the Er-diagram
    should be for all of my requirement?
                                    |
                                    B

    >I want B to come along with A as well. For example
    You can do that, but that is not automatic. You need to do some programming.
    It is better to use hierarchyid representation of the tree over traditional FK referencing.
    Tree using hierarchyid example:
    http://www.sqlusa.com/bestpractices2008/orgchart/
    BOL: "Model Your Data Hierarchies With SQL Server 2008
    .....The manufacturing system behind automobiles; the organization of a country into states, counties, cities, and postal codes; the description of a home entertainment system—what do these things have in common? The simple answer is that each
    describes a hierarchy.
    SQL Server 2008 supports a new data type, HierarchyID, that helps solve some of the problems in modeling and querying hier­archical information. I will introduce you to this data type by discussing a pattern commonly used in manufacturing
    known as bill of materials (BOM), or bills. Starting with a brief discussion of BOMs, I will illustrate how this kind of data can be modeled. I will also present an implementation of this model in SQL Server 2005. Then I will show you how the HierarchyID data
    type can be used to implement the model in SQL Server 2008.
    Hierarchical Data
    Automobiles are amalgamations of many components, such as engines, drivetrains, electronics, and steering. In the United States, our geographic territories are divided into states and are then sub-divided into jurisdictions called counties.
    Counties are then further subdivided in different ways by different agencies. The United States Census Bureau, for example, composes them from Census Tract Areas. The U.S. Postal Service routes mail delivery by Zone Improvement Plan (ZIP) codes. Geographic
    information systems (GIS) may aggregate census tracts and ZIP codes together to provide users with a familiar spatial reference for an area.
    A recent trip to a local electronics store to evaluate a replacement home entertainment system pointed to a similar sort of hierarchical system—all the combinations of possible components and options left my head spinning! I wondered
    how such systems could be modeled and implemented in a database system.
    The relationship between an automobile and its engine represents a hierarchy: the automobile contains the engine. The relationship is the same for the drivetrain, the electronics, and the steering. The relationship is containment. A
    similar hierarchy can be observed in the relationship between the different groupings of geographic or census data.
    Hierarchies exist everywhere, yet implementing them in the context of a relational database frequently proves to be a challenge. A typical approach is to represent the hierarchy using a parent/child relationship with one or more tables.
    While this approach certainly works in many cases, it has a few shortcomings. Such solutions must carefully consider how the referential integrity will be maintained. And while querying the depth and breadth of such tables was considerably simplified in SQL
    Server 2005 with the introduction of recursive common table expressions, writing queries against these types of tables can still be problematic when joins against many tables are required.
    A Bill of Materials Problem
    A few years ago I was working on a system being developed by a manufacturing company to help their dealers specify the components needed to build center-pivot irrigation systems. The software produced a list of components needed to custom-build
    the desired pivot (the totality of a center-pivot irrigation system is simply referred to as a pivot within the industry). The required components were determined based on geography, soil type, and the intended crops planted in the areas to be covered as well
    as the hydrologic and structural considerations of the device itself.
    Underpinning the solution would be a SQL Server database. The purpose of the database was to store information about the components available to build the pivot. However, when we generated the specification for manufacturing, we needed
    to identify those components as BOMs.
    Some bills represented a collection of physical parts that would be assembled into a system component. For example, every pivot needed a pump to draw water from a well into the system. That pump might be electrically powered, meaning
    it needed a transformer and fuse box, too. Or the pump might be fuel powered, meaning it needed a tank, a fuel pump, and hoses to connect the pump to the tank. In either case, the required parts for the pump would be listed in a pump bill.
    The bill for a complete pivot would include a collection of other bills. For example, a standardized pivot might consist of a tree of bills for the pump, another tree of bills for the spans of pipe used to deliver water, and bills for any other equipment
    needed to build that pivot system."
    LINK: http://msdn.microsoft.com/en-us/magazine/cc794278.aspx
    Kalman Toth Database & OLAP Architect
    SELECT Query Video Tutorial 4 Hours
    New Book / Kindle: Exam 70-461 Bootcamp: Querying Microsoft SQL Server 2012

  • Someone please help me Design the database of bill of materials with 1 item can have mutiple parent

    I got this sample from  Uri
    Dimant (MCC, MVP) ,
    The problem is i want 1 item to have multiple parent  but this example don t   let 1  item to have multiple parents. this is not suit for my objective. 
    CREATE TABLE Employees
      empid   int         NOT NULL,
      mgrid   int         NULL,
      empname varchar(25) NOT NULL,
      salary  money       NOT NULL,
      CONSTRAINT PK_Employees PRIMARY KEY(empid),
      CONSTRAINT FK_Employees_mgrid_empid
        FOREIGN KEY(mgrid)
        REFERENCES Employees(empid)
    CREATE INDEX idx_nci_mgrid ON Employees(mgrid)
    SET NOCOUNT ON
    INSERT INTO Employees VALUES(1 , NULL, 'Nancy'   , $10000.00)
    INSERT INTO Employees VALUES(2 , 1   , 'Andrew'  , $5000.00)
    INSERT INTO Employees VALUES(3 , 1   , 'Janet'   , $5000.00)
    INSERT INTO Employees VALUES(4 , 1   , 'Margaret', $5000.00) 
    INSERT INTO Employees VALUES(5 , 2   , 'Steven'  , $2500.00)
    INSERT INTO Employees VALUES(6 , 2   , 'Michael' , $2500.00)
    INSERT INTO Employees VALUES(7 , 3   , 'Robert'  , $2500.00)
    INSERT INTO Employees VALUES(8 , 3   , 'Laura'   , $2500.00)
    INSERT INTO Employees VALUES(9 , 3   , 'Ann'     , $2500.00)
    INSERT INTO Employees VALUES(10, 4   , 'Ina'     , $2500.00)
    INSERT INTO Employees VALUES(11, 7   , 'David'   , $2000.00)
    INSERT INTO Employees VALUES(12, 7   , 'Ron'     , $2000.00)
    INSERT INTO Employees VALUES(13, 7   , 'Dan'     , $2000.00)
    INSERT INTO Employees VALUES(14, 11  , 'James'   , $1500.00)
    WITH EmpCTE(empid, empname, mgrid, lvl)
    AS
      -- Anchor Member (AM)
      SELECT empid, empname, mgrid, 0
      FROM Employees
      WHERE empid = 1
      UNION ALL
      -- Recursive Member (RM)
      SELECT E.empid, E.empname, E.mgrid, M.lvl+1
      FROM Employees AS E
        JOIN EmpCTE AS M
          ON E.mgrid = M.empid
    SELECT * FROM EmpCTE
    My object is
    I want to design the database of bill of materials which contain item and amount.
    So the amount of child will depend on amount of parent in term of ratio. For example
    A(1)               A(2)
    |         ---->     |
    B(2)               B(4)
    My problem is when i try to add the parent and child . Let A is the parent of B , If i try to add A to be the child of C
    I want B to come along with A as well. For example
    A                       C
    |     C  --->        |           For this I have to store the relation of all item in  my list to check that this item have a child or not if yes
    B                            
    A              The child must come along with its parent , What the Er-diagram should be for all of my requirement?
        |
        B
    Base on the example that Uri
    Dimant gave me ,  i have to stroe 1 item wtih multi parents for example if b is a child of a And b  have c as child , When i insert D as a parent of B   , c will automatic come along with B , But this not seem gonna work.
    item   Parent 
     A      NULL
    B         A
    C         B
    B         D
    Am i wrong to go this way  , any idea

    thanks Uri
    Dimant
    I am
    little confuse about how can i write
    hierarchy sql  from this relation  , Thanks
    so far i got 
    WITH EmpCTE(cid, cname, pid, lvl)
    AS
      SELECT      cid , cname ,  children.pid , 0
      FROM            children INNER JOIN
      parents ON children.pid = parents.pid
      where  cid = 1
      UNION ALL
      SELECT      E.cid , E.cname ,  E.pid , M.lvl+1
      FROM       ( select  cid , cname , children.pid FROM  children INNER JOIN
      parents ON children.pid = parents.pid) AS E JOIN EmpCTE AS M
          ON E.pid = M.cid
    SELECT * FROM EmpCTE  

  • What are the main tables for BOM (Bill of Materials)

    Hi Gurus,
    I need to know the tables involved in BOM (Bill of Materials) for Oracle EBS.
    Can anyone point out the list of related tables?
    Thanks

    Hi Sudipta,
    Following are the BOM main tables.
    bom_bill_of_materials
    bom_inventory_components
    bom_reference_designators
    bom_substitute_components
    mtl_item_revisions
    bom_operational_routings
    bom_operation_sequences
    bom_operation_resources
    BOM_BILL_OF_MTLS_INTERFACE
    BOM_INVENTORY_COMPS_INTERFACE
    BOM_REF_DESGS_INTERFACE
    BOM_SUB_COMPS_INTERFACE
    MTL_ITEM_REVISIONS_INTERFACE
    BOM_OP_ROUTINGS_INTERFACE
    BOM_OP_SEQUENCES_INTERFACE
    BOM_OP_RESOURCES_INTERFACE
    MTL_RTG_ITEM_REVS_INTERFACE
    =======================
    Following are all tables of BOM.
    BOM_ALTERNATE_DESIGNATORS
    BOM_ALTERNATE_DESIGNATORS_TL
    BOM_ATO_CONFIGS_TEMP
    BOM_ATO_CONFIGURATIONS
    BOM_BILLS_HEADER_TEMP
    BOM_BILL_OF_MATERIALS
    BOM_BILL_OF_MATERIALS_ARCHIVE
    BOM_BILL_OF_MATERIALS_TEMP
    BOM_BILL_OF_MTLS_INTERFACE
    BOM_BILL_REVISIONS_B
    BOM_BILL_REVISIONS_TL
    BOM_CALENDARS
    BOM_CALENDAR_DATES
    BOM_CALENDAR_EXCEPTIONS
    BOM_CALENDAR_SHIFTS
    BOM_CAL_WEEK_START_DATES
    BOM_CAL_YEAR_START_DATES
    BOM_CMP_USR_ATTR_INTERFACE
    BOM_COMPARISON_TEMP
    BOM_COMPONENTS_B
    BOM_COMPONENTS_EXT_B
    BOM_COMPONENTS_EXT_TL
    BOM_COMPONENT_COLUMNS
    BOM_COMPONENT_OPERATIONS
    BOM_COMPONENT_OPS_INTERFACE
    BOM_COMPONENT_TYPES
    BOM_COMP_OPTCLASS_TEMP
    BOM_COMP_OPTIONS_TEMP
    BOM_CONFIG_EXPLOSIONS
    BOM_COPY_ORGANIZATION_LIST
    BOM_COPY_STRUCTURE_ACTIONS
    BOM_COPY_STRUCTURE_REQUEST
    BOM_CTO_MLSUPPLY_MAIN_TEMP
    BOM_CTO_MODEL_ORGS
    BOM_CTO_ORDER_DEMAND
    BOM_CTO_ORDER_LINES
    BOM_CTO_ORDER_LINES_UPG
    BOM_CTO_OSS_COMPONENTS
    BOM_CTO_OSS_ORGS_LIST
    BOM_CTO_SRC_ORGS
    BOM_CTO_SRC_ORGS_B
    BOM_DELETE_ENTITIES
    BOM_DELETE_ERRORS
    BOM_DELETE_GROUPS
    BOM_DELETE_SQL_STATEMENTS
    BOM_DELETE_SUB_ENTITIES
    BOM_DEPARTMENTS
    BOM_DEPARTMENT_CLASSES
    BOM_DEPARTMENT_RESOURCES
    BOM_DEPENDENT_DESC_ELEMENTS
    BOM_DEPEND_DESC_ELEM_ARCHIVE
    BOM_DEPT_RES_INSTANCES
    BOM_EAM_DEPT_APPROVERS
    BOM_EXCEPTION_SETS
    BOM_EXCEPTION_SET_DATES
    BOM_EXCLUSION_RULE_ARCHIVE
    BOM_EXCLUSION_RULE_DEF
    BOM_EXPLOSIONS
    BOM_EXPLOSIONS_ALL
    BOM_EXPLOSION_TEMP
    BOM_FORM_QUERY
    BOM_IMPLOSION_TEMP
    BOM_INTERFACE_DELETE_GROUPS
    BOM_INVENTORY_COMPONENTS
    BOM_INVENTORY_COMPONENTS_TEMP
    BOM_INVENTORY_COMPS_ARCHIVE
    BOM_INVENTORY_COMPS_INTERFACE
    BOM_INV_COMPONENTS_TEMP
    BOM_ITEM_ATTACH_CATEGORY_ASSOC
    BOM_ITEM_BACKFLUSH_SUBINV
    BOM_LISTS
    BOM_LOW_LEVEL_CODES
    BOM_MIXED_MODEL_MAP_CELLS
    BOM_MIXED_MODEL_MAP_HEADER
    BOM_MIXED_MODEL_MAP_PROCESSES
    BOM_MIXED_MODEL_MAP_RES
    BOM_OPERATIONAL_ROUTINGS
    BOM_OPERATION_NETWORKS
    BOM_OPERATION_RESOURCES
    BOM_OPERATION_RESOURCES_EFC
    BOM_OPERATION_SEQUENCES
    BOM_OPERATION_SEQUENCES_TEMP
    BOM_OPERATION_SKILLS
    BOM_OP_NETWORKS_INTERFACE
    BOM_OP_RESOURCES_ARCHIVE
    BOM_OP_RESOURCES_INTERFACE
    BOM_OP_ROUTINGS_ARCHIVE
    BOM_OP_ROUTINGS_INTERFACE
    BOM_OP_SEQUENCES_ARCHIVE
    BOM_OP_SEQUENCES_INTERFACE
    BOM_PARAMETERS
    BOM_PERIOD_START_DATES
    BOM_REFERENCE_DESGS_ARCHIVE
    BOM_REFERENCE_DESIGNATORS
    BOM_REF_DESGS_INTERFACE
    BOM_RESOURCES
    BOM_RESOURCES_EFC
    BOM_RESOURCE_CHANGES
    BOM_RESOURCE_DOWNCODES
    BOM_RESOURCE_EMPLOYEES
    BOM_RESOURCE_EQUIPMENTS
    BOM_RESOURCE_FLEX_FENCES
    BOM_RESOURCE_SETUPS
    BOM_RESOURCE_SHIFTS
    BOM_RES_INSTANCE_CHANGES
    BOM_RTGHEADER_TEMP
    BOM_RTG_ITEM_REVISIONS_ARCHIVE
    BOM_RTG_NETWORK_TEMP
    BOM_RTG_OPERATION_TEMP
    BOM_RTG_OPER_RES_TEMP
    BOM_RTG_RESOURCE_TEMP
    BOM_RTG_SUB_RESOURCE_TEMP
    BOM_RULES_B
    BOM_SETUP_TRANSITIONS
    BOM_SETUP_TYPES
    BOM_SHIFT_DATES
    BOM_SHIFT_EXCEPTIONS
    BOM_SHIFT_TIMES
    BOM_SMALL_EXPL_TEMP
    BOM_SMALL_IMPL_TEMP
    BOM_STANDARD_OPERATIONS
    BOM_STD_OP_BONUS_CODES
    BOM_STD_OP_RESOURCES
    BOM_STD_OP_RESP_EXCLUSIONS
    BOM_STD_OP_SCRAP_CODES
    BOM_STD_SUB_OP_RESOURCES
    BOM_STRUCTURES_B
    BOM_STRUCTURES_EXT_B
    BOM_STRUCTURES_EXT_TL
    BOM_STRUCTURE_EXT_B
    BOM_STRUCTURE_REVISIONS_B
    BOM_STRUCTURE_REVISIONS_TL
    BOM_STRUCTURE_TYPES_B
    BOM_STRUCTURE_TYPES_TL
    BOM_SUBSTITUTE_COMPONENTS
    BOM_SUBSTITUTE_COMPS_ARCHIVE
    BOM_SUB_COMPS_INTERFACE
    BOM_SUB_OPERATION_RESOURCES
    BOM_SUB_OPERATION_RESOURCE_EFC
    BOM_SUB_OP_RESOURCES_INTERFACE
    BOM_WORKDAY_PATTERNS
    HTH
    Sanjay

  • New Plug-In for Acrobat: 3D Bill-of-Materials

    Hello everyone!
    We at vpr-solutions are thinking of developing an Adobe Acrobat Plug-In which allows users to create 3D-PDF Bill-Of-Materials with just a few mouse clicks.
    The outcome would be an interactive 3D-PDF, similar to this:
    http://vpr-solutions.de/images/stories/ om_sec.pdf
    Such BOMs could be created quickly and would require no scripting at all. All that the user will have to do is:
    1) Create a Layout: 3D-Annotation and text edit fields (for part meta-data display)
    2) Link 3D and edit fields using the plug-in
    Now the user will be able to select parts in 3D and fill in the edit fields. Whenever a part is selected in 3D, the specific part info will be displayed. All meta information will be gathered and saved inside the PDF. Additional functionality would be export and import of part meta-info als XML spreadsheets (MS Excel, OpenOffice).
    Please tell me what you think. I am thankfull for every single line.
    Best Regards,
    Helmut
    vpr-solutions.com

    Hello,
    Function creation of 3D-PDF Bill-Of-Materials is already available within APEX V9.
    Using A3D Reviewer you can:
    1/import CAD files
    2/create a Bill-Of-Materials
    (go to Tools/Bill of Material)
    Several options are available to the BOM creation option
    If you need more information feel free to contact me...
    3/Export to PDF using a provided template
    ie:
    C:\Program Files\Adobe\Acrobat 9.0\Acrobat\plug_ins3d\prc\ENU\a3drtemplate_03.pdf
    4/Open the PDf file within Acrobat 3D activate 3D
    As you could see the BOM is available into the 3DPDF document
    I Hope this can be helpful for you
    For further more information please feel to contact us
    Best regards
    William Gallego
    A3D QE Team

  • Price List Error in Bill of Materials in relation to SAP Note 1056208

    Hi Experts,
    I have uploaded the Bill of Materials --both the Header and Lines using DTW successfully but when I try to update the Product Price of the Parent manually in the Bill of Materials, this error occurs:
    "Variation between number of price lists and number of price lists for items"
    I have also tried running the script provided in SAP Note 1056208 to check if there are any inconsistencies in the Price List records but there is none.  The number of records in both tables are the same.
    We have 3 levels of Bill of Materials (FG, WIP1, WIP2).  I need to update the Product Price of WIP2 first so that its price will appear in the line items since it is a component of WIP1.
    I hope you could help me with my problem and I would appreciate your prompt replies.
    Thank you very much!

    Hi!
    In BOM u will find a Orange Color Drop Down Arrow @ Right-Bottom Corner. You have to click on that to generate Price for your Parent based on the Child.
    Select the Approp Price List in Header of BOM and in Row Level. Update prices for Child Items, now Follow the above step.

  • Function Module for retreiving delta bill of materials

    Hi Experts,
      Is there any function module in SAP for retreiving delta bill of materials,please
    repond quickly as it is most urgent to me.
    Regards,
    Sridevi.

    Hi
    Check the following BOM related fun modules
    APS_GET_BOM
    C1L1_BOMPOS_GET
    C1L1_BOM_DATA_GET_NO_DIALOG
    C1L6_BOMDATA_GET
    CA_GR_GET_BOM_APPLS_FOR_USAGE
    CASL_GET_BOM_EXPLOSION_DATE
    CAVC_C_GET_BOM_ITEM_DATA
    CAVC_I_GET_BOM_HEADER_DATA
    CAVC_I_GET_BOM_ITEM_DATA
    CAVC_I_GET_BOM_ITEM_DATA_LIST
    CEV8_GET_BOM_DATA
    CEV8_READ_MAT_AND_GET_BOM
    CE_BOM_GET_PARAMETER
    CK_F_BOM_ITEM_FROM_KALKTAB_GET
    CLEX_BOM_GET_STPO
    CO_OCM_FA_FROM_BOM_GET
    CO_DM_BOM_GET_DOC_LINKS
    CP_BD_GET_BOM_FOR_MATERIAL
    CP_BD_GET_STLKN_FOR_BOM
    CP_CA_GET_VARIANT_BOM_DATA
    C_PDM_BOM_GET_ITEM_STUFE_WEGXX
    C_PDM_GET_BOM_USAGES
    CS_BI_GET_BOM_FILE_REMOTE_HOST
    CS_CA_ORDER_BOM_STRUCTURE_GET
    CSDE_BOM_ALT_BY_ECN_GET
    CS_OV_BOM_GET_ACTUAL_MARKED
    CS_OV_BOM_GET_FIRST_MARKED
    CS_OV_BOM_GET_LAST_MARKED
    CS_OV_BOM_GET_NEXT_MARKED
    CS_OV_BOM_GET_PREV_MARKED
    CS_BOMHEADERS_GET_MAT
    CUBF_GET_BOM_ITEM_FOR_EXT_ID
    CUBX_GET_CUOBS_FOR_BOM_ITEMS
    CUCPOBOM_CHECK_ALLOWED_TARGET
    CUKO_BOM_EXPLOSION_GET_PARAMS
    CUKO_DDB_BOM_HEADER_GET
    CUKO_DDB_BOM_POSITION_GET
    FLT_EXT_GET_BOM_DATA
    ISM_MEDIAISSUE_BOM_ADMIX_GET
    K_ABC_GET_CONV_FACT_BOM
    K_ABC_GET_SPECIAL_FEAT_IN_BOM2
    MGV_BOM_GET_LIST
    OIJ_3WP_GET_BOM_EXPLOSION
    OIRC_GET_BOM_SOC
    OLR3_DMS_RFC_GET_PARENT_BOMS
    PLM_CONSTRUCT_TYPE_GET_MAT_BOM
    PLM_EQUIPMENT_GET_BOMS
    PLM_EQUIPMENT_GET_EQI_BOM
    PLM_FUNCLOCAT_GET_BOMS
    PLM_FUNCLOCAT_GET_FLC_BOM
    PMEVC_BOM_GET_SUBSCREEN
    PMEVC_GET_BOM_ITEMS
    STT_BOM_GETDETAIL
    STT_BOM_GETLIST
    Reward points if useful
    Regards
    Anji

  • Cant upgrade from 10.3.2 to 10.6.8 bill of materials needed

    error reads bill of materials needed? how do i fix or get .bom file?
    Thanks

    I should rephrase that, for those Macs that shipped new with 10.7 or later, the only way to get 10.6.8 or earlier running is through virtualization of the server operating system.   When I say "new" that means the way my tip 6841 identifies them.   
    MacBook Pro 9,x and higher
    Mac Pro EMC# 2629, and Mac Pro 6,x and later
    Mac Mini 5,x and later
    iMac 12,1 i3 (EMC 2496 on foot, MC978LL/A), iMac 13,1 and later
    MacBook Air 4,x and later
    All MacBooks (without Air or Pro designation) can at least use the system specific 10.6 installer disk that shipped with them if they are newer than 10.6's August 28, 2009 release.
    Anything older you should at least be able to get a system specific 10.6 installer if not the retail disk.
    The retail 10.6 disk that is available now works on pre-March 15, 2010 Macs.  To be more specific on those Macs, that means:
    iMac 11,1 and older
    Mac Mini 3,x and older
    MacBook 6,1 and older
    MacBook Pro 5,x and older
    MacPro 4,x and older
    MacBook Air 2,x and older
    can all use the current 10.6 retail available from the Apple Store.
    Macs that fall between those criteria must use the 10.6 installer that shipped with them to install 10.6.

  • XML Bill of Materials Tutorial

    Is this a tutorial or information that will teach me how to create a bill of materials PDF similar to Ruben Hugo's Adidas PDF shown in the 3D gallery?
    Regards,
    Bill

    Hi,
    We can create a BOM which the material has without MRP view.
    Can create a bom for production, design, Sales, Plant maintenance, Costing.
    Production: Normal bom for production.
    Design: Design department they will use it for new product development, can not use for production.
    Sales:  Sales dep derive the cost for NEW order, for that they will use. Can not use in production.
    Hope you understand little bit.
    If useful reward your points.
    Regard,
    Dharma

Maybe you are looking for

  • Not to be able to delete line items from sales orders

    I have to do something so as not to be able to delete the line items from a sales order if I have already received a down payment for this sales order

  • PO 'Complete' and 'Delete' buttons behaviorin SRM 5.0 , Extende classic

    My understanding of how these buttons work in SRM 5.0 ECS is as follows. If anybody has any input or want to correct me based on your experience of these buttons feel free to throw your input Delete button 1) Will be enabled when the PO is in 'Held'

  • How do I call two csv files into ews?

    I have to call two csv files into a script with ews: Param([string]$calInputFile = "C:\Algemene agenda\Data docenten.txt" ) Param([string]$calMailboxFile ="C:\Algemene agenda\Alle docenten.txt" # Load all Entries $calagenda = Import-Csv $calInputFile

  • Rules In Workflow

    Hi Experts, I am Facing a problem in creating rules on Basic of business Partner Address. I log a complaint of the business partner and the complaint shud go to that department's mail box who is handling the complaint of that area. Regards, Khurram S

  • Release 12 E-Business Tax Module

    Has anyone had any success with the R12 Tax module? Just curious to hear how it stacks up against Vertex or Taxware. Thks! JP