APO DP Proportional factors

Hi Gurus,
Am New to APO DP,Could any one Provide me Documentation with Screen Shots on:"APO DP Proportional factors" It will be helpful in my current project.
Currently am using below key figures please explore...
Key figures:
Forecast
promotion
History
Actual Forecast
Thanks
Ganesh

Hi Ganesh,
Please refer following thread -
APO DP proportional factor calculation
Also you can refer to following link where its explained indetail -
Generation of Proportional Factors - Master Data Setup - SAP Library
Hope it helps.
Regards,
Alok

Similar Messages

  • APO DP Proportional factors with LIKE profile settings

    Can someone explain how Proportional factors get generated when we setup a new product with LIKE profile settings?  We are getting forecast generated at lower levels such as customer characteristic at levels we would not anticipate, and we don't see any proportional factors generated.
    Example: we have Existing product A and new product B.  We setup the LIKE profile for Product B to replace product A.  At the product level the forecast is generated correctly.  Currently product A has customers 1, 2, 3, 4 where customer 3 has 80% of the volume and customer 4 has 15% and customers 1 & 2 have the remaining volume.  When the forecast is generated for product B customer 4 is getting 60%, customer 3 50% and 1 & 2 the remaining volume.  There are no proportional factors generated for this new product.  When I try to create proportional factors for the new product it says there is no historical shipments to use which would be correct.  How do I get the dis aggregation of customers under product B to use the proportions that were used for product A?

    Hi Ganesh,
    Please refer following thread -
    APO DP proportional factor calculation
    Also you can refer to following link where its explained indetail -
    Generation of Proportional Factors - Master Data Setup - SAP Library
    Hope it helps.
    Regards,
    Alok

  • Customizing Proportional Factors in APO DP

    How can I base my proportional factors APODPANT on a future mix of a Statistical Model.  For instance, a Stat Model is run to create a suggested forecast.  Then my users can go into another KF to type in their forecast at the Product Family level.  I want to use the Proportions of the individual products from the Stat model  projections to take their typed in Product Family forecast and disaggregate it down into the individual products in that family.  I see some options in the Planning Area for dissaggregations on KFs, but not sure which one to pick to base the proportions on future months. 
    Also, as a further exercise, they want me to disallow certain materials where they don't want their forecast to change in the disaggregation.  They will type in this forecast at the product level for a couple products only, but still want to put in a Product Family forecast and disaggregate to all other products proportionallly, but exclude these.
    Thanks for any suggestions.
    Andrea

    Andrea
    In Planning Area administration, Key Figure aggregation tab, for the user input Key Figure, specify the calculation type as 'P' and the disaggregation key figure as the Stat fcst.
    You dont need to use APODPDANT in this scenario. Generally, APODPDANT is used if you want to use historical proportions to disaggregate future periods. Another reason for using APODPANT is if you want users to manually edit Proportional factors in the Planning book. Neither of this appears applicable in your scenario.
    Refer to this link for information on fixing key figures (You can fix the value of a key figure in interactive demand planning so that the value does not change if you change other values of the key figure at other planning levels. The system saves information relevant for fixing at detail level.)
    http://help.sap.com/saphelp_scm50/helpdata/en/02/7650c7353611d398290000e8a49608/content.htm
    Rishi Menon

  • Incorrect data for proportional factor in query based on Planning Book

    hi,
    We have upgraded from APO 3.1 to SCM 5.0.
    Post upgrade, the proportional factor is being displayed incorrectly in the BEX query based on the Planning Book data if we run the query for multiple months.
    for eg,
    if, in the planning book, the proportional factor for months 10.2009 and 11.2009 are as follows :
    Brand  >> Month >> Proportional Factor
    B1 >> 10.2009 >> 70%
    B2 >> 10.2009 >> 30%
    B1 >> 11.2009 >> 80%
    B2 >> 11.2009 >> 20%
    When we execute the query for the above brands for months 10.2009 and 11.2009,
    then, at the total level, the % displayed is 100% and the data at brand level is halved.
    We do not have any exits or formulae operating at the key figure level in the query and hence are unable to figure out why this is happenning...
    Any clue on this ?
    regards,
    Anirudha

    Resolved.

  • Proportional Factors Detailed or Fixed

    I would appreciate any feedback although I may have answered my own question.  I am new to the organization and we just implemented APO for Demand Planning. 
    We have discoverd negative forecasts at the Product Customer level that are due to Credits which the APODPDANT (12 month history) is taking into account in terms of our proportions.  Our APODPDANT is set to detailed proportions which is causing the problem, but forecasting Net Shipments rather than Orders is also part of the problem. 
    With only two years history is it logical to set the APODPDANT to Detailed proportions.  
    Any help would be greatly appreciated. 
    Thanks.

    Hi Kevin,
                 Please check the aggregation and disaggregation data along with proportional factors. If any thing is mismatched in calculation type(S,P,N,I,D,E,F etc) it will cause the problem.
    Also check the time based disaggregation.
    Check your forecast profile for correct calculation(Adjust the alpha,gama factor accordingly). You can write the macro for forecast adjustment if you are not able to solve it by functionality. System can write the specified data and can correct the forecast..
    Please let me knoe is implementation going on or already implemented. Since problem is critics so I can assume only after getting the system details , Version details and project status(Impl. Support,Upgrade).
    Regards,
    Santosh

  • Error in Proportional Factor Calculation Program

    Hi ,
    I have developed an ABAP Program to calculate Proportional Factor(PF) as below.
    Generally,to calculate the PF for a period , we need to use transaction /sapapo/sdp94 to create a profile .After doing that , to calculate PF we need to go transaction /sapapo/mv8v .
    Now,the given program has three options :-
    1)Create : To create the selection-ID by taking ‘areabasepackRS’ as name of the selection-ID . Here we need to give the excel sheet that is used to load data into /sapapo/mc8v to calculate PF.
    2)Calculate PF : This option is used to calculate proportional factor.
       Now if we try to calculate PF ,I get an error message saying there are no
       plannable characteristic combinations .
    3) Delete : This option is used to delete the selection profile.
    I am getting an error in this program which I have explained with the document attached in this mail .
    Please could anyone help me out with this .
    The program is as below:-
    <b>report ZRSNORMS_PPF
           no standard page heading line-size 255.</b>
    *include bdcrecx1.
    INCLUDE ZAPO_DATA_DECLARATION_PPF.
    INCLUDE Z_APO_FORMS_PPF.
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_file1.
      CALL FUNCTION 'KD_GET_FILENAME_ON_F4'
       EXPORTING
         program_name        = syst-repid
      DYNPRO_NUMBER       = SYST-DYNNR
         field_name          = p_file1
      STATIC              = ' '
      MASK                = ' '
        CHANGING
          file_name           = p_file1
    EXCEPTIONS
      MASK_TOO_LONG       = 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.
    start-of-selection.
      PERFORM READ_DATA TABLES I_PROFILE
                               I_EXEL
                               IT_PROFILE_NAME
                        USING P_FILE1
                        CHANGING W_SUBRC.
      PERFORM SAVE_SELECTION TABLES I_EXEL
                                    IT_SAVE_SEL
                                    IT_PROFILE_NAME.
      IT_GRP-OBJNAM = 'ZRSBASPCK'.
      APPEND IT_GRP.
      LOOP AT IT_GRP INTO W_GROUP.
        APPEND W_GROUP TO IT_GROUP.
      ENDLOOP.
      G_PAREAID = 'ZRSPAHPC'.
      G_MVIEW = 'ZRSPAHPC'.
      G_COUNT = 0.
    IF CREATE = 'X'.
      LOOP AT IT_SAVE_SEL INTO W_SEL_SAVE.
        IF W_SEL_SAVE-IOBJNM = '9AVERSION' AND SY-TABIX > 1.
          G_COUNT = G_COUNT + 1.
          READ TABLE IT_PROFILE_NAME INDEX G_COUNT.
          G_NAME = IT_PROFILE_NAME-F_NAME.
          CALL FUNCTION '/SAPAPO/MCPSH_SELECTION_SAVE'
            EXPORTING
      IV_SELID                       =
      IV_FLG_USED_FOR                =
              IV_PAREAID                     = G_PAREAID
             IV_MVIEW                       =  G_MVIEW
             IV_SEL_DESCRIPTION             = G_NAME
             IT_SELECTION                   = IT_SEL_SAVE
      IT_OBJECTS                     =
             IT_SEL_GROUP                   = IT_GROUP
      IV_POPUP_SEL_DESCRIPTION       =
    IMPORTING
      EV_SELID                       =
      EV_SEL_DESCRIPTION             =
    EXCEPTIONS
      DUPLICATE_SELECTION            = 1
      MULTIPLE_SELECTION             = 2
      INCONSISTENT_DATABASE          = 3
      DUPLICATE_DESCRIPTION          = 4
      INVALID_DESCRIPTION            = 5
      NO_PERMISSION                  = 6
      SELID_INVALID                  = 7
      OTHERS                         = 8
          IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
          ENDIF.
          CLEAR IT_SEL_SAVE[].
          APPEND W_SEL_SAVE TO IT_SEL_SAVE.
        ELSEIF W_SEL_SAVE-IOBJNM = '9AVERSION' AND SY-TABIX = 1.
          APPEND W_SEL_SAVE TO IT_SEL_SAVE.
        ELSE.
          APPEND W_SEL_SAVE TO IT_SEL_SAVE.
        ENDIF.
      ENDLOOP.
      G_COUNT = G_COUNT + 1.
      READ TABLE IT_PROFILE_NAME INDEX G_COUNT.
      G_NAME = IT_PROFILE_NAME-F_NAME.
      CALL FUNCTION '/SAPAPO/MCPSH_SELECTION_SAVE'
        EXPORTING
      IV_SELID                       =
      IV_FLG_USED_FOR                =
          IV_PAREAID                     = G_PAREAID
         IV_MVIEW                       =  G_MVIEW
         IV_SEL_DESCRIPTION             = G_NAME
         IT_SELECTION                   = IT_SEL_SAVE
      IT_OBJECTS                     =
         IT_SEL_GROUP                   = IT_GROUP
      IV_POPUP_SEL_DESCRIPTION       =
    IMPORTING
      EV_SELID                       =
      EV_SEL_DESCRIPTION             =
    EXCEPTIONS
      DUPLICATE_SELECTION            = 1
      MULTIPLE_SELECTION             = 2
      INCONSISTENT_DATABASE          = 3
      DUPLICATE_DESCRIPTION          = 4
      INVALID_DESCRIPTION            = 5
      NO_PERMISSION                  = 6
      SELID_INVALID                  = 7
      OTHERS                         = 8
      IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
      ENDIF.
      IV_GROUP = 'ZRSBASPCK'.
      LOOP AT IT_SEL_SAVE INTO w_confirm_sel.
        APPEND w_confirm_sel TO it_confirm_sel.
      ENDLOOP.
      CALL FUNCTION '/SAPAPO/MSDP_SH_OBJ_LIST_BUILD'
        EXPORTING
          IV_PAREAID           = G_PAREAID
         IV_MVIEW             = G_MVIEW
        IV_DVIEW             =
        IV_FROMDATE          =
        IV_ENDDATE           =
        IV_NO_POPUPS         =
      IMPORTING
        ET_SH_OBJECTS        =
      EXCEPTIONS
        INVALID_INPUT        = 1
        INTERNAL_ERROR       = 2
        OTHERS               = 3
      IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
      ENDIF.
    CLEAR IT_SEL_SAVE[].
    ENDIF.
    if calc_ppf = 'X'.
      PERFORM CALC_PPF TABLES I_EXEL
                              BDCTAB
                              IT_PROFILE_NAME.
    ENDIF.
    if del_prof = 'X'.
    LOOP AT I_EXEL.
    concatenate i_exel-area I_EXEL-BASE INTO DEL_NAME.
    SELECT SINGLE * FROM /SAPAPO/TS_SELKO INTO IT_TS_SELKO
    WHERE SEL_DESRCIPTION = DEL_NAME.
    DEL_PROFILE = IT_TS_SELKO-SELECTIONID.
    CALL FUNCTION '/SAPAPO/MCPSH_SELECTION_DELETE'
      EXPORTING
        IV_SELID                    = DEL_PROFILE
      IV_FLG_CONFIRM_TRANS        = 'X'
    EXCEPTIONS
      NO_ENTRY                    = 1
      NO_AUTHORITY                = 2
      DELETION_NOT_POSSIBLE       = 3
      OTHERS                      = 4
    IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    ENDIF.
    ENDLOOP.
    ENDIF.
    <b>INCLUDE   ZAPO_DATA_DECLARATION_PPF .</b>
    types: t_ts_selpo type /sapapo/ts_selpo.
    TYPES: BEGIN OF T_EXEL,
           PROF_DATFRM TYPE DATS,
           PROF_DATTO TYPE DATS,
           FORCAST_FROM TYPE DATS,
           FORCAST_TO TYPE DATS,
           AREA(60),
           BASE(60),
           POPID(60),
           RATING(60),
           RS(60),
           END OF T_EXEL.
    types: begin of t_profile,
           obj(30),
           val(60),
           end of t_profile.
    TYPES: begin of t_profile_name,
           f_name(60),
           end of t_profile_name.
    DATA: G_COUNT TYPE I VALUE 0.
    *TYPES: T_SAVE_SEL LIKE IT_SELECTION.
    data: w_subrc TYPE sy-subrc,
          I_TS_SELPO TYPE Table of t_ts_selpo with header line,
          I_EXEL TYPE Table of t_EXEL with header line.
    DATA: IV_GROUP TYPE /SAPAPO/IOBJNM.
    DATA: IT_PROFILE_NAME TYPE TABLE OF T_PROFILE_NAME WITH HEADER LINE.
    data: i_profile type table of t_profile with header line.
    */sapapo/ts_iobj_selection_tab.
    data: IT_SEL_SAVE TYPE /sapapo/ts_iobj_selection_tab,
          w_SEL_SAVE type /SAPAPO/TS_IOBJ_SELECTION.
    DATA: IT_CONFIRM_SEL TYPE /SAPAPO/SH_SEL_RANGE_TAB,
          W_CONFIRM_SEL TYPE /SAPAPO/SH_SEL_RANGE_STR.
    TYPES: BEGIN OF T_SAVE_SEL,
           IOBJNM(30),
           SIGN,
           OPTION(2),
           LOW(60),
           HIGH(60),
           END OF T_SAVE_SEL.
    DATA: IT_SAVE_SEL TYPE TABLE OF T_SAVE_SEL WITH HEADER LINE.
    TYPES: BEGIN OF T_GRP,
          OBJNAM(30),
          END OF T_GRP.
    DATA: IT_GRP TYPE TABLE OF T_GRP WITH HEADER LINE.
    DATA DECLARATION FOR FUNC MODULE **************
    DATA: IT_GROUP TYPE /SAPAPO/TS_GROUP_BY_TAB,
          W_GROUP TYPE /SAPAPO/TS_GROUP_BY_STR.
    DATA: G_PAREAID TYPE /SAPAPO/TS_PAREAID,
          G_MVIEW TYPE /SAPAPO/PB_MVIEW,
          G_NAME TYPE /SAPAPO/TS_SEL_DESCR.
    BDC TABLES ***************************
    DATA: bdcdata LIKE bdcdata  OCCURS 0 WITH HEADER LINE.
    DATA: it_messtab LIKE bdcmsgcoll OCCURS 0 WITH HEADER LINE.
    DATA : BDCTAB like BDCDATA occurs 0 with header line.
    DATA : w_file type string.
    ****************BDC ERROR TAB ***************************
    DATA : xcount1 TYPE i,
           xstat TYPE i,
           xmsgv1 LIKE balm-msgv1,
           xmsgv2 LIKE balm-msgv2,
           xmsgv3 LIKE balm-msgv3,
           xmsgv4 LIKE balm-msgv4,
           xmessage(80) TYPE c.
    DATA : BEGIN OF t_errlog OCCURS 0,
            sno TYPE i,
            message(80) TYPE c,
            END OF t_errlog.
    DATA: DEL_PROFILE TYPE /SAPAPO/SELECTIONID2,
          DEL_NAME(60).
    ************DUPLICATE NAME TAB **************************
    DATA: IT_NOT_PROCESSED TYPE TABLE OF /SAPAPO/TS_SELPO WITH HEADER LINE.
    DELETE TAB *****************************
    DATA: IT_TS_SELKO TYPE TABLE OF /SAPAPO/TS_SELKO WITH HEADER LINE.
    SELECTION-SCREEN : BEGIN OF BLOCK b1.
    parameters: p_file1 TYPE rlgrap-filename.
    parameters: create type c radiobutton group g1,
                calc_ppf type c radiobutton group g1,
                del_prof type c radiobutton group g1.
    SELECTION-SCREEN END OF BLOCK b1.
    Include           Z_APO_FORMS_PPF
    *&  Include           Z_APO_FORMS_PPF
    *&      Form  READ_DATA
          text
         -->P_I_PROFILE  text
         -->P_I_EXEL  text
         -->P_IT_PROFILE_NAME  text
         -->P_P_FILE1  text
         <--P_W_SUBRC  text
    FORM READ_DATA  TABLES   P_I_PROFILE STRUCTURE I_PROFILE
                             P_I_EXEL STRUCTURE I_EXEL
                             P_IT_PROFILE_NAME STRUCTURE IT_PROFILE_NAME
                    USING    P_P_FILE1
                    CHANGING P_W_SUBRC.
    DATA : iexcel LIKE zexcel_read OCCURS 0 WITH HEADER LINE,
             G_DATE TYPE DATS.
    data: l_name(60).
      CLEAR  p_w_subrc.
      CALL FUNCTION 'ZALSM_EXCEL_TO_INTERNAL_TABLE'
        EXPORTING
          filename    = p_p_file1
          i_begin_col = 1
          i_begin_row = 1
          i_end_col   = 62
          i_end_row   = 50000
        TABLES
          intern      = iexcel.
       EXCEPTIONS
         inconsistent_parameters = 1
         upload_ole              = 2
         OTHERS                  = 3.
      IF sy-subrc <> 0.
        p_w_subrc = 0 .
    endif.
       MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
               WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
      LOOP AT iexcel WHERE row > 1.
        IF iexcel-col = '0001'.
        PERFORM CONVERT_DATE CHANGING G_DATE iexcel-value.
        p_i_EXEL-PROF_DATFRM = G_DATE.
        ENDIF.
        IF iexcel-col = '0002'.
        PERFORM CONVERT_DATE CHANGING G_DATE iexcel-value.
          p_i_EXEL-PROF_DATTO  = G_DATE.
           ENDIF.
        IF iexcel-col = '0003'.
        PERFORM CONVERT_DATE CHANGING G_DATE iexcel-value.
          p_i_EXEL-FORCAST_FROM = G_DATE.
        ENDIF.
        IF iexcel-col = '0004'.
        PERFORM CONVERT_DATE CHANGING G_DATE iexcel-value.
          p_i_EXEL-FORCAST_TO = G_DATE.
        ENDIF.
        IF iexcel-col = '0005'.
          p_i_EXEL-AREA = iexcel-value.
          p_i_profile-obj = 'ZRSAREA'.
          p_i_profile-VAL = iexcel-value.
          append p_i_PROFILE.
          clear p_i_PROFILE.
        ENDIF.
        IF iexcel-col = '0006'.
          p_i_EXEL-BASE = iexcel-value.
          p_i_profile-obj = 'ZRSBASPCK'.
          p_i_profile-VAL = iexcel-value.
             append p_i_PROFILE.
          clear p_i_PROFILE.
        ENDIF.
        IF iexcel-col = '0007'.
          p_i_EXEL-POPID = iexcel-value.
          p_i_profile-obj = 'ZRSPOPULN'.
          p_i_profile-VAL = iexcel-value.
             append p_i_PROFILE.
          clear p_i_PROFILE.
        ENDIF.
        IF iexcel-col = '0008'.
        p_i_EXEL-RATING = iexcel-value.
        ENDIF.
        IF iexcel-col = '0009'.
          p_i_EXEL-RS = iexcel-value.
          p_i_profile-obj = 'ZRSCUSTMR'.
          p_i_profile-VAL = iexcel-value.
          append p_i_PROFILE.
          clear p_i_PROFILE.
        ENDIF.
        at end of row.
          append p_i_EXEL.
          clear p_i_EXEL.
        endat.
      endloop.
    loop at P_I_EXEL.
    concatenate P_I_EXEL-AREA P_I_EXEL-BASE INTO L_NAME.
    P_it_profile_name-f_name = l_name.
    append P_it_profile_name.
    ENDLOOP.
    ENDFORM.                    " READ_DATA
    *&      Form  CONVERT_DATE
          text
         <--P_G_DATE  text
         <--P_IEXCEL_VALUE  text
    FORM CONVERT_DATE  CHANGING P_G_DATE
                                P_IEXCEL_VALUE.
                                CALL FUNCTION 'CONVERT_DATE_TO_INTERNAL'
      EXPORTING
        DATE_EXTERNAL                  = p_iexcel_value
      ACCEPT_INITIAL_DATE            =
    IMPORTING
       DATE_INTERNAL                  = p_g_date
    EXCEPTIONS
      DATE_EXTERNAL_IS_INVALID       = 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.                    " CONVERT_DATE
    *&      Form  SAVE_SELECTION
          text
         -->P_I_EXEL  text
         -->P_IT_SAVE_SEL  text
         -->P_IT_PROFILE_NAME  text
    FORM SAVE_SELECTION  TABLES   P_I_EXEL STRUCTURE I_EXEL
                                  P_IT_SAVE_SEL STRUCTURE IT_SAVE_SEL
                                  P_IT_PROFILE_NAME STRUCTURE IT_PROFILE_NAME.
    DATA: L_PAREAID(40).
    loop at p_i_exel.
    p_it_save_sel-iobjnm = '9AVERSION'.
    p_it_save_sel-SIGN = 'I'.
    p_it_save_sel-OPTION = 'EQ'.
    p_it_save_sel-LOW = '000'.
    APPEND P_IT_SAVE_SEL.
    CLEAR P_IT_SAVE_SEL.
    p_it_save_sel-iobjnm = 'ZRSAREA'.
    p_it_save_sel-SIGN = 'I'.
    p_it_save_sel-OPTION = 'EQ'.
    p_it_save_sel-LOW = P_I_EXEL-AREA.
    APPEND P_IT_SAVE_SEL.
    CLEAR P_IT_SAVE_SEL.
    IF NOT P_I_EXEL-BASE IS INITIAL.
    p_it_save_sel-iobjnm = 'ZRSBASPCK'.
    p_it_save_sel-SIGN = 'I'.
    p_it_save_sel-OPTION = 'EQ'.
    p_it_save_sel-LOW = P_I_EXEL-BASE.
    ENDIF.
    APPEND P_IT_SAVE_SEL.
    CLEAR P_IT_SAVE_SEL.
    IF NOT P_I_EXEL-POPID IS INITIAL.
    p_it_save_sel-iobjnm = 'ZRSPOPULN'.
    p_it_save_sel-SIGN = 'I'.
    p_it_save_sel-OPTION = 'EQ'.
    p_it_save_sel-LOW = P_I_EXEL-POPID.
    APPEND P_IT_SAVE_SEL.
    CLEAR P_IT_SAVE_SEL.
    ENDIF.
    IF NOT P_I_EXEL-RS IS INITIAL.
    p_it_save_sel-iobjnm = 'ZRSCUSTMR'.
    p_it_save_sel-SIGN = 'I'.
    p_it_save_sel-OPTION = 'EQ'.
    p_it_save_sel-LOW = P_I_EXEL-RS.
    APPEND P_IT_SAVE_SEL.
    CLEAR P_IT_SAVE_SEL.
    ENDIF.
    write 'hi'.
    *CLEAR P_IT_SAVE_SEL[].
    ENDLOOP.
    *submit
    ENDFORM.                    " SAVE_SELECTION
    *&      Form  CALC_PPF
          text
         -->P_I_EXEL  text
         -->P_BDCTAB  text
         -->P_IT_PROFILE_NAME  text
    FORM CALC_PPF  TABLES   P_I_EXEL STRUCTURE I_EXEL
                            P_BDCTAB STRUCTURE BDCTAB
                            P_IT_PROFILE_NAME STRUCTURE IT_PROFILE_NAME.
    DATA: PERIOD_FROM TYPE /SAPAPO/BASIS_VON_BIS,
          PERIOD_TO TYPE /SAPAPO/BASIS_VON_BIS,
          TRANSFER_FORM TYPE /SAPAPO/TARGET_VON_BIS,
          TRANSFER_TO TYPE /SAPAPO/TARGET_VON_BIS,
          SEL_PROFILE TYPE /SAPAPO/SEL_TXT.
    DATA: SEL_NAME(60).
    DATA : L_TEMP TYPE SY-DATUM,
           L_TEMP1 TYPE SY-DATUM,
           L_TEMP2 TYPE SY-DATUM,
           L_TEMP3 TYPE SY-DATUM.
    LOOP AT P_I_EXEL.
    L_TEMP0(2) = P_I_EXEL-FORCAST_FROM6(2). "passed date
    L_TEMP2(2) = P_I_EXEL-FORCAST_FROM4(2). "passed Month
    L_TEMP4(4) = P_I_EXEL-FORCAST_FROM0(4). "passed year
    L_TEMP10(2) = P_I_EXEL-FORCAST_TO6(2). "passed date
    L_TEMP12(2) = P_I_EXEL-FORCAST_TO4(2). "passed Month
    L_TEMP14(4) = P_I_EXEL-FORCAST_TO0(4). "passed year
    L_TEMP20(2) = P_I_EXEL-PROF_DATFRM6(2). "passed date
    L_TEMP22(2) = P_I_EXEL-PROF_DATFRM4(2). "passed Month
    L_TEMP24(4) = P_I_EXEL-PROF_DATFRM0(4). "passed year
    L_TEMP30(2) = P_I_EXEL-PROF_DATTO6(2). "passed date
    L_TEMP32(2) = P_I_EXEL-PROF_DATTO4(2). "passed Month
    L_TEMP34(4) = P_I_EXEL-PROF_DATTO0(4). "passed year
    PERIOD_FROM = L_TEMP2.
    PERIOD_TO = L_TEMP3.
    transfer_form = L_TEMP.
    TRANSFER_TO = L_TEMP1.
    concatenate P_I_EXEL-AREA P_I_EXEL-BASE INTO SEL_NAME.
    SEL_PROFILE = SEL_NAME.
    perform bdc_dynpro      using '/SAPAPO/RMDP_SHARE_VERSION_M' '1000'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'BPAREAID'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=ONLI'.
    perform bdc_field       using 'PAREAID'
                                  'ZRSPAHPC'.
    perform bdc_field       using 'FLG_AREA'
                                  'X'.
    perform bdc_field       using 'BPAREAID'
                                  'ZRSPAHPC'.
    perform bdc_dynpro      using '/SAPAPO/RMDP_SHARE_MANAGER' '1000'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=UCOMM1'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'Z_DATE-HIGH'.
    perform bdc_field       using 'B_VER'
                                  '000'.
    perform bdc_field       using 'B_KENN'
                                  '9AVCORHIST'.
    perform bdc_field       using 'B_DATE-LOW'
                                  PERIOD_FROM.
    perform bdc_field       using 'B_DATE-HIGH'
                                  PERIOD_TO.
    perform bdc_field       using 'VERSION'
                                  '000'.
    perform bdc_field       using 'Z_DATE-LOW'
                                  transfer_form.
    perform bdc_field       using 'Z_DATE-HIGH'
                                  TRANSFER_TO.
    perform bdc_field       using 'FLG_ONE'
                                  'X'.
    perform bdc_dynpro      using '/SAPAPO/RMDP_SHARE_MANAGER' '1000'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=ONLI'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'SEL_TXT'.
    perform bdc_field       using 'SEL_TXT'
                                   SEL_PROFILE.
    perform bdc_dynpro      using '/SAPAPO/RMDP_SHARE_MANAGER' '1000'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/EE'.
    perform bdc_dynpro      using '/SAPAPO/RMDP_SHARE_VERSION_M' '1000'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '=ONLI'.
    perform bdc_field       using 'BDC_OKCODE'
                                  '/EE'.
    perform bdc_field       using 'BDC_CURSOR'
                                  'PAREAID'.
    *perform bdc_transaction using '/SAPAPO/MC8V'.
    SELECT SINGLE * FROM /SAPAPO/TS_SELKO INTO IT_TS_SELKO
    WHERE SEL_DESRCIPTION = sel_NAME.
    if sy-subrc = 0.
    call transaction '/SAPAPO/MC8V'
             using bdctab
             mode 'A'
             update 'L'
             messages into it_messtab.
    describe table  it_messtab lines xcount1.
    read table it_messtab index xcount1.
    LOOP AT it_messtab WHERE msgtyp = 'E'
                                     OR msgtyp = 'A'.
                MOVE It_messtab-msgv1 TO xmsgv1.
                MOVE It_messtab-msgv2 TO xmsgv2.
                MOVE It_messtab-msgv3 TO xmsgv3.
                MOVE It_messtab-msgv4 TO xmsgv4.
          CALL FUNCTION 'MESSAGE_PREPARE'
            EXPORTING
             LANGUAGE                     = sy-langu
              msg_id                       = It_messtab-msgid
              msg_no                       = It_messtab-msgnr
             MSG_VAR1                     = xmsgv1
             MSG_VAR2                     = xmsgv2
             MSG_VAR3                     = xmsgv3
             MSG_VAR4                     = xmsgv4
           IMPORTING
             MSG_TEXT                     = xmessage
           EXCEPTIONS
             FUNCTION_NOT_COMPLETED       = 1
             MESSAGE_NOT_FOUND            = 2
             OTHERS                       = 3
          IF sy-subrc <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
          ENDIF.
          MOVE sy-tabix TO t_errlog-sno.
          MOVE xmessage TO t_errlog-message.
                APPEND t_errlog.
                CLEAR t_errlog..
              ENDLOOP.
    CLEAR BDCTAB[].
    CLEAR SEL_NAME.
    CLEAR P_I_EXEL.
    endif.
    ENDLOOP.
    ENDFORM.                    " CALC_PPF
    *&      Form  bdc_dynpro
          text
         -->P_0424   text
         -->P_0425   text
    FORM bdc_dynpro  USING PROGRAM DYNPRO.
    CLEAR bdcTAB.
      bdcTAB-program  = program.
      bdcTAB-dynpro   = dynpro.
      bdcTAB-dynbegin = 'X'.
      APPEND bdcTAB.
    ENDFORM.                    " bdc_dynpro
    *&      Form  bdc_field
          text
         -->P_0494   text
         -->P_TRANSFER_FROM  text
    FORM bdc_field  USING FNAM FVAL.
      CLEAR bdcTAB.
      bdcTAB-fnam = fnam.
      bdcTAB-fval = fval.
      APPEND bdcTAB.
    ENDFORM.                    " bdc_field

    Hi,
    As I have not been able to attach the document, I will explain  the problem in full as below:-
    Business scenario - Consider a factory having 5 different customers (which is known as Customer_rs). We need to supply stock to each of them based on their past consumption. So to forecast this, we calculate a factor known as proportional factor based on the data we have for previous months.
    So to calculate the PF for a period, we need to create a profile in /sapapo/sdp94 .
    After creating the profile, the profile can be seen by clicking on SPD94 and going to selection-screen button .
    Then to calculate PF , we need to go to transaction /sapapo/mv8v .
    Here we will have to give the selection id that was saved in SDP94.
    All this process has to be automated and a program has been created to do this.
    A description of how the program works  is as given below.
    When we try to calculate the proportional factor with this program , the following error is obtained :-
    ‘There are no plannable characteristic combinations.’
    We are passing the same parameters that were passed by the SDP94 transaction to the standard function module for saving the selection ids. This is shown in the below screenshots.
    In spite of this we are getting the error.
    Now to delete the selection ids,click on delete option in the program .
    But the problem is even if we click on delete , the PPF data will be stored in the database inspite of deleting the selection profiles .
    Please can anyone help me out with  this .
    Regards,
    Sushanth H.S.
                                                                                    Now we will have to give the selection description
    Now the profile can be seen by going to SDP94 and clicking on selection profile button.
    Now to calculate PF, go to transaction /sapapo/mv8v
    Click on execute and give following inputs
    This will forecast the PF for the period 01.09.2007 to 21.02.2007 based on data from 21.04.2007 to 20.05.2007
    Click on other settings
    Here we will have to give the selection id that was saved in SDP94.
    Click on execute.
    All this process has to be automated and a program was created to do this.
    A description of how the program is given below.
    Program zrsnorms_ppf
    Execute.
    Give file path of excel sheet.
    Execute.
    This will create the selection id by taking “ areabasepackRS” as name of id.
    This is the excel sheet that is used to load data into /sapapo/mc8v to calculate the PF.
    Upon executing, the ids have been created
    The new selection ids can be seen by going to /sapapo/sdp94
    And clicking on selection profile.
    Parameters passed to standard function module in order to save the selection id.
    Now if we try to calculate PF using the program, the following happens
    When executed,
    BDC is called to input data to transaction /sapapo/mc8v to calculate ppf.
    An error screen is generated with the message ‘There are no plannable characteristic combinations.’
    We are passing the same parameters that were passed by the SDP94 transaction to the standard function module for saving the selection ids. This is shown in the below screenshots.
    In spite of this we are getting the error.
    When IV_POPUP_SEL_DESCRIPTION is passed, a popup will be displayed where the selection description will have to be entered. I am passing the same selection description here as is picked by the program.( H3HPCDEL00110096, H3HPCDEL00110063)
    To avoid this, we need to go to SDP94 and after going to selection window, we need to save the selections as shown in the following screenshots.
    Select the selection id one by one.
    Click on save selection
    Click on save.
    Do the same for all ids created by the program.
    Now if we try to calculate the PF using the program, it is seen to work
    So what needs to be done is that we need to avoid going to SDP94 in order to save the selections after the ids are created by the program.
    How the Program works
    Se38
    Program zrsnorms_ppf
    Execute.
    Give file path of excel sheet.
    Execute.
    This will create the selection id by taking “ areabasepackRS” as name of id.
    The new selection ids can be seen by going to /sapapo/sdp94
    And clicking on selection profile.
    Now the selection has to be saved. For that, follow the following procedure.
    Click on selection window.
    Click on load selection.
    Select the ids.
    Select and then press “save”.
    Do the same for every id.
    Only then can proportional factor be calculated.
    Now go to program and select Calc_ppf, with filepath to excel sheet as the sel_ids will be pulled from the excel.
    When executed,
    BDC is called to input data to transaction /sapapo/mc8v to calculate ppf.
    Now go to sdp94 and load the selection
    Click on load data.
    And make sure, data view is TDP_VIEW_PROP as shown
    PPF will be shown for the period chosen in the excel sheet.
    Now to delete the selection ids.
    Go to the program and give file path of the excel sheet and execute.
    The selection profiles will be deleted as shown.
    But PPF data will be stored in the database inspite of deleting the selection profiles. And ppf can be shown by selecting the basepack and the sales area.
    Click load data.
    Business scenario - Consider a factory having 5 different customers (which is known as Customer_rs). We need to supply stock to each of them based on their past consumption. So to forecast this, we calculate a factor known as proportional factor based on the data we have for previous months.
    So to calculate the PF for a period, we need to create a profile in /sapapo/sdp94
    How it is done in standard transaction /SAPAPO/SDP94
    Important pushbuttons and their functions
    Click on selection window.
    Give the selections
    Click on save selection
    A break-point has been set in the standard program to show what all parameters are being passed to the standard function module /SAPAPO/MCPSH_SELECTION_SAVE used to save the selection
    Now we will have to give the selection description
    Now the profile can be seen by going to SDP94 and clicking on selection profile button.
    Now to calculate PF, go to transaction /sapapo/mv8v
    Click on execute and give following inputs
    This will forecast the PF for the period 01.09.2007 to 21.02.2007 based on data from 21.04.2007 to 20.05.2007
    Click on other settings
    Here we will have to give the selection id that was saved in SDP94.
    Click on execute.
    All this process has to be automated and a program was created to do this.
    A description of how the program is given below.
    Program zrsnorms_ppf
    Execute.
    Give file path of excel sheet.
    Execute.
    This will create the selection id by taking “ areabasepackRS” as name of id.
    This is the excel sheet that is used to load data into /sapapo/mc8v to calculate the PF.
    Upon executing, the ids have been created
    The new selection ids can be seen by going to /sapapo/sdp94
    And clicking on selection profile.
    Parameters passed to standard function module in order to save the selection id.
    Now if we try to calculate PF using the program, the following happens
    When executed,
    BDC is called to input data to transaction /sapapo/mc8v to calculate ppf.
    An error screen is generated with the message ‘There are no plannable characteristic combinations.’
    We are passing the same parameters that were passed by the SDP94 transaction to the standard function module for saving the selection ids. This is shown in the below screenshots.
    In spite of this we are getting the error.
    When IV_POPUP_SEL_DESCRIPTION is passed, a popup will be displayed where the selection description will have to be entered. I am passing the same selection description here as is picked by the program.( H3HPCDEL00110096, H3HPCDEL00110063)
    To avoid this, we need to go to SDP94 and after going to selection window, we need to save the selections as shown in the following screenshots.
    Select the selection id one by one.
    Click on save selection
    Click on save.
    Do the same for all ids created by the program.
    Now if we try to calculate the PF using the program, it is seen to work
    So what needs to be done is that we need to avoid going to SDP94 in order to save the selections after the ids are created by the program.
    How the Program works
    Se38
    Program zrsnorms_ppf
    Execute.
    Give file path of excel sheet.
    Execute.
    This will create the selection id by taking “ areabasepackRS” as name of id.
    The new selection ids can be seen by going to /sapapo/sdp94
    And clicking on selection profile.
    Now the selection has to be saved. For that, follow the following procedure.
    Click on selection window.
    Click on load selection.
    Select the ids.
    Select and then press “save”.
    Do the same for every id.
    Only then can proportional factor be calculated.
    Now go to program and select Calc_ppf, with filepath to excel sheet as the sel_ids will be pulled from the excel.
    When executed,
    BDC is called to input data to transaction /sapapo/mc8v to calculate ppf.
    Now go to sdp94 and load the selection
    Click on load data.
    And make sure, data view is TDP_VIEW_PROP as shown
    PPF will be shown for the period chosen in the excel sheet.
    Now to delete the selection ids.
    Go to the program and give file path of the excel sheet and execute.
    The selection profiles will be deleted as shown.
    But PPF data will be stored in the database inspite of deleting the selection profiles. And ppf can be shown by selecting the basepack and the sales area.
    Click load data.

  • How to maintain Proportional Factors in SNP (not in DP)

    Hi Gurus!
    I want to maintain proportional Factors in SNP but could not know how to do. I read saphelp and know that we have to set up as following Steps:
    -In Planning Area:
             1.Set the Keyfigure calculation type For Key Figure KF1 to P or I
             2.Set disaggregation key figure for KF1 to u201CAPODPDANTu201D
    -When creating Planning Book/Dataview:
            3.Check u201CManual Proportion Maintenaceu201D
             4.Create a new Dataview that contain only KF APODPDANT
    But I find that we can do step 3 only when we create Planning book with Planning Area that based on Planning Object Structure of Demand Planning Only (like 9ADPBAS).
    With the Planning Area that based on Planning Object structure of SNP (like 9ASNPBAS), when creating planning book I could not check u201CManual Proportion Maintenanceu201D although I did the set up steps 1 and 2.
    The question are:
                     1.     Can we maintain Proportional Factors in SNP? If yes, How to do?
                     2.     Can we create a new KF and consider it as Proportional Factor (as KF APODPDANT)? Is there any propblem?
    Thanks very much for your help.

    Hi Mr. M Manimaran
    This is my reason:
    We have:
    - one DC
    - and some locations those receive money from that DC.
    The storage capacity of each Location is different from others and has different limit. Each location also need a number of money that is differrent from other.
    There is one thing to take notice here: Money is a special good. Letu2019s say location L1 needs 1 million usd, DC can give them in some ways. For example:
    -     First choice: 100usd: 90 %; 10usd: 10% ( so percentage of each denomination here is proportional factor)
    -     Second choice: 100usd: 10%; 10usd: 90%
    So quantity of notes of money of first choice is less than the second one although the total value of two choices are the same. So the Location L1 can store money with first choice. With the second choice, it could not store.
    Here, we want to calculate and store Proportional Factor in SNP so that we can run SNP Optimizer or Heuristic inorder to enable the DC to supply money  to satisfy the requirement of Location regarding locationu2019s storage capacity.
    Please so me the way!
    Thanks very much!
    Edited by: xuanduyen on Aug 12, 2011 9:41 AM

  • DP Proportional Factors error

    Hi,
    In DP, when i specified the Disaggregation KF for the proportional distribution based on KF. the system disaggregating equally for every member? what could be the reason?
    in another, the disaggregated values in the future differ from each other, but the values should be the same and should not be dependent on the period? can you pls help.
    Thanks,
    Regards,
    Dhanush

    As I understood from your requirement that you need a disaggregation of KF1 based on the proportions of other key figures KF2 .
    Please check following settings in Planning Area maintenance..
    1.For Key figure-KF1 you have maintained the u2018Calculation typeu2019 as P i.e. Based on Different Key Figure .
    2.On this screen for key figure KF1 in the field u2018Disaggregation key figureu2019  the key figure(KF2) on which disaggregation is based.
    3.Whereas if you want the disaggregation based on some constant proportional factors, then with Calculation type 'P'  choose the key figure APODPDANT in the field Disaggregation key figure. 
    Regards,
    Digambar

  • Copying proportional factors

    Hi All,
    Can anyone pls help me with this qn?
    Qn> Is there a way to copy the  calculated proportional factors from one planning version to another. For example,
    i am copying the  planning data (DP) from active version to simulation version and viceversa. I tried using RTS copy and version copy option and found its not possible.Your help is appreciated.
    Kind Regards,
    SSP

    Hi Ken,
    Thanks for your answer. It was helpful.
    Kind Regards,
    SSP
    Edited by: ssp_sap on Nov 17, 2009 10:08 AM

  • Flexible Planning -Proportional Factors MC8U

    Hi,
    How does the system calculate the portional factors via MC8U transaction code, when ever i change change the plan with some quantity , save it & execute MC8U  there is change in the propotional factors in MC63 , but i am not able to realate this values(calculation)
    How does the system calculate proportional factors??
    Regards
    Praveen

    Hi There,
    Here is how the system calculates the Proportional factors using MC8U:
    1. You load historical data into the Version (normally 000, to start off)
    2. This historical data is best loaded at the most detailed level on your planning hierarchy. It depends on how you capture & update transactional data (at what levels)
    3. With consistent planning, system automatically aggregates the loaded data to the higher levels (by summing the member data to owner data) & calculates the numbers. This takes place until it reaches the top most level
    4. From there, the MC8U transaction then reads top-down the relations between the owner & the member levels (by virtue of the numbers calculated) & establishes the proportions.
    5. Once you open MC63, you see weird 6 decimal proportion figures
    Cheers
    Anand

  • Proportional factors

    Hi Experts
    forecast model at product family level in APO DP.
    Quantity balance of history data between #A and #B was almost 50%:50%, but STAT is 0%:100%...
    by automatically batch job run.
    confusing symptom is when i run STAT by manually, the STAT is 50%:50%.
    could any one can advice to me why?

    Hi,
    You might have this done already, please check aggregation levels in the DP background job .
    Many a time aggregation levels are a cause.
    Please also check that the selection profiles do not have exclusions in the object selections( I mean , it is better to include a range or objects but not the exclusion of values).
    If the same forecast profile is used and aggregation levels are same with the same selection objects, forecasts results should be same.
    Regards
    Datta

  • DP  Proportional factors total value.

    Hello,
    In DP i want know how it calculates the Proportional value?
    Example :I have given Key Figure History as Basis for Proportional calculation with period 01092008 to 31122008
    In Calcu prop for i have given period 01092009 to 31122009.
    I have one material and two location say X and Y.
    When i execute i get total value for each period is 10,000 at material level and at location level it splits properly that sum of both location is 10,000 but if change the history data sum at Material level always shows 10,000.
    whether this 10,000 value is fixed some where?
    I am know how proportional value at location is calculated i want know whether this 10,000 value is fixed some where?
    Kindly let me know?
    Thanks,
    Nikhil

    Hi Nikhil,
    10000 is indeed the default value.
    If this value is too small for you (if you have some rounding issue) can increase it.
    Have a look at note 425741.
    I hope it helps
    Julien

  • Updating of data in APO DP - what is 'best practice'?

    I am using APO DP V5.
    I am using XI as an integration broker to receive data from external sources which is to be loaded into APO DP.
    There are of course different ways of doing this, for example:
    1. From XI, pass an XML message which then loads a delta queue in APO BW, loads an InfoCube, which is then used to load data into an APO planning area
    2. From XI, pass the data into BAPI parameters, which are then used to directly update data in an APO planning area via a BAPI call (eg BAPI PlanningBookAPS)
    What is the recommended 'best practice' here?
    Thanks,
    Bob Austin

    Hi Bob,
    I do not have experience in SCM 5.0 and XI but shall give my views from general experience.
    What kind of data you are loading in APO DP is the driver for the two ways mentioned by you.
    Traditionally (older versions of SCM/APO and non XI interface) Sales History is captured into an Infocube and then loaded to DP Planning Area. The reason - you normally use this Infocube for generation of CVCs which is the Master Data in APO DP. Moreover you will use this data to generate Proportional Factors for disaggregation of Statistically generated Forecast at aggregate level to the lowest level. So there is a requirement for loading Historical data from external systems to APO DP via an Infocube.
    The other kind of data would be market and sales forecast. This is a timeseries data which need to be directly loaded to the Planning Area for immediate Interactive Planning. In that case rather than putting it in an Infocube and then periodically loading the data from the Infocube to the Planning Area, its better to load the data directly in the Planning Area. There the BAPI will be a good option.
    Hope this gives some ideas to your query.
    Thanks,
    Somnath

  • Abaper role on APO

    Hi Experts
    Iam working as senior abap consultant. iam new to APO ,could please tell me what is the role of abaper in APO in development perspective ?
    please send me any devloped or sample objects on APO ( which involves abap devlopment).
    mailid: [email protected]
    your favour will be highly appriciated.
    thanks in advance
    regards
    sri

    Dear Sri,
    You would need to upload master and transaction data. BW skills would also be advantageous as it would deal with data extraction using administrative workbench.
    APO Technical:
    https://www.sdn.sap.com/irj/sdn/wiki?path=/display/scm/apo-technical&
    FMs available:
    BAPI_POSRVAPS_SAVEMULTI3 - Delivery - ATP Category BR in APO DRP
    BAPI_PBSRVAPS_DETAIL2 - Planning Book data - Input Parameters Planningbook, Data_view, Planning_Version, Period_Type Values (as in the domain /SAPAPO/CPDS_PERIOD_TYPE e.g. 'B' Week 'C' Month), Date_From and Date_To (format e.g. ww.yyyy)
    /SAPAPO/EFPL_ORD_NET_GET - Pegging relationship - For pegging relationship across the entire strucuture
    EXIT_/SAPAPO/SAPMMCP6_005 ZXDMUSERU05 - User exit - macro Add code in ZXDMUSERU05
    /SAPAPO/RRP_LC_PEGID_GET_IO - MRP Data from Live Cache - to get the data from live cache. Pass the pegid to the export parameter 'it_pegarea'. Determine pegid by using the function module '/SAPAPO/DM_MATERIAL_GET_PEGID'
    /SAPAPO/OM_PEG_CAT_GET_ORDERS - To get data from LC at matches the PEGID (= plant, material, storage location) and ATP-category - You will just have to specify the ATP-categories that match the MRP elements you would like to retrieve - LC doesn't store the names of the MRP elements
    /SAPAPO/OM_ORDER_GET_DATA - Order details from liveCache - To retrieve all information of an order from LC that corresponds to an order id. You just have to use the field IS_GEN_PARAMS-SIMVERSION = '000' and fill the table IT_ORDER with your order id. If you only want to have the OUTPUT_FIXED indicator it would be faster if you use the FM I suggested and then only request ET_ORDKEY as an output table - this table contains the OUTPUT_FIXED indicator
    /SAPAPO/DM_ORDKEY_SELECT_ORDNO GUID - of Order from liveCache - Need to provide Order No. and SIMID
    /SAPAPO/RRP_HEURISTIC_GET_DATA - Heuristic details - EXPORTING iv_heur_id = heur_id iv_langu = sy-langu IMPORTING ev_heur_text = lv_heur_text EXCEPTIONS
    heur_id_not_valid = 1 package_id_not_valid = 2 OTHERS = 3.
    BAPI_PBSRVAPS_CHANGEKEYFIGVAL - To load a KF of planning book
    BAPI_STSRVAPS_SAVEMULTI2 - To create stocks in SNP - Parameter for Version
    /SAPAPO/RRP_LC_PEGID_GET_IO - Sales Order Fetch in APO - quantitiy, GUID and Pegging Area id but the sales order number
    BAPI /SAPAPO/RRP_IO_COL - Additional Columns in Product View - RRP_USEX_COLS_GET_TEXT_01 method APPEND 'column1' to CT_COLS_TEXT.
    APPEND 'Column2' to CT_COLS_TEXT
    /SAPAPO/TS_DM_LOCK - User Change/Display Mode in Interactive Planning - Pass Values for GUI Id of Planning Area, Data Selection, Group By parameter
    /SAPAPO/ADV_ALERT_SET - Generate Alert
    /SAPAPO/MSDP_NOTE_WRITE - Write notes in SDP
    Reports:
    /SAPAPO/OM_DELETE_INCON_ORDERS - Delete inconsistent orders - Need to provide Order GUID
    Useful TCodes:
    /INCMD/UI Maintenance of Interchageable groups
    /SAPAPO/86000118
    /SAPAPO/AC03 Product Availability
    /SAPAPO/AC04 ATP Simulation
    /SAPAPO/AC05 Time Series
    /SAPAPO/AC06 Temporary Quantity Assignments
    /SAPAPO/AC07 Exclusive Lock Records
    /SAPAPO/AC08 Generate Safety Stock Requirement
    /SAPAPO/AC42 Display Product Allocation Situation
    /SAPAPO/ADVM Macro Workbench
    /SAPAPO/AHTS1 Start-up of Action Handler
    /SAPAPO/AMON1 Alert Monitor
    /SAPAPO/AMONMSG Settings 'Automatic Sending'
    /SAPAPO/AMONMSG_SEND Sending Alerts
    /SAPAPO/AMON_REORG Delete Database Alerts
    /SAPAPO/AMON_SETTING Alert Monitor Settings
    /SAPAPO/ATP2PPDS ATP -> PP/DS Conv. in Background
    /SAPAPO/ATPC00 Global Settings
    /SAPAPO/ATPC01 ATP Group
    /SAPAPO/ATPC02 Business Event
    /SAPAPO/ATPC03 Maintain Categories
    /SAPAPO/ATPC04_05 Maintain ATP Check Control
    /SAPAPO/ATPC06 Maintain Check Mode
    /SAPAPO/ATPC07 Maintain Check Mode
    /SAPAPO/ATPC08 Maintain Requirements Profile
    /SAPAPO/ATPCH01 Maintain ATP Characteristic View
    /SAPAPO/ATPCLOG_DEL ATP: Delete C Log Files
    /SAPAPO/ATPCQ_AREA Maintain Plng Area Assignments
    /SAPAPO/ATPCQ_CHECK Check Prod. Allocations Customizing
    /SAPAPO/ATPCQ_CUBE Maintain InfoCube Assignment
    /SAPAPO/ATPCQ_GENER Generate Objects
    /SAPAPO/ATPCQ_GRP Maintain Product Allocation Group
    /SAPAPO/ATPCQ_LST Maintain Seq. of Prod. Alloc.Proced.
    /SAPAPO/ATPCQ_OBJ Maintain Product Allocations Object
    /SAPAPO/ATPCQ_PRO Maintain Product Alloc. Procedure
    /SAPAPO/ATPCQ_RESET Reset Time Stamp
    /SAPAPO/ATPCQ_TSTMP APO: Generation Status, Transfer
    /SAPAPO/ATPLOG Activate ATP Application Log
    /SAPAPO/ATPLOG_DEL ATP: Delete Application Log
    /SAPAPO/ATPLOG_DSP ATP: Display Application Log
    /SAPAPO/ATPQ_ALERT APO: Product Allocations, Shortage
    /SAPAPO/ATPQ_CHKCHAR Check Characteristics Combinations
    /SAPAPO/ATPQ_CHKCUST Product Alloc. Assgmt, Sales Order
    /SAPAPO/ATPQ_CHKUSG Check Product Allocation Assignment
    /SAPAPO/ATPQ_COLLECT Generate Coll. Prod. Alloc. Charact.
    /SAPAPO/ATPQ_KCGRP_U Product Allocations: Update Assgmt
    /SAPAPO/ATPQ_PAREA_C Copy Characteristics Combinations
    /SAPAPO/ATPQ_PAREA_K Copy Characteristics Combination
    /SAPAPO/ATPQ_PAREA_R Product Allocations from Plan. Area
    /SAPAPO/ATPQ_PAREA_W Product Allocations in Plan. Area
    /SAPAPO/ATPTUBE_DISP Display Parameter Buffers
    /SAPAPO/ATREE_DSP ATP: Display ATP Tree Structures
    /SAPAPO/BLRG01 Generation of Reqmnts from Blocks
    /SAPAPO/BOP ATP: Batch Backorder Processing
    /SAPAPO/BOPI Backorder Processing (Interactive)
    /SAPAPO/BOP_COMPARE Backorder Processing: Comparison
    /SAPAPO/BOP_DELETE Delete Backorder Processing
    /SAPAPO/BOP_MONITOR Monitor Backorder Processing
    /SAPAPO/BOP_RESULT Backorder Processing Results
    /SAPAPO/BOP_RUNTIME Backorder Processing: Runtimes
    /SAPAPO/BOP_UPDATE Backorder Processing: Update
    /SAPAPO/BOP_VS ATP: Backorder Processing for VS
    /SAPAPO/BOP_WORKLIST ATP, BOP: Worklist
    /SAPAPO/BP1 Send Transaction Data
    /SAPAPO/BP2 Delete Transaction Data
    /SAPAPO/C3 Display Application Log
    /SAPAPO/C4 Maintenance of global parameters
    /SAPAPO/C41 Activate/Deactivate Login
    /SAPAPO/C5 Send Planning Results to OLTP
    /SAPAPO/C6 Delete Application Log
    /SAPAPO/C7 Find Entries
    /SAPAPO/CALENDAR Calendar
    /SAPAPO/CC Core Interface Cockpit
    /SAPAPO/CCR CIF_DELTAREPORT3
    /SAPAPO/CCRR CIF Compare/Reconcile Reorganization
    /SAPAPO/CDPS0 DPS Variable View
    /SAPAPO/CDPS1 DPS View 1
    /SAPAPO/CDPS2 DPS View 2
    /SAPAPO/CDPS3 DPS View 3
    /SAPAPO/CDPSB0 Production Planning Run
    /SAPAPO/CDPSB1 Prod. Planning Run in the Background
    /SAPAPO/CDPSC6 Customizing: Setup Group Maintenance
    /SAPAPO/CDPSC7 Maintenance of Setup Matrices
    /SAPAPO/CDPSS0 Simulation Version
    /SAPAPO/CDPS_REPT Evaluations
    /SAPAPO/CDPS_SETUP List Output for Setup Matrix
    /SAPAPO/CLPIPCAL Collaborative Promotion Planning
    /SAPAPO/CLPISDP Collab. Supply and Demand Planning
    /SAPAPO/CLPITPL Collaborative Transport. Planning
    /SAPAPO/CLPRPDEL CLP: Delete RFQs
    /SAPAPO/CLPRPIN Incoming RFQ Processes
    /SAPAPO/CLPRPOUT Outgoing RFQ Processes
    /SAPAPO/CLPRPSTART CLP: Publish RFQs
    /SAPAPO/CLP_PBPULL Read Time Series
    /SAPAPO/CLP_PBPUSH Send Time Series
    /SAPAPO/CLP_SETTINGS Collaboration Partners
    /SAPAPO/CMDS_DEFCNF Maintain Default Confirm. Profiles
    /SAPAPO/CMDS_DEFCNTR Maintain Default Control Profiles
    /SAPAPO/CMDS_DEL Delete Releases and Confirmations
    /SAPAPO/CMDS_SCO1 Maintain Sales Scheduling Agreements
    /SAPAPO/CMDS_SCO2 Delete Sales Scheduling Agreements
    /SAPAPO/CMDS_SCO4 Manage Fiscal Year
    /SAPAPO/CMDS_STPD Define Sold-To Party Determination
    /SAPAPO/CMDS_STPSR Define Inbound Release Processing
    /SAPAPO/COMP_VARIANT Comparison of Product Variants
    /SAPAPO/CONSCHK Model Consistency Check
    /SAPAPO/CONSPRF Model Consistency Check: Profile
    /SAPAPO/CONSSHOW Read log from database
    /SAPAPO/CPP CIF Postprocessing
    /SAPAPO/CPP1 CIF Postprocessing: Multiple Call
    /SAPAPO/CPP2 Display CIF Postprocessing Records
    /SAPAPO/CPPA CIF Error Handling: Alert
    /SAPAPO/CPPR Reorg. CIF Postprocessing Records
    /SAPAPO/CQ SCM Queue Manager
    /SAPAPO/CQINW qRFC Monitoring for Inbound Queues
    /SAPAPO/CSNP Costs Maintenance: SNP
    /SAPAPO/CSPRF Maintain TSP Profile
    /SAPAPO/CTM Capable-to-Match: Main Screen
    /SAPAPO/CTM01 CTM: Consistency Check
    /SAPAPO/CTM02 CTM: Stock Limits
    /SAPAPO/CTM10 CTM: Distribute Receipt Objects
    /SAPAPO/CTMAPLOG CTM Logs
    /SAPAPO/CTMB Execute CTM in Background
    /SAPAPO/CTMCUST CTM: Global Customizing
    /SAPAPO/CTMMSEL Selection of CTM Master Data
    /SAPAPO/CTMORDSEL CTM: Maintain Order Selection
    /SAPAPO/CTMSCPR Profile Maint. Supply Categorization
    /SAPAPO/CTMSSTRAT Define CTM Search Strategy
    /SAPAPO/CTMTP Transport CTM Profile
    /SAPAPO/CTMTSTR Define CTM Time Stream
    /SAPAPO/CTMVIEWER CTM: Call Viewer
    /SAPAPO/CTRP Costs Maintenance - Vehicle Sched.
    /SAPAPO/CULL_RTO_DEL Delete Production Data Structure
    /SAPAPO/CURTO_GEN_DP Generate DP PDS
    /SAPAPO/CURTO_SIMU Display Production Data Structures
    /SAPAPO/CW qRFC Monitoring
    /SAPAPO/DFCT Maintain Distribution Function
    /SAPAPO/DISPLAY_CONF Display of DelSched and Confirmation
    /SAPAPO/DMP1 Display Consumption Situation
    /SAPAPO/DMP2 Generate Planned Independent Reqmts
    /SAPAPO/DM_PEGCHECK Consistency Check Pegging Areas
    /SAPAPO/DPC3 Change Overview
    /SAPAPO/DPLSPLIT Deployment Stk Transfer Prioritizatn
    /SAPAPO/GEN_CHK_PDS Generate iPPE Check PDS
    /SAPAPO/GEN_PDS Generation of iPPE PDS
    /SAPAPO/INCMD_MODEL Model Assignment
    /SAPAPO/IPM01 integrated profile management
    /SAPAPO/LCOUT Release from SNP -> DP
    /SAPAPO/LOC3 Master Data: Locations
    /SAPAPO/LOCTZCALC Calculate transport zone coordinates
    /SAPAPO/LOC_CD_READ Change Documents for Location
    /SAPAPO/LOC_DEL_LOG Location: Delete Application Log
    /SAPAPO/LOC_DISP_LOG Location: Display Application Log
    /SAPAPO/MASSGEOCODE Location: Mass-Geocoding
    /SAPAPO/MAT1 Product
    /SAPAPO/MC62 Maintain Characteristic Values
    /SAPAPO/MC77 Change Selection
    /SAPAPO/MC7A Location Split
    /SAPAPO/MC7B Product Split
    /SAPAPO/MC8D Mass Processing: Create Planning
    /SAPAPO/MC8E Mass Processing: Change Planning
    /SAPAPO/MC8F Delete Planning Job
    /SAPAPO/MC8G Schedule Mass Processing
    /SAPAPO/MC8I Mass Processing: Check Planning
    /SAPAPO/MC8J Copy Mass Processing Jobs
    /SAPAPO/MC8K Logs
    /SAPAPO/MC8S Transfer Profiles
    /SAPAPO/MC8T Activity
    /SAPAPO/MC8U Transfer Profile
    /SAPAPO/MC8V Calculate Proportional Factors
    /SAPAPO/MC90 Release to Supply Network Planning
    /SAPAPO/MC96B Maintain Forecast Profile
    /SAPAPO/MCPSELDEL Delete selections
    /SAPAPO/MD74 Reorganization: Adapt Indep.Reqmts
    /SAPAPO/MNTPROF01 Maintain Display Profile
    /SAPAPO/MP31 Maintain Promotion Attribute Types
    /SAPAPO/MP32 Maintain Cannibalization Group
    /SAPAPO/MP33 Maintain Promotion Key Figures
    /SAPAPO/MP34 Supply & Demand Planner: Init.Screen
    /SAPAPO/MP40 Maintain Promotion Bases
    /SAPAPO/MP41A Maintain Settings for Report
    /SAPAPO/MP41B Promotion Reports
    /SAPAPO/MP42 Promotion Management
    /SAPAPO/MSDP_ADMIN S&DP Administration
    /SAPAPO/MSDP_FCST1 Lifecycle Settings
    /SAPAPO/MSDP_FCST2 Assign Forecast Profiles
    /SAPAPO/MSDP_SB Safety Stock Calculation
    /SAPAPO/MSP01 Maint. and Service Planning Board
    /SAPAPO/MSP_CYCMAINT Cycle Maintenance
    /SAPAPO/MSP_ESIM MSP Easy Simulation
    /SAPAPO/MSP_MOBJ Maintenance of one Maint. Object
    /SAPAPO/MSP_PERFPROF Maintenance of Performance Profile
    /SAPAPO/MTL01 Maintenance Task List
    /SAPAPO/MVM Model/Planning version
    /SAPAPO/OM03 Test Program for liveCache and LCA
    /SAPAPO/OM04 Display of Current LCA Version
    /SAPAPO/OM11 Log
    /SAPAPO/OM12 Delete Log
    /SAPAPO/OM13 Analyze liveCache and LCA Objects
    /SAPAPO/OM16 Data Viewer
    /SAPAPO/OM17 Data Reconciliation
    /SAPAPO/OM25 Daily Reorganization of APO
    /SAPAPO/OO_PPM_CONV Maint. Mode Comb. for PPM Conversion
    /SAPAPO/OPT03 Optimizer User Display
    /SAPAPO/OPT09 Optimization Version Display
    /SAPAPO/OPT11 Log display
    /SAPAPO/OPT12 Opt. server process overview
    /SAPAPO/OPT_PRIOPROF SNP Opt.: Priority Profile
    /SAPAPO/OPT_STOP Terminate Optimization Runs
    /SAPAPO/PCMT Production Campaign
    /SAPAPO/PDSLOG Log of PDS Generation
    /SAPAPO/PEG1 Pegging Overview
    /SAPAPO/PMON Plan Monitor
    /SAPAPO/PMONDEF Definition: Key figure schema
    /SAPAPO/POM1 Planned Order Management
    /SAPAPO/POV1 Product Overview Transaction
    /SAPAPO/PPC1 Backflush Entry
    /SAPAPO/PPC2 Display Backflush
    /SAPAPO/PPE iPPE Workbench Professional
    /SAPAPO/PPELUI iPPE Workbench Express
    /SAPAPO/PPFSCO Output of Confirmations
    /SAPAPO/PPL1 Production List
    /SAPAPO/PPM_CONV Conversion of PP/DS PPMs to SNP PPMs
    /SAPAPO/PPM_CONV_310 Report for Generating SNP PPMs
    /SAPAPO/PPM_CONV_LOG Log of SNP-PPM generation
    /SAPAPO/PPM_DEL Mass Deletion of Plans and PPMs
    /SAPAPO/PPT1 Product Planning Table
    /SAPAPO/PROD_CD_READ Change Documents for Produkt
    /SAPAPO/PSTRUCONS Plng Obj. Struct. Consistency Check
    /SAPAPO/PWBSCH1 Create SA Release(s)
    /SAPAPO/PWBSCH2 Release Output
    /SAPAPO/PWBSCH3 Process Sched. Agreement Releases
    /SAPAPO/PWBSCH4 Enter Confirmation
    /SAPAPO/PWBSRC1 Ext. Procure. Rltnshps Maintenance
    /SAPAPO/PWBSRC2 Delete External Proc. Relationships
    /SAPAPO/RBA04 Integrated Rule Maintenance
    /SAPAPO/RBAC01 Maintain Rule Strategy Determination
    /SAPAPO/RELHSHOW Hierarchy Maintenance
    /SAPAPO/REL_TO_OLTP Direct Release InfoProvider to R/3
    /SAPAPO/REL_TO_SNP Direct Release InfoProvider to SNP
    /SAPAPO/REORG_WUL Reorg. of Where-Used-Lists in LC
    /SAPAPO/RES01 Change Resources
    /SAPAPO/RET2 Restrictions Maint.- Create & Change
    /SAPAPO/RET_EVAL Restriction Evaluation
    /SAPAPO/RET_RP Restrictions & Reservation Planning
    /SAPAPO/RLCDEL Delete Orders from Livecache
    /SAPAPO/RLGCOPY Realignment
    /SAPAPO/RRP1 Requirements View
    /SAPAPO/RRP2 Process Order
    /SAPAPO/RRP3 Product View
    /SAPAPO/RRP4 Receipts view
    /SAPAPO/RRP7 Mass Conversion of Orders
    /SAPAPO/RRP8 ATP Check for REM Planned Orders
    /SAPAPO/RRPEVAL Log for Last Planning Run
    /SAPAPO/RRPLOG1 Display Logs
    /SAPAPO/RRPLOG2 Delete Logs
    /SAPAPO/RRP_ATP2PPDS ATP Tree Structure Conversion
    /SAPAPO/RRP_NETCH Planning File Entries
    /SAPAPO/RRP_SNP2PPDS Conversion SNP -> PP/DS
    /SAPAPO/RSP_CONSIS Cons. Check RSC + Per.-Slot Creation
    /SAPAPO/RSP_DBORSHOW Display Configuration for Orders
    /SAPAPO/RSP_DCR Releasing Daily Packages
    /SAPAPO/RSP_DICP Daily Package Creation
    /SAPAPO/RSP_D_DEL Delete Delta Records
    /SAPAPO/RSP_EXPLAIN Explanation Facility
    /SAPAPO/RSP_G1 Planning Table
    /SAPAPO/RSP_INFO Information Center RP
    /SAPAPO/RSP_LC01 Initialize Time Series
    /SAPAPO/RSP_LC03 Update Time Series
    /SAPAPO/RSP_LC04 Restore Time Series
    /SAPAPO/RSP_MCSC Manuf.Compl. Proposed Orders f.Stock
    /SAPAPO/RSP_P1 Copy Orders
    /SAPAPO/RSP_P2 Start Medium-Term Planning
    /SAPAPO/RSP_P3 Reset Result of Medium-term Planning
    /SAPAPO/RSP_RD_SIMU Simulation of Restriction Explosion
    /SAPAPO/RSP_RSC Rescheduling
    /SAPAPO/RTO_ORD_COMP Compare PP/DS PDS (R/3)
    /SAPAPO/SCC02 Supply Chain Cockpit
    /SAPAPO/SCC03 PPM Maintenance
    /SAPAPO/SCC07 Supply Chain Engineer
    /SAPAPO/SCC_TL1 Transportation Lanes
    /SAPAPO/SCC_TL2 Mass Creation of Transport Rltnships
    /SAPAPO/SCC_TQ1 Quota Arrangements
    /SAPAPO/SCC_USR_PROF SCC Cockpit User Settings
    /SAPAPO/SCE_USR_PROF SCC Engineer User Settings
    /SAPAPO/SCHED_TEST Simul. Transp. & Shipment Scheduling
    /SAPAPO/SDP8B Define Planning Book
    /SAPAPO/SDP94 Supply & Demand Planner: Init.Screen
    /SAPAPO/SDPALPR Assign Planners to Alert Profiles
    /SAPAPO/SDPPLBK Assign User to Planning Book
    /SAPAPO/SDPT SD Sched. Agrmt. Prod.Planning Table
    /SAPAPO/SDPUSET SDP User Settings
    /SAPAPO/SDRQCR21 Correction Report /sapapo/sdrqcr21
    /SAPAPO/SEQ1 Interactive Sequencing
    /SAPAPO/SEQ2 Model Mix Planning Run
    /SAPAPO/SNP01 SNP Run
    /SAPAPO/SNP02 Deployment
    /SAPAPO/SNP03 Call Deployment Optimizer
    /SAPAPO/SNP04 Transport Load Builder
    /SAPAPO/SNP05 Capacity leveling
    /SAPAPO/SNP06 Hierarchical Planning Disaggregation
    /SAPAPO/SNP103 Maintain TLB Profile
    /SAPAPO/SNP113 SNP: Maintain Costs
    /SAPAPO/SNP2PPDS SNP -> PP/DS Conv. in Background
    /SAPAPO/SNP94 SNP: Interactive Planning
    /SAPAPO/SNPAPLOG Application Logs
    /SAPAPO/SNPDRP DRP: Interactive Planning
    /SAPAPO/SNPFCST Release SNP Forecast
    /SAPAPO/SNPLLC Low-Level Code Determination
    /SAPAPO/SNPOP Call Up SNP Optimizer
    /SAPAPO/SNPOPLOG SNP Optimizer Log Data
    /SAPAPO/SNPSA Sched. Agreemt: Interactive Planning
    /SAPAPO/SNPSOP SOP: Interactive Planning
    /SAPAPO/SNPSRC Call: Sourcing of Forecast in SNP
    /SAPAPO/SNPTLB TLB: Interactive Planning
    /SAPAPO/SNPVMI SNP: Interactive Planning with VMI
    /SAPAPO/SUPCAT CTM Supply Category Maintenance
    /SAPAPO/TI01 Evaluation of Production Tracking
    /SAPAPO/TLBPRF TLB Profile Maintenance
    /SAPAPO/TR30 Maintain DP/SNP Time Buckets Profile
    /SAPAPO/TR32 Periodicities for Planning Area
    /SAPAPO/TR_CD_QUOTA Change Docs for Quota Arrangements
    /SAPAPO/TR_CD_TLANE Change Docs for Transportation Lanes
    /SAPAPO/TR_DELTRPR Deletion of Prod.-Spec. Trnsp. Lane
    /SAPAPO/TR_IGS_BPSEL Scheduling of GIS Preselection
    /SAPAPO/TR_IGS_BUTRM Update of GIS Data
    /SAPAPO/TR_IGS_RPSEL Reorganization of GIS Preselection
    /SAPAPO/TSCONS Time Ser. Network Consistency Check
    /SAPAPO/TSCOPY Copy/Version Management
    /SAPAPO/TSCUBE Load Planning Area Version
    /SAPAPO/TSKEYFMAIN Mass Maint. for Time Series Key Fig.
    /SAPAPO/TSLCREORG Check LC Time Series Master Data
    /SAPAPO/TSPSTRU Toolbox for Planning Object Struct.
    /SAPAPO/TTC1 Schedule Maintenance
    /SAPAPO/TTV1 Maintain Validity Area
    /SAPAPO/TTW1 Itinerary Maintenance
    /SAPAPO/VERCOP Copy Version
    /SAPAPO/VERDELLD Delete a planning version
    /SAPAPO/VERMER Merge Planning Versions (SNP)
    /SAPAPO/VERMRM Merge Versions: Messages
    /SAPAPO/VS01 VS Interactive Planning
    /SAPAPO/VS05 Schedule optimization run
    /SAPAPO/VS10 Transportation Service Provider Sel.
    /SAPAPO/VS11 TPVS: Define Delivery/Pickup Windows
    /SAPAPO/VS12 TP/VS: Define Compatibilities
    /SAPAPO/VS50 Orders for Delivery Generation
    /SAPAPO/VS501 Schedule Delivery Generation
    /SAPAPO/VS51 Change Plan. Shipments to Shipments
    /SAPAPO/VS511 Transfer Planned Shipments to OLTP
    /SAPAPO/VS52 Check Release of Planned Shipments
    /SAPAPO/VS521 Check Release of Planned Shipments
    /SAPAPO/VS53 Deleting deliveries
    /SAPAPO/VS531 Delete Deliveries
    /SAPAPO/VS54 Deleting Shipments
    /SAPAPO/VS541 Delete Shipments
    /SAPAPO/VS551 Release Shipments in the Background
    /SAPAPO/VS60 Monitor for OLTP Publication
    /SAPAPO/VS70 Apply Split Rules
    /SAPAPO/VS71 Determine Split Rules
    /SAPAPO/VS72 Maintain Access Sequence for Splits
    /SAPAPO/VS73 Maintain Split Rules
    /SAPAPO/VSHIST Display the Change History
    /SAPCND/AO01 Conditions: V_T681F for O RB
    /SAPCND/AO03 Create condition table
    /SAPCND/AO04 Change condition table
    /SAPCND/AO05 Display condition table
    /SAPCND/AO06 Condition Type: Rules-Based ATP
    /SAPCND/AO07 Access: Maintain (Rules-Based ATP)
    /SAPCND/AO08 Conditions: Procedure for O RB
    /SAPCND/AO11 Create Rule Determination
    /SAPCND/AO12 Change Rule Determination
    /SAPCND/AO13 Display Rule Determination
    /SAPCND/AO14 Copy Rule Determination
    /SAPCND/AU11 Create Scheduling Step
    /SAPCND/AU12 Change Scheduling Step
    /SAPCND/AU13 Display Scheduling Step
    /SAPCND/AU14 Copy Scheduling Step
    /SCMB/ODM_CHECK ODM: Check Customizing
    /SCMB/ODM_DATA_CHECK ODM: Check Data Consistency
    AHTGL01 Action and Parameter Maintenance
    AHTGL02 Definition of Action Points
    BAPI BAPI Explorer
    CL02 Classes
    CL20N Object Assignments
    CL22N Assign Class to Superior Classes
    CL24N Class Assignments
    CT04 Characteristics
    LC10 liveCache Assistant
    LSMW Legacy System Migration Workbench
    MASSD Mass Maintenance
    MDEM Orders with Explosion Errors
    MDMD Matrix for Product/Location
    MDRPM Control Data for RPM Products
    OPPE13 User Assgmt: iPPE WB Professional
    OPPELUI02 User Assignment: iPPE WB Express
    PPECHK iPPE Consistency Check (Prod. Vers.)
    PPEHDR01 Create a Production Version
    PPEHDR02 Change a Production Version
    PPEHDR03 Display a Production Version
    RPMBAL Line Balancing for Demand Program
    RPMCALL Explosion for RPM
    RPMEVAL Evaluations
    RPMLOG RPM Log
    RPMPERF Display Performance Data
    RPMPLF Planning Flags for Planning Matrices
    RPM_DATEVECTORS_REOR Reorganize Table of Periods in LC
    RPM_DATEVECTOR_COMPU Calculate Table of Periods f. Res.
    RPM_OM_DATEVECTOR_SH Display Table of Periods from LC
    RPM_RESOURCE_TSTREAM Display Resource Time Stream
    RSKC Maintaining the Permittd Extra Chars
    RSPC Process Chain Maintenance
    RSSM Authorizations for Reporting
    RZ20 CCMS Monitoring
    SLG2 Application Log: Delete logs
    SM37 Overview of job selection
    SMQ1 qRFC Monitor (Outbound Queue)
    SMQ2 qRFC Monitor (Inbound Queue)
    S_AP5_28000002
    S_AP8_94000074
    S_AP8_94000284
    S_AP9_75000079 IMG Activity: APO_PPS_CDPSC0
    S_AP9_75000085 IMG Activity: APO_PPS_CDPSC8
    S_AP9_75000086 IMG Activity: APO_PPS_CDPSC5
    S_AP9_75000087 IMG Activity: APO_PPS_CDPSC4
    S_AP9_75000088 IMG Activity: APO_PPS_CDPSC3
    S_AP9_75000089 IMG Activity: APO_PPS_CDPSC2
    S_AP9_75000090 IMG Activity: APO_PPS_CDPSC1
    S_AP9_75000095 IMG Activity: APO_SNP_SNP112
    S_AP9_75000101 IMG Activity: APO_SNP_SNP107
    S_AP9_75000102 IMG Activity: APO_SNP_SNP105
    S_AP9_75000130 IMG Activity: APO_ALLG_TRANS
    S_AP9_75000138 IMG Activity: APO_ALLG_CAL
    S_AP9_75000141 IMG Activity: APO_PPS_ROUNDPRF
    S_AP9_75000142 IMG Activity: APO_DEMPL_BEDARF
    S_AP9_75000146 IMG Activity: APO_DEMPL_WORK
    S_AP9_75000169 Call the IMG Activity
    S_AP9_75000183
    S_AP9_75000184
    S_AP9_75000202
    S_AP9_75000203
    S_AP9_75000206
    S_AP9_75000212
    S_AP9_75000249
    S_AP9_86000053
    S_AP9_86000062 IMG Activity: APO_SNP_SNP120
    S_AP9_86000161
    S_APO_12000024
    S_APO_12000025
    S_APO_12000026
    S_APO_12000035
    WUF Where-Used List
    Tables:
    Tables where SALES ORDER Data is stored in APO
    In addition to the requirements in SAP liveCache, the SD order tables are also included in the comparison with SAP R/3. Data is stored in these tables that is required for SAP APO functions from the area of Global ATP, such as the check against product allocations and backorder processing.
    Both the existence and the consistency of the stored data is checked, based on the most important fields, as well as on the connection between main item(s) and subitem(s) in the following tables:
    · /sapapo/posmapn (mapping the item)
    · /sapapo/ordadm_h (order header)
    · /sapapo/ordadm_i (order item)
    · /sapapo/schedlin (order schedule line)
    · /sapapo/obref (object reference)
    · /sapapo/sdfield (SD order/delivery: Item additional data, also called 'field catalog')
    · /sapapo/ciflooku (CIF lookup table)
    The following inconsistencies can arise:
    · r3obj : R/3 object of item in table /sapapo/posmapn
    · atpcat: ATP category of item in table /sapapo/ordadm_i
    · chmod: Check mode of item in table /sapapo/ordadm_i
    · pstyv: Item category of item in table /sapapo/ordadm_i
    · from_time: Schedule line date in table /sapapo/schedlin
    · to_time: Schedule line date in table /sapapo/schedlin
    · uepos: Assignment of higher-level (main) item
    (Mapping in table /sapapo/posmapn and entry table in /sapapo/sdfield)
    · wmeng: Requested quantity in table /sapapo/schedlin
    · edatu: Requested delivery date in table /sapapo/schedlin
    · obref: Object reference between order and delivery item in table /sapapo/obref
    · matnr (MainItem)/matnrMItem: Product of main item in table /sapapo/ordadm_i
    · werks (MainItem)/werksMItem: Plant of main item in table /sapapo/ordadm_i
    · lgort (MainItem)/lgortMItem: Storage location of main item in table /sapapo/ordadm_i
    · Account assignment (MainItem)/accMItem: The account assignment of the main item, that is, the pegging area from table /sapapo/ordadm_i does not correspond to the account assignment in SAP R/3 (vbap-sobkz, vbap-vbeln and vbap-posnr)
    Important Tables in R/3
    Table Remarks
    QTVB Product Allocation: Allocation used by Customer Order* Use this table to find allocation assignment by Sales Order
    Important Tables in APO
    Table Remarks
    /SAPAPO/TBQTVB ATP: Parameter Buffer, Product Allocation Assignment
    /SAPAPO/PAGZE001 PAG-Z001 Product Allocations: Characteristic Value* This table is generated when a Product Allocation Group is defined. Use it to convert the GUID into a CVC.
    /SAPAPO/MATKEY Product Master* Use it to convert Material GUID into a material number.
    /SAPAPO/MATLOC Location product Master* Use it to see valid material plant combinations (GUID’s) in APO.
    /SAPAPO/MATMAP Mapping Table for Products* Use it to see mapping of material numbers in R/3, APO and GUID
    /SAPAPO/LOC Locations* Use it to convert Location GUID into a Location number.
    /SAPAPO/QTTAB Product Allocations: Schedule Line
    /SAPAPO/SDQTVB SD Order: Product Allocation Assignment* Use it to see detailed allocation assignment by Sales Order
    /SAPAPO/POSMAPN Order Items Mapping Table*Use to get GUID for Sales Orders
    /sapapo/treqires- All the confirmed qty and confirmed timestamp for order transaction GUID
    CDHDR, CDPOS- Broader- All changes
    /sapapo/DMCP
    R-Delete
    N-Create
    C-Change
    Regards,
    Naveen.

  • APO - Aggregate Forecasting and Best Practices

    I am interested in options to save time and improve accuracy of forecasts in APO Demand Planning.   Can anyone help me by recommending best practices, processes and design that they have seen work well?
    We currently forecast at the Product level (detailed).  We are considering changing that to the Product Family level.   If you have done this, please reply.

    Hello Dan -
    Doing it at the Product level is very detailed (but it depends on the number of SKU's Available and that are to be forecasted).
    Here for me on my project we have about sample size 5000 finished goods to start with and forecasting at that minute level wont help. For me i have classified a product group level where i have linked all the similar FGs. tht way when you are working with the product group you are able to be a little from assertive in your forecasting. After that you can use proportional factors that will help you in allocating the necessary forecast down to product level. This way you are happy as well as the management is happy (high level report) as they dont have to go thru all the data that is not even necessary for them to see.
    Hope this helps.
    Regards,
    Suresh Garg

Maybe you are looking for

  • Why do the new maps in ios6 show many wrong English translastions about Hong Kong Streets and buildings?

    Why do the new maps in ios6 show many wrong English translastions about Hong Kong streets and buildings?

  • Unable to Create Table entries

    Hi All, I have create a table, when I wanted to create data records from the maintenance screen under Utilities --> Table Contents --> I noticed Create Entries is disabled why is it so ... how can make it enable it ? Please advise TQ Nathan

  • OIM encryption/decryption error

    I am building a new environment by importing resources, lookup definitions, etc from an existing environment via deployment manager. Both the environments are same in s/w and h/w config: OIM: 9.1.0.2 BP18 Weblogic: 10.3.2 Windows Server 2008 R2 64 bi

  • By product / Co product  : Reg

    Hi, I am working with joint production and have some issues related to same. 1 -  I have created a production order with one co product and one by product.       But when I do the goods receipt, in MB31, by product is not appearing during goods movem

  • Computer won't regonize Ipod with Charger bought

    Ipod won't update with new charger bought at Circut city It says that no Ipod is connected. Does anyone know if the replacement charges sold for Ipods are just to charge they supposed to be able to update the Ipod too