ATP Check for Bill of materials in Variant configuration

Hello Guru's,
Will variant configuration supports the following functionality please?
ATP check for Bill of  materials in variant configuration is possible, is there any way to put labor cost while working on assembling variants. Material substitution is possible while configure a variant product.
Will any one share your experience that will be of great help.

solved by adding an additional condition in pricing procedure

Similar Messages

  • ATP check for multiple materials on multiple sales document

    Hi,
    System 4.70
    Is it possible to carry out an ATP check for multiple materials on multiple sales documents.
    I have written a bespoke program and the program requires an ATP check to be performed for each material and sales document, I am currently using BAPI_MATERIAL_AVAILABILITY which is bringing back the necessary information but it's a bit slow.
    Does any one have any ideas please.
    Regards
    J-J

    The ATP Check using the BAPI is done per material and plant. If you're looping through sales documents and then materials you're probably doing the ATP check for the same material over and over again.
    Just get the list of materials you need and the corresponding plants and call the BAPI for each of them.
    Also do a run-time analysis (tcode SE30) to check exactly what slows down your program.
    regards.

  • ATP check for component materials

    Hello experts,
    The ATP check was initially designed for a kitting process. BOM Material would be kitted in the distribution center(DC) and sent to a garage. Sales orders are created with BOM materials for a garage and there is a multi- level GATP process in place. Since BOM materials do not  exist at a garage the check would be performed at a DC for components after BOM explosion. The existing configurations in R3 and APO are for a make to order process(Strategy  group of 50 for BOM's  and 40 for component).
    We are now introducing new materials for an existing material and have the need for product substitution on the sales order, if the existing material is out of stock at the DC. To enable this functionality we are having to perform an ATP check for the sales orders at the distribution center, though the sales order is   created for a garage. To improve on the response times during the ATP check our design approach, is to convert the BOM materials in the sales order to component  materials with material determination(one BOM material is tied to one component material) and performing the ATP check with components at the DC.
    While testing we are facing the following issues:
    1)Sales order placed on a garage is substituted with the DC after product substitution.  This does not occur when product substitution is carried out with BOM's.
    2)During the order create, the ATP checks for check mode u201845u2019 and business event u2018AEu2019 for a given material in a DC shows zero stock. While for the same material,location and business event AE the product availability check in APO reflects stocks available.
    Is it feasible to do ATP checks for component material in a sales order which was initially designed to work with BOM materials? Am I missing some configuration settings in either APO or R3?
    Regards,
    Anil DeSouza

    Hi Anil,
         Yes it can be done.
    1) For finished product & garage combination -
    activate RBATP in the check instructions.
    2) in the location substitution maintain 'location determination sctivity'. Here you maintain different check mode & business event -- ( this is nothing but check instruction --- in thsi you maintain 'MATP').
    Hope this anws your first qus.
    To addressing your 2nd question....follow below steps.
    1) Do ATP from sales order, get onto results screen, click on product availability & check for 'scope of check' (check control) and look for the stock types that are included. Based on this your receipts are consdiered for ATP confirmation.
    Best Regards,
    Deepthi

  • ATP Check for Components for Variant Configuration

    Hi Gurus,
    Does it exist a way to perform the ATP Check for components (in variant configuration) like in a test?
    I mean, I know that when I create a SO (with the correct settings) the system will perform the ATP Check for components (Missing parts list). But is it possible to do this without trying to create the SO? Maybe a tcode as CU50 or PMEVC where I could enter the variant configuration values, then it explodes the BOM and do the ATP Check (as a simulation).
    Thanks in advance.
    Best regards.

    Hi Christopher,
    If you enable the "Component Availability" within your configuration profile (under Confign initial screen, Confign Parameters), then you will see an additional option within CU50 while configuring.  By pressing this button, you can see an availability check as of the date specified on the CU50 initial screen.  You can also modify the quantity on the CU50 initial screen for a more realistic simulation of a sales order (where a customer may order more than one of a product).  See screenshots below:
    In CU42:
    In Value Assignment of CU50:
    Hope this helps!

  • 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

  • ATP check for delivery in ECC & Sales order ATP check in APO

    Hi All,
    Can we do an ATP check for delivery in ECC , but for the same set of Materials- Plant combination , the ATP check when a SO is created should happen in APO .
    We do not want to remove the Business event 'B'  which is meant for delivery in  APO . For some materials we need APO ATP check to happen for delivery   & for some it should be in ECC  & for SO  the ATP check should happen in APO .
    Even if we do not have check instructions pertaining to Business event 'B' & a particular check mode (for the materials where the ATP check for delivery should happen in ECC & SO check to happen in APO)  , when we are doing an ATP check for delivery , it is still pointing to APO ATP check rather than ECC check .
    Any pointers for this is highly appreciated.
    Regards
    Surendra

    Hi Surendra,
    For SO, business event is A and for delivery it's B. When integrated with ECC, the check rule in ECC points as biz event in APO.
    You can control ATP check by customized settings for check rule in ECC.
    Also, by setting requirement class and requirement type in ECC, you control check mode in APO. So, even if you dont define for check mode in APO, the system might refer from ECC for the ATP check settings. Look into your ECC customization for how requirement class is derived and settings for requirement type. (based on MRP type, strategy grp and Item cat).
    I'm not sure how you can control ATP to happen for some sales orders/deleveries in ECC and for some in APO, since check mode is mentioned in material master.
    However, there are ATP BADIs (business add-ins) available in both ECC and APO, whch can serve your purpose.
    Regards,
    Bipin

  • User exit in ATP Check for sales Order to trigger notification

    Hi All
    please let me  know is there any user exit after ATP check or in ATP check for sales order to trigger a notication mail.
    Regards
    Kishore

    Hi,
    User Exits For Availability Check are given below:-
    The user exits named here are planned for projects that are to be carried out in agreement with SAP development as they may only be used in consultation with SAP.
    USEREXIT_PLANT_SELECTION in program RV03VFZZ is an exception to this rule (see below).
    User exits in program FV45VFZZ
    USEREXIT_ADD_FIELD_TO_HEADER
    USEREXIT_ADD_FIELD_TO_LINE
    User exits in program FV45VFZY
    USEREXIT_DELIVERY_GROUPS
    USEREXIT_MVERF_INIT
    USEREXIT_QUOTA_KEY_VALUE
    User exits in program RV03VFZZ
    USEREXIT_AVAILABILITY_IN
    USEREXIT_AVAILABILITY_OUT
    USEREXIT_DARA_REFRESH
    USEREXIT_PLANT_SELECTION
    This user exit is used to adjust the flow during plant transfer. A list of permitted plants, where this material is created, is determined and checked in the standard R/3 delivery. A dialog box appears where you can select the plants. The user exits allow you to modify the plant table so that plant selection takes place in advance for every flagged selection and a dialog box becomes unnecessary.
    regards
    Vivek.

  • ATP check for STOs

    Hi,
    Can ATP be set for intercompany STOs?
    If so , can anyone list it please.
    Regards
    Krishna

    Hi
    Yes we can setup ATP check for STO...
    actually ATP will be depends on the combination of the checking group and checking rule
    checking group :  is defined at material master sales/plant view in availability check field..
    Checking rule : In standard this will be assigned to application internally ex : sales order - A (sales order)
                           delivery - B (delivery)..
    In STO we need to define the checking rule for purchase order type and shipping plant combination...
    menu path :
    IMG -- MM -- Purchasing -- PO -- set up stock transport order -- assign delivery type and checking rule....
    hope it solves your probs
    Muthu

  • ATP Check for deliveries

    Hi Experts
    Can we perform check against deliveries in APO GATP?
    What are the prerequesites to perform ATP check against deliveries.
    In scope of check  we want to select production orders which are in released status.
    Please give your inputs.
    Regards

    Preetam,
    After creating the supporting configuration, APO ATP checking is thereafter 'turned on' by creating and activating an ATP integration model in the ERP.  Generally, it is done by material/plant combination.  Therefore, if you turn on ATP checking for Sales orders, you also turn it on for all other types of docs (including deliveries) for that particular material/plant combination.
    I hope you have thought out this whole process.  The main reason for using ATP checking in APO is that APO has a richer suite of ATP solutions.  If your business requirements are satisfied by the ATP checking in ERP, then it makes no sense to spend the money to implement ATP in APO. Your original issue had to do with making released production orders relevant for ATP for deliveries.  If this is the only new requirement, then this can easily be managed in ERP.  OVZ9>select your Availability check, with checking rule B (deliveries).  Under "incl production orders" select 'F'.  From a business perspective, this means that some of your deliveries will be created without stock on hand, and therefore will not be immediately shippable.  You need to make sure that this process change is integrated throughout your warehouses.
    And, to your final question.  If your delivery item category(s) are already relevant for ATP checking in ERP, they will also be relevant for ATP checking in APO.  Since deliveries do not use RBA, you do not have to worry about adding new ERP delivery item categories for the conversion to APO ATP checking.  Most commonly in APO, one uses only the 'product check' (similar to the standard ERP ATP check) for deliveries.
    Rgds,
    DB49

  • ATP check for batch managed products

    Hello All,
    I have a requirement for ATP check for batch managed products and would be glad if someone can help me on that.  One of the characteristics on my product is expiry date. Business wants to restricts confirming products which has an expiry date of less than 90 days for orders outside the country. How can we achieve that?

    Hello
    You can try with activating Shelf Life Expiration Date (SLED).
    For config, check SPRO - Logistice General - Batch master - SLED
    Then finally setup Customer Exit to calculate/check the SLED.
    Exit EXIT_SAPLMHD1_001 for enhancement SAPLMHD1.
    Further, you can refer following SDN thread for reference/understanding:
      - SLED by customer/ material
    Regards
    JP

  • Collective ATP check for production orders

    Hi Gurus,
    I tried the MDVP tcode, but I can only do the collective ATP check for planned orders. we wanted to do the collective check with production orders, can you tell me how I can do this?
    Thanks.

    I've posted this question but didn't get any response. Can some one please give me an idea how to do the collective ATP check for production orders.
    Thanks
    Vijaya

  • ATP check for CRM Orders using ECC is creating a replication problem

    Hi Guys,
    I have created an order in CRM and it replicated to ECC,however the issue is I'm unable to change the order any more in CRM, message "Document is being distributed". I'm getting this issue after activating ATP check for CRM -ATP check is working perfectly.
    Before this ATP check, the Order replication was working perfectly and i can do the changes to order in both systems.
    In advance many thanks for your your help.
    Thanks and Regards
    SRIM

    hI,
    Thanks for your response,
    There are no messages in the middleware (smq2 - q1), but this error only started occurring after I activated the ATP check.
    I have also checked the incompletion log at ECC - document is completed.
    Before this ATP check activation the order replication was working correct/y and i can do changes at both ECC and CRM. But now even if i change the order in ECC those changes are not getting replicated infact  queue is not getting generated.
    BDOC is showing sent to receivers (not all confirmed)  BUS_TRANS_MSG.
    Thanks and Regards
    srikanth

  • Object Type for Bill of Materials

    What is the object type for bill of materials?  I am trying to add the code that updates the finished good item sales weight according to the weight of the Bill of Materials. Only one item in the bill of materials actually contains weight information so there is no conflict regarding cross units of measure. So, the finished good will have the same weight as the raw materials.
    Here is what I have so far. Though I'm not sure what the Object Type is for Bill of Materials. I'm also unsure about some of my code - Please review my code as well.
    IF (@TRANSACTION_TYPE = 'A' OR @TRANSACTION_TYPE = 'U') AND @OBJECT_TYPE = '68'
    BEGIN
         UPDATE OITM SET
              SWeight1 = (SELECT SUM(dbo.OITM.BWeight1) AS Weight
                   FROM dbo.OITM INNER JOIN dbo.ITT1 ON dbo.OITM.ItemCode = dbo.ITT1.Code
                   GROUP BY dbo.ITT1.Father
                   HAVING (dbo.ITT1.Father = @LIST_OF_COLS_VAL_TAB_DEL)),
              SWght1Unit = (SELECT dbo.OITM.BWght1Unit
                   FROM dbo.OITM INNER JOIN dbo.ITT1 ON dbo.OITM.ItemCode = dbo.ITT1.Code
                   GROUP BY dbo.ITT1.Father, dbo.OITM.BWght1Unit
                   HAVING(dbo.ITT1.Father = @LIST_OF_COLS_VAL_TAB_DEL) AND (dbo.OITM.BWght1Unit IS NOT NULL))
         WHERE ItemCode = @LIST_OF_COLS_VAL_TAB_DEL
    END
    Thanks

    I found it. The object type is 66 Product Tree. It appears my code works as well - yeah!

  • ATP check for materials and ATP Confirmed Qty's

    Good morning,
    I have a question regarding the ATP.
    If I have a 100 of box a in stock and I have 2 Planned Orders for 75 (total req on box is 150).
    When I convert the first Planned Ord to a Prodution Ord, the ATP check will run and confirm that I have the 75 boxes required (as we want it), but if I then convert the second Planned Order I would expect the ATP to say that only 25 is available, but it is also telling me that the 75 boxes required are available.
    Can I set the ATP to confirm/allocate the first 75 boxes to the first Production Order and when the second order runs ATP to only commit to 25?
    Thanks in advance.
    ATP novice :o)

    Hi Guy Hall,
    Please check with, "include dependent reservation and production order" has been activated for  checking rule used for production order at "avilabilty checking scope"
    Regards
    Pradeep

  • ATP Check for service parts and procurement scenario

    Dear Experts,
    We're testing CRM service scenario, focusing on the ATP check.
    After running the avaiability check for the service parts in the service order,
    is it posssible to determine the scenario automatically as follows?
    - when the necessary parts items are not available
    -> "Procurement" scenario will be used.
    The corresponding documents such as PO, PR or Reservation will be generated in ERP according to the setting "Define Logistics Scenario for the Procurement of Materials and Services".
    - when the necessary parts items are available in stock
    -> "Material withdrawal" scenario will be used. The items will be withdrawn at the service confirmation.
    From our understanding, the determination of the above scenario is controlled by the item type(ex.SRVP),
    so we expect that the system sets the appropriate item type depending on whether the item is available or not.
    Is there any possible solution for this?(i.e.standard customizing, BAdI etc....)
    Any advice would be higly appreciated.
    Best regards,
    F.T.

    Hi F.T,
    I have worked in Service Order Management Scenario, but not integration of Service Orders for ATP Check. But I found this Presentation which I hope might be somewhat helpful regarding the feasibility of the Business Scenario. You can have look at  the same and will be able to decide if this is the correct way forward or not.
    [Presentation|http://www.google.co.in/#hl=en&biw=1366&bih=548&q=ATPCheckforservicepartsandprocurementscenarioinSAPCRM+++&aq=f&aqi=&aql=&oq=&gs_rfai=&fp=a254323013e5943b]
    Hope this will help.
    Thanks,
    Samantak.

Maybe you are looking for

  • Error in running a function to convert coordinates in degrees to decimal for EXCEL VBA

    For your information, I have 3 cross-posts regarding this question - and all I can said there is still no firm solution regarding this error. 1) http://stackoverflow.com/questions/27634586/error-in-running-a-function-to-convert-coordinates-in-degrees

  • -50 error message...what can i do?

    i am getting a message that "the i-tunes library file cannot be saved. an unknown error has occurred...-50"....what can i do?

  • Ipod does not recognize songs when unplugged from computer

    My iPod shows all of my library songs when it is connected to the computer, and I am certain the files are physically on the iPod, because it can play songs when connected to iTunes that have been deleted from my hard drive (and I can see the actual

  • Mac Pro won't sleep or shut down

    I have an early 2008 Mac Pro (2x2.8 GHz Quad-Core Intel Xeon) running latest software. It won't go to sleep. It looks like it does but it doesn't. I get a grey screen saying it had to restart because of a problem. I have to turn it off manually on th

  • Activate Facetime for ipad

    I can't activate my facetime on my ipad. They tell me "The user name or password for " my Apple ID" was incorrect. Try again." And it's the same for imessage. What can i do ? Thanks