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

Similar Messages

  • 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

  • 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.

  • Multiply Prop Factors with a KF value ?

    Hi
    In DP 5.0, Can we multiply Proportional Factors with another KF values in a macro ?
    I want to write a macro with APODPDANT mulitiplied by another KF with its value. Is it possible ? Because when i look at Prop Factors, i see them as 42,000/40,000 like that. Only when i go to percentae view, then i can see actual factors. So can i use these actual factors to multiply in a macro ?
    If not, how can i use them to multiply with another KF in a macro ?
    Any help is highly appreciated.
    Thanks
    Venkat

    Hi,
    The system calculates the proportional factor by multiplying the KF values in a CVC as well as the total to a very large value and then maintains the proportions.
    Thus the absolute values displayed in APODPDANT are really not of much use.
    Please try to build some other logic.
    Hope it helps.
    Thanks & regards
    Ankur Shrivastava

  • IOS 5.1 or iPhone Configuration Profile 3.5 for Windows has not fixed the issue with apply Proxy Settings

    iOS 5.1 or iPhone Configuration Profile 3.5 for Windows has not fixed the issue with apply Proxy Settings via a Configuration Profile. Has anyone else got the same issue? Are Mac users got this issue?

    This seems to be working for me now but will keep monitoring it the next couple of times I use it to make sure its not a one time thing

  • SAP APO 5.0 Assignment Table and Like Profiles

    Hello,
    Is the any way to extract all the entries in either of the like profiles or the assignment table.
    I tried the System -> List -> Save but all the options are grayed out.
    Any feedback wold be greatly appreciated.
    Thanks

    Hi,
        I am not sure which entries you want exactly...However there are couple of tables related to like profiles in which LIKEID is there.
    /SAPAPO/DP440G- Master Forecast Profile (APO0300)
    /SAPAPO/FCST_LC -  Assignment Table: Lifecycle Profiles to Charact. Value
    /SAPAPO/FCST_LC1 - Assignment Table: Lifecycle Profiles to Charact. Value
    /SAPAPO/T445LIKE -  Table for LIKE Dependencies
    /SAPAPO/T445LIKK - Header Table for LIKE Dependencies
    /SAPAPO/T445LIKT - Text Table for Like Profiles
    /SAPAPO/T445LIPR - Table for Life Cycle Planning
    I hope this will help you at some extent..
    Regards,
    Saurabh

  • 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

  • What is a like profile in SCM?

    I search my APO book and SDN, I cannot find the exact definition of like profiles
    Would you please explain what is  a like  profile?
    Thanks!

    Hi,
    The F1 help in the field 'Like Profile' is self explanatory. Please see the text from F1 pasted below.
    *Profile Number for Like Dependency in Material Forecast*
    Used in Demand Planning, a "like" profile allows you to create the demand forecast of a product using the historical data of a product or products whose demand behavior is the same or similar.
    Use
    Use "like" modeling for products with short lifecycles or for products with insufficient historical data.
    You can use the same "like" profile for multiple products.
    Procedure
    To create a "like" profile:
    1. Call the product's master record in Create or Change mode.
    2. Select the Phase-in/phase-out tab.
    3. Select Maintain next to the "Like" profile field.
    As an alternative to steps 1-3, choose Goto -> LIKE profile -> Define from the master forecast profile.
    4. Enter the product or products whose historical data you wish to be used to create the forecast.
    5. For each product, enter an action. There are two possible actions:
    "S": This product's historical value is added to the forecasted product's generated historical value.
    "A": The mean average historical value for all products of action type "A" is added to the forecasted product's generated historical value.
    6. For each product of action type "S", enter a weighting factor or a weighting profile.
    If you enter both a weighting factor and a weighting profile, the system uses the weighting profile. If you enter nothing, the system sets the weighting factor to 100%. If you enter a weighting factor and/or a weighting profile next to a product of action type "A", the system ignores these entries.
    7. If required, enter a lag. You must enter the same lag for each "like" product.
    8. Choose Save.
    Example 1: "Like" Profile for MegaChocShock 200g
    "Like" product  Action History Factor  Generated history
    ChocBloc 50g  S  100  66  66
    ChocBloc 75g  S  200  34  68
    MegaChocShock 200g    134
    =======================================================================
    Example 2: "Like" Profile for MegaChocShock 300g
    "Like" product  Action History Factor Generated history
    ChocBloc 50g  S  100  33  33
    ChocBloc 75g  S  200  17  34
    MegaChocShock 100g A  100  -  150 [(100 + 200)/2]
    MegaChocShock 200g A  200  -  
    MegaChocShock 300g    217
    =======================================================================
    Example 3: "Like" Profile for MegaChocShock 400g
    Like...  Action Month History Factor Profile Generated history
    MCS 200g S  Jan  200  33  -  66
    Feb  250  33  -  82.5
    Mar  200  33  -  66
    Apr  300  33  -  99
    MCS 300g S  Jan  300  -  50  150
    Feb  200  -  30  60
    Mar  300  -  50  150
    Apr  400  -  70  280
    The generated history for MegaChocShock 400 is therefore:
    Month  Calculation  Result
    Jan  66 + 150  216
    Feb  82.5 + 60  142.5
    Mar  66 + 150  216
    Apr  99 + 280  379
    Example 4: "Like" profile for MegaChocShock 500g
    This example shows you how to use different "like" products in different periods.
    Like...  Action Month  History Profile Generated history
    MCS 300g S  Jan 98 300  100  300
    MCS 300g  Feb 98 200  100  200
    MCS 300g  Mar 98 300  100  200
    MCS 300g  Apr 98 400  100  400
    MCS 300g  May 98 400    0  0
    MCS 300g  Jun 98 400    0  0
    MCS 300g  Jul 98 400    0  0
    MCS 300g  Aug 98 500    0  0
    MCS 400g S  Jan 98 300    0  0
    MCS 400g  Feb 98 300    0  0
    MCS 400g  Mar 98 250    0  0
    MCS 400g  Apr 98 300    0  0
    MCS 400g  May 98 300  100  300
    MCS 400g  Jun 98 350  100  350
    MCS 400g  Jul 98 400  100  400
    MCS 400g  Aug 98 450  100  450
    The generated history for MegaChocShock 500g is therefore:
    Month Calculation  Result
    Jan  300 + 0  300
    Feb  200 + 0  200
    Mar  200 + 0  200
    Apr  400 + 0  400
    May  0 + 300  300
    June  0 + 350  350
    July  0 + 400  400
    Aug  0 + 450  450
    Dependencies
    You must assign the profile to one or more products. To do this, choose Goto -> LIKE profile -> Assign from the master forecast profile and make the desired entries. You can also assign a "like" profile to a product on the Phase-in/phase-out tab of the global product master record.
    To limit the use of the "like" profile to particular locations, choose Goto -> LIKE profile -> Assign from the master forecast profile and make the desired entries.
    Edited by: Senthil_APO on Oct 1, 2009 1:54 PM

  • 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

  • Help with colour profiles and wide gamut monitor

    Hi there,
    I know this issue must crop up a lot due to its confusing nature but I would really appreciate it if someone could explain what settings I should be using in Photoshop to get accurate colours. I had a look around and couldn't find any other discussions that answered this exactly.
    My set up is a Dell 2408WFP monitor which is wide-gamut. I have calibrated this using a huey Pro calibrator (therefore have an accurate system colour profile). My photos are in Canon sRGB space, set by Digital Photo Professional (obviously easily changed if need be).
    What I would like is to be able to preview what my photos will look like on a standard sRGB display. When I open a photo in Photoshop with all the settings on their default it looks extremely washed out, very low contrast and saturation. This is nothing like what the photos look like outside of Photoshop, and also not what the photos look like on other (normal gamut) displays. I have tried using the "proof colours" settings. When I have "proof setup" set to Internet Standard sRGB the colours look dreadful, oranges become blood-red, definitely not what I am getting when I view the image on a standard monitor. If I have it set to Monitor RGB then I get colours that look like my monitor outside of Photoshop -- this is the closest out of the three to the result I am actually getting on standard gamut displays. However I know it is not accurate because I know my monitor is wide gamut and therefore more has more contrast (and this is the case).
    So what combination of photo colour space, proof colour space, and proof colours settings should I be using? My main priority is just the Joe Average using his TN panel monitor on facebook, I accept that on my monitor they will look slightly different. Settings for print don't concern me at the moment.
    Thanks for the help. To anyone who will suggest that I read up on colour profiles... I have, and I understand them to an extent, but there are so many variables here that I am getting lost (monitor profile, photo profile, photoshop settings, DPP settings, faststone viewer's settings, browser's lack of awareness...)
    Andrew

    function(){return A.apply(null,[this].concat($A(arguments)))}
    thekrimsonchin wrote:
    I know this issue must crop up a lot due to its confusing nature
    You have no idea. 
    What I'm reading is that you want Photoshop, with its color management enabled, to display your sRGB photos as they would be seen on a true sRGB monitor - i.e., accurately.
    Something to always keep in mind, when everything's set right and working properly:  Your sRGB image displayed on your wide gamut monitor without color management (e.g., by Internet Explorer) will look bolder and brighter (more color-saturated) than the same image displayed in Photoshop with color-management.  There is no getting around this, because the sRGB profile is not equivalent to the monitor profile.  Do not expect them to look the same.
    It's hard, without being there and seeing what you're seeing, to judge whether your sRGB images are undersaturated compared to what's seen on other monitors.  I do know, as one with sRGB monitors myself, that images can look quite vibrant and alive in the sRGB color space.
    What we can't know is whether your judgment that your color-managed sRGB images are undersaturated is correct in an absolute sense, or whether you're just feeling the difference between seeing them on your monitor in non-color-managed apps and Photoshop.
    Photoshop normally does its color management like this:  It combines the information from the color profile in your document with the color profile of the monitor, which it retrieves from a standard place in Windows, and creates a transform used to display the colors.
    To have it do this you would NOT want the Proof Colors setting enabled.  It is the default behavior.
    -Noel
    P.S., I don't recall whether DPP is color-managed, but you might consider using Photoshop's raw converter, which definitely shows color-managed output, per the settings I described above.
    P.P.S.,  Your calibrator/profiler should have put the monitor profile in the proper place and set all the proper stuff up in Windows.  Is it specifically listed as compatible with the version of Windows you're running?

  • 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

  • Partner profile settings.. for IDOC to File

    i am trying to send Idoc to XI system from my r/3..
    once iam sending from r/3 we19 ,i am getting error like this
    receiver port " port name " does not exist in the table of port descriptions ..
    how can i maintain receiver port in sender sys..?it is asking for RFC destination which is there in receiver sys but not in sender ....
    how should i configure...
    (Note: i have sent file to Idoc with same configuration settings..)
    NOW
    i am sending IDOC FROM IDES TO XI as FILE
    Control record :in we19 ( IDES5.0)
       (XI-System)(SYS ID =O36)    (IDES5.0)(SYS ID = O20)
           Receiver:                      Sender:
    port:SAPO20_800                 port:XI_00_800
    partnerNo:036CLNT036        artnerNo:T90CLNT090  
    i have maintained outbound settings in T90CLNT090..
    thanks in advance..
    Ramesh..
    THANKS FOR YOUR QUICK RESPONSES .HERE I added ALL DETAILS OF CONFIGURATION..from which iam getting error

    Hi,
    Steps to do ALE Configuration with respect to IDOC:
    Configuration in R/3:
    1. Create a RFC destination using Transaction = SM59
    2. Create the ports using we21 and refer the port to the created RFC dest in above Step.
    3. Create a Logical System using Transaction BD54.
    4. Create a partner profile using transaction WE20.
    Also need to configure in XI:
    1. Create a RFC destination using Transaction = SM59
    2. Create the ports using Transaction IDX1 and refer the port to the created RFC dest in above Step.
    3. The port has to be displayed in the IDX2 transaction and we should be able to view the idoc’s which we imported through integration repository otherwise we have to manually import the idoc’s from IDX2 using the port created above
    Also refer to the link below for further details:
    /people/prateek.shah/blog/2005/06/08/introduction-to-idoc-xi-file-scenario-and-complete-walk-through-for-starters
    Regards,
    Nithiyanandam

  • TS1317 Internet Connectivity Issue - specifically with the DNS settings

    Hi there,
    I'm wondering if someone can help me resolve an internet connectivity issue on my MacBook Pro.
    It appears to be a problem specifically with the DNS settings. I am connected to the internet but can only reach a website by typing in the IP address, not the domain name. The error messahe says: "Unable to resolve server's DNS address."
    Regardless of whether I use Wifi, 3G modem or cable, i get the same error.
    Operating System is Mac OSX Version 10.6.7
    Please help!
    Thanks

    It sounds like your MacBook Pro has either incorrect or missing DNS IP address information in it network profile. Let's start with your wireless connection. You would find these in System Preferences > Network > Wi-Fi > Advanced > DNS tab
    If your main Internet router is performing as the DHCP server, it would provide the DNS IP addresses (typically from your ISP) on this tab. You may have two or more addresses listed. If they are grayed, that means that the addresses are coming from the DHCP server.
    In the following example screen shot, I am using DNS servers provided by OpenDNS. Notice that they are grayed as they are being provided by my main Internet router. Again, these should be either ones provided by your ISP or ones you purposely set up, like my OpenDNS ones.

  • Reg Like profiles

    Hi All
    One of the user created like profile and phase in/out profile.. now they were deleted.. we need to see the profiles again. is there any process to get the deleted like profiles..
    Regards
    Tgs

    Hello
    Please check if you have an entry for deleted like profile into below tables.
    /SAPAPO/T445LIKE               Table for LIKE Dependencies
    /SAPAPO/T445LIKK               Header Table for LIKE Dependencies
    /SAPAPO/T445LIKT               Text Table for Like Profiles
    /SAPAPO/T445LIPR               Table for Life Cycle Planning
    Database tables in APO for phase in/out profiles
    /SAPAPO/PHASESRV PSM Service Profile for Phase-In/Out Planning
    /SAPAPO/PHINGR Phase-In Group
    /SAPAPO/PHINGRT Text Table for Phase-In Group
    /SAPAPO/PHINPRF Phase-In Profile
    /SAPAPO/PHOUTGR Phase-Out Group
    /SAPAPO/PHOUTGRT Text Table for Phase-Out Group
    /SAPAPO/PHOUTPRF Phase-Out Profile
    /SAPAPO/PHOUTSRV PSM Service Profile for Phase-In/Out Plann
    /SAPAPO/PHVALUE Value Table for Phase-In and Phase-Out Profile
    If yes, Check if ABAP can do some magic. Or else check with SAP OSS.
    Hope this helps.
    Thank you
    Satish Waghmare
    Edited by: SatishW on Apr 8, 2011 11:09 AM

  • I think I need help with driver (software) settings for D110a

    I think I need help with driver (software) settings for D110a all-in-one
    Product: D110a all-in-one
    OS: Windows XP Professional
    Error messages: None
    Changes before problem appeared: None--new installation
    The quality of photo images (mostly JPG files) in printouts is awful even though the files display beautifully on the PC screen. I am using
    IrfanView software for displaying/printing. As far as I can tell, IrfanView is not the problem.
    When I print the same images on a Deskjet 5150 attached to a different PC also running XP Pro and IrfanView, the quality of the printouts is at
    least acceptable, Some would probably say good or very good.
    It's dificult to explain in words the problem with the printouts. A picture of really pretty vegetables (squashes, tomatoes, watermelon, etc) comes
    out much too red. Moreover, the red, which appears shaded on the screen, seems to be all one shade in the D110a printouts.
    Something similar happens to a view of a huge tree in full leaf. On screen, there are subtle variations in the "greenness" of the leaves. In the
    printout, all green is the same shade. In the same printout, the trunk of the tree is all a single shade of grey. It isn;t even obvious that the
    trunk is a round, solid object.
    I liken the effect to audio that disappears entirely when you lower the volume and gets clipped into square waves in even moderately loud passages.
    I don't know whether the D110a driver software permits adjusting the parameters that appear to be set incorrectly, and if adjustments are possible,
    how I would identify which parameters to adjust, how I would access them, or how I would adjust them. I'm hoping that someone can help. Thanks.
    I forgot to mention that I have used the diagnostic application and it tells me that there are no problems.
    e-mail me at [email protected]

    brazzmonkey wrote:
    Hi everyone,
    I noticed the following message when network starts on my gateway
    Warning: This functionality is deprecated.
    Please refer to /etc/rc.conf on how to define a single wired
    connection, or use a utility such as netcfg.
    Then I realized the way network settings should be written in rc.conf has changed. But I can't figure out how this should be done.
    Currently, my set up is the following (old way):
    INTERFACES=(eth0 eth1)
    eth0="dhcp"
    eth1="eth1 192.168.0.10 netmask 255.255.255.0 broadcast 192.168.0.255"
    ROUTES=(!gateway)
    eth0 is on DHCP because the IP is dynamically assigned my ISP.
    eth1 has a fix IP because it's on the LAN side.
    No problem to use DHCP on eth0 with the new settings.
    But for eth1, I don't know what I am supposed to write for gateway.
    Wiki isn't clear on that one either, and it looks like many articles still refer to the old way.
    Any guidance appreciated, thanks.
    brazzmonkey,
    you can't define 2 interfaces the old way (even though I saw some tricky workaround somewhere in the forums).
    Use, f.e., netcfg:
    Comment your old lines.
    In /etc/rc.conf insert:
    NETWORKS=(Eth0-dhcp Eth1-static)
    DAEMONS=(..... !network @net-profiles ....)
    In /etc/network.d create 2 files:
    First one is named  Eth0-dhcp.
    Contents:
    CONNECTION="ethernet"
    DESCRIPTION="Whatever text"
    INTERFACE=eth0
    HOSTNAME="your hostname"
    IP="dhcp"
    DHCP_TIMEOUT=15
    Second one is named Eth1-static.
    Contents:
    CONNECTION='ethernet'
    DESCRIPTION='whatver'
    INTERFACE='eth1'
    HOSTNAME='hname'
    IP='static'
    ADDR='192.168.0.10'
    GATEWAY='192.168.0.1' # your gateway IP
    DNS=('192.168.0.1') # your DNS server
    The names Eth0-dhcp and Eth1-static are not magic. They just must be the same in rc.conf and in /etc/network.d.
    Hope it helps.
    mektub
    PS: netcfg must be installed.
    Last edited by Mektub (2011-07-20 14:07:05)

Maybe you are looking for

  • Wi-Fi Sync with Windows 7 PC doesn't work

    I have both an iPhone 5s and iPad-3. I use iTunes (latest version) in a Windows 7 PC. No problems to sync with the USB cable, but Wi-Fi sync is totally unreliable.  I have spend lots of time reading all the information available online. Wi-Fi sync is

  • How do you force a file to be opened by a particular application?

    I have come across a brick wall - I have either missed something important, or maybe it is just something in Applescript not working as it should. In our school, we have both Preview and Adobe Reader installed on the student computers, which are bein

  • Poplulate key figure thru the start routine

    Hi Experts, I have update rules for my cube. In the start routine there, if i wrote abap code would it automatically fill the value of key figures in the cube. Can we do that with the ABAP code ? Or do i have to go to each key figure's routine and th

  • Trying to load pre-2006 lso files into Logic 8 on my new intel Mac Pro

    I'm trying to load pre-2006 lso files into Logic 8 on my new intel Mac Pro, but they crash the app every time. files saved 2006 and later load OK. Anybody shed any light on this or know of a fix (other than the laborious work-around of re-saving all

  • Oracle Sequence

    I created a sequence and i am using a trigger on a field to generate the number, however there are existing number in the table that are within the sequence range so i created to following code to look for existing numbers in the database then give a