Tech Specifications! Doubt!

Hi!
    I want to know technical spec is carried in separate hard copy document or in mail.
   Pls reply.

Hi Rahul,
In most of the cases technical specs come thru mail only.
If u r working at client place, technical specs given by senior people from ur project.
If ur project is small one, then the abaper itself prepare the technical specs.
Normally Functional people gives the functional specs, based on that abaper/Sr. Abaper will prepare the technical specs.
It is not necessary that evrytime u get technical specs from onsite, mostly u will get functional specs from the onsite.. Here we have to prepare Technical specs...
I hope it helps u..
Regards,
KK

Similar Messages

  • Want tech. specification

    i have one abap program boss want its Technical Specification can any give me any sample Spec. and also if it is possible give me my spect. i am sending code
    Plz give me spect as soon as possible.
                      CODE
    Report           YMPCR_LD1DAILY_REPORTA                              *                                                                     *
    PROGRAM.......   YMPCR_LD1DAILY_REPORTA                              *
    TCODE.........   YP33CH1                                             *
    TITLE.........                                                       *
    AUTHORS......... Rajesh Kumar Choudhary                              *
    FUNCTIONAL....   Mr.PRADEEP BANWAR.                                  *
    DATE WRITTEN..   22.07.2006                                          *
    R/3 RELEASE...   470                                                 *
    =====================================================================*
    COPIED FROM...                                                       *
    TITLE......... <DETAILED DESCRIPTION>                                *
    =====================================================================*
    USED BY....... < user or usergroups >                                *
    =====================================================================*
    PROGRAM TYPE.. Executable Program                                    *
    PACKAGE....... YLPC.                                                 *
    REQUEST NO....                                                       *
    LOGICAL DB...                                                        *
    =====================================================================*
    SCREENS.......                                                       *
    GUI TITLE.....                                                       *
    GUI STATUS....                                                       *
    =====================================================================*
    CHANGE HISTORY                                                       *
    Date       By  Correction Number & Brief Description  Release        *
    REPORT  YMPCR_LD1DAILY_REPORTA          LINE-SIZE 255        .
    *&      Tables Declerarion.                                            *
    TABLES: YMPCT_PP03_LPCHD,         "LPC PP03 HEADER TABLE
            YMPCT_PP03LPCACT,         "Activity Table
            AUFM,                     "Goods movement for Order
            QALS,                     "Inspection lot record
            PLMK,                     "Inspection plan characteristics
            QAMR,                     "Characteristic results during inspection processing
            MCHB.
    *&      Micros Difining                                                *
    DEFINE FREE_TABLE.
      CLEAR &1.
      FREE &1.
    END-OF-DEFINITION.
    DEFINE CONVERT_MATNR.
      CALL FUNCTION 'CONVERSION_EXIT_ALPHA_OUTPUT'
        EXPORTING
          INPUT  = &1
        IMPORTING
          OUTPUT = &2.
    END-OF-DEFINITION.
    *&     Internal Tables                                                 *
    DATA: BEGIN OF T_LPCHD OCCURS 100,
          TIMESTAMP LIKE YMPCT_PP03_LPCHD-TIMESTAMP,
          CHARGE LIKE YMPCT_PP03_LPCHD-CHARGE,
          PCODE_AIM LIKE YMPCT_PP03_LPCHD-PCODE_AIM,
          MATNR_AIM LIKE YMPCT_PP03_LPCHD-MATNR_AIM,
          AUFNR LIKE YMPCT_PP03_LPCHD-AUFNR,
          ROUTECODE LIKE YMPCT_PP03_LPCHD-ROUTECODE,
          BUDAT LIKE YMPCT_PP03_LPCHD-BUDAT,
          QUANTITY LIKE YMPCT_PP03_LPCHD-QUANTITY,
          PRUEFLOS LIKE YMPCT_PP03_LPCHD-PRUEFLOS,
          NO_OF_PIECES LIKE YMPCT_PP03_LPCHD-NO_OF_PIECES,
    END OF T_LPCHD.
    DATA: T_LPCHD1 LIKE T_LPCHD OCCURS 100 WITH HEADER LINE.
    DATA: BEGIN OF T_AUFM OCCURS 100,
          MBLNR LIKE AUFM-MBLNR,
          MJAHR LIKE AUFM-MJAHR,
          ZEILE LIKE AUFM-ZEILE,
          BWART LIKE AUFM-BWART,
          MATNR LIKE AUFM-MATNR,
          CHARG LIKE AUFM-CHARG,
          ERFMG LIKE AUFM-ERFMG,
          AUFNR LIKE AUFM-AUFNR,
          END OF T_AUFM.
    DATA: BEGIN OF T_AUFM_SM OCCURS 0,
          AUFNR LIKE AUFM-AUFNR,
          CHARG LIKE AUFM-CHARG,
          BWART LIKE AUFM-BWART,
          MATNR LIKE AUFM-MATNR,
          ERFMG LIKE AUFM-ERFMG,
          ACH_MATNR LIKE AUFM-MATNR,
          ACH_MAKTX LIKE MAKT-MAKTX,
          ACH_QTY   LIKE AUFM-ERFMG,
    END OF T_AUFM_SM.
    DATA: T_AUFM_SM_AR LIKE T_AUFM_SM OCCURS 0 WITH HEADER LINE.
    DATA: BEGIN OF T_QALS OCCURS 0,
          PRUEFLOS LIKE QALS-PRUEFLOS,
          MERKNR LIKE QAMR-MERKNR,
          VERWMERKM LIKE PLMK-VERWMERKM,
          MITTELWERT LIKE QAMR-MITTELWERT,
          VALUE(16),
          END OF T_QALS.
    DATA: BEGIN OF T_LPCACT OCCURS 0,
          TIMESTAMP LIKE YMPCT_PP03LPCACT-TIMESTAMP,
          AUFNR LIKE YMPCT_PP03LPCACT-AUFNR,
          PROD_TIME_START LIKE YMPCT_PP03LPCACT-PROD_TIME_START,
          CHARG LIKE AUFM-CHARG,
          END OF T_LPCACT.
    DATA: BEGIN OF T_MATNR OCCURS 0,
          MATNR LIKE MARA-MATNR,
          SPRAS LIKE MAKT-SPRAS,
          END OF T_MATNR.
    DATA: BEGIN OF T_MAKT OCCURS 0,
          MATNR LIKE MAKT-MATNR,
          MAKTX LIKE MAKT-MAKTX,
          END OF T_MAKT.
    DATA: BEGIN OF T_OUTPUT OCCURS 75,
          DATE LIKE SY-DATUM,
          CHARG LIKE AUFM-CHARG,
          AUFNR LIKE AUFM-AUFNR,
          BUDAT LIKE YMPCT_PP03_LPCHD-BUDAT,
          CAR(10),
          MN(10),
          SUL(10),
          PHO(10),
          SI(10),
          AL(10),
          TI(10),
          CR(10),
          NI(10),
          MO(10),
          V(10),
          CU(10),
          MATNR_AIM LIKE AUFM-MATNR,
          MAKTX_AIM LIKE MAKT-MAKTX,
          ACH_MATNR LIKE AUFM-MATNR,
          ACH_MAKTX LIKE MAKT-MAKTX,
          ACH_QTY   LIKE AUFM-ERFMG,
          TAP_TIME  LIKE SY-UZEIT,
          AIM_QTY LIKE AUFM-ERFMG,
          ROUTE(30),
          ROUTE1 LIKE YMPCT_PP03_LPCHD-ROUTECODE,
          MATNR_ARS LIKE AUFM-MATNR,
          MAKTX_ARS LIKE MAKT-MAKTX,
          ARS_QTY LIKE AUFM-ERFMG,
          NO_PCS LIKE YMPCT_PP03_LPCHD-NO_OF_PIECES,
          PERCEN(5) TYPE P DECIMALS 2,
          CINSM LIKE MCHB-CINSM,
          PENDING(7) TYPE C,
          PROD_DATE LIKE YMPCT_PP03_LPCHD-PROD_DATE,
          END OF T_OUTPUT.
    DATA: BEGIN OF T_OUTPUT_INA OCCURS 0.
            INCLUDE STRUCTURE YMPCT_PP03_LPCIN.
    DATA:END OF T_OUTPUT_INA.
    DATA: BEGIN OF T_OUTPUT2 OCCURS 75,
          CHARG(10),
          BUDAT(10),
          CAR(10),
          MN(10),
          SUL(10),
          PHO(10),
          SI(10),
          AL(10),
          TI(10),
          CR(10),
          NI(10),
          MO(10),
          V(10),
          CU(10),
          MATNR_AIM(18),
          MAKTX_AIM(40),
          ACH_MATNR(18),
          ACH_MAKTX(40),
          ACH_QTY(12),
          TAP_TIME(10),
          AIM_QTY(12),
          ROUTE(30),
         matnr_ars LIKE aufm-matnr,
         maktx_ars LIKE makt-maktx,
         ars_qty LIKE aufm-erfmg,
          NO_PCS(9),
          PERCEN(7) ,
          PENDING(7) TYPE C,
          END OF T_OUTPUT2.
    DATA:  BEGIN OF T_OUTPUT1 OCCURS 0,
            CHARG LIKE AUFM-CHARG,
           AUFNR LIKE AUFM-AUFNR,
            MATNR_ARS LIKE AUFM-MATNR,
            MAKTX_ARS LIKE MAKT-MAKTX,
            ARS_QTY LIKE AUFM-ERFMG,
           END   OF T_OUTPUT1.
    DATA: W_TABIX LIKE SY-TABIX.
    DATA  W_MENGE1 LIKE AUFM-ERFMG .
    DATA  L_TABIX LIKE SY-TABIX.
    DATA  WERKS_1 LIKE MCHB-WERKS.
    DATA : WA LIKE LINE OF T_OUTPUT.
    DATA : INDEX LIKE SY-TABIX.
    DATA CINSM_1 LIKE MCHB-CINSM.
    *&      INITIALIZATION.                                                *
    INITIALIZATION.
      RANGES P_BUDAT FOR YMPCT_PP03_LPCHD-BUDAT.
      P_BUDAT-SIGN = 'I'.
      P_BUDAT-OPTION = 'BT'.
      P_BUDAT-LOW = SY-DATUM - 11150.
      P_BUDAT-HIGH = SY-DATUM.
      APPEND P_BUDAT.
    *&      AT SELECTION SCREEN                                            *
    AT SELECTION-SCREEN OUTPUT.
      LOOP AT SCREEN.
        IF SCREEN-GROUP1 = 'WRK'.
          SCREEN-INPUT = 0.
          MODIFY SCREEN.
        ENDIF.
      ENDLOOP.
    *&      START OF SESECTION                                             *
    START-OF-SELECTION.
      PERFORM SELECT_DATA.
    *&      END OF SELECTION                                               *
    END-OF-SELECTION.
    *&      FEACHING DATA                                                  *
      PERFORM FORMAT_DATA.
      PERFORM WRITE_DATA.
    *&      Form  SELECT_DATA                                              *
    FORM SELECT_DATA.
      PERFORM GET_DATA_LPCHD.
      PERFORM GET_DATA_AUFM.
      PERFORM GET_MATERIAL_DESC.
      PERFORM GET_INSPECTION_VALS.
      PERFORM GET_ACTIVITY_DTLS.
    ENDFORM.                    " SELECT_DATA
    *&      Form  FORMAT_DATA                                              *
    FORM FORMAT_DATA.
      LOOP AT T_LPCHD.
        MOVE: T_LPCHD-CHARGE TO T_OUTPUT-CHARG,
              T_LPCHD-AUFNR  TO T_OUTPUT-AUFNR,
              T_LPCHD-BUDAT  TO T_OUTPUT-BUDAT,
              T_LPCHD-MATNR_AIM TO T_OUTPUT-MATNR_AIM,
              T_LPCHD-NO_OF_PIECES TO T_OUTPUT-NO_PCS.
    Route code
        READ TABLE T_LPCHD1 WITH KEY CHARGE = T_LPCHD-CHARGE
                     TRANSPORTING ROUTECODE.
        IF SY-SUBRC = 0.
          MOVE T_LPCHD-ROUTECODE TO T_OUTPUT-ROUTE1.
          CONCATENATE T_LPCHD-ROUTECODE '+'
                   T_LPCHD1-ROUTECODE INTO T_OUTPUT-ROUTE.
                  SEPARATED BY space.
        ENDIF.
    Aim material
        READ TABLE T_AUFM_SM WITH KEY AUFNR = T_LPCHD-AUFNR
                                      CHARG = T_LPCHD-CHARGE
                                      BWART = '101'.
                                     BINARY SEARCH.
        IF SY-SUBRC = 0.
         t_output-matnr_aim = t_aufm_sm-matnr.
          T_OUTPUT-AIM_QTY = T_AUFM_SM-ERFMG.
        ENDIF.
    Aim material description
        READ TABLE T_MAKT WITH KEY MATNR = T_OUTPUT-MATNR_AIM
                           BINARY SEARCH TRANSPORTING MAKTX.
        IF SY-SUBRC = 0.
          T_OUTPUT-MAKTX_AIM = T_MAKT-MAKTX.
        ENDIF.
    Achieved Material and Qty
    added by vinati on 230802
       READ TABLE t_aufm_sm WITH KEY aufnr = t_lpchd-aufnr
                                     charg = t_lpchd-charge
                                     matnr = t_lpchd-matnr_aim.
                                    bwart =  '321'.
       IF sy-subrc = 0.
             t_output-ach_qty = t_aufm_sm-erfmg / 2.
       ENDIF.
        CLEAR: W_MENGE1.
        LOOP AT T_AUFM_SM WHERE AUFNR = T_LPCHD-AUFNR
                          AND   CHARG = T_LPCHD-CHARGE
                          AND   MATNR = T_LPCHD-MATNR_AIM.
          IF ( T_AUFM_SM-BWART = '321' ) OR ( T_AUFM_SM-BWART = '322' )
          OR ( T_AUFM_SM-BWART = '349' ) OR ( T_AUFM_SM-BWART = '350' ).
            T_OUTPUT-ACH_MATNR = T_AUFM_SM-MATNR.
            CASE T_AUFM_SM-BWART.
              WHEN '350'.
                W_MENGE1 = W_MENGE1 + T_AUFM_SM-ERFMG.
              WHEN '349'.
                W_MENGE1 = W_MENGE1 - T_AUFM_SM-ERFMG.
              WHEN '321'.
                W_MENGE1 = W_MENGE1 + T_AUFM_SM-ERFMG.
              WHEN '322'.
                W_MENGE1 = W_MENGE1 - T_AUFM_SM-ERFMG.
            ENDCASE.
          ENDIF.
    Achieved Material Description
          READ TABLE T_MAKT WITH KEY MATNR = T_OUTPUT-ACH_MATNR
              BINARY SEARCH TRANSPORTING MAKTX.
          IF SY-SUBRC = 0.
            T_OUTPUT-ACH_MAKTX = T_MAKT-MAKTX.
          ENDIF.
        ENDLOOP.
        T_OUTPUT-ACH_QTY = W_MENGE1 / 2.
    Tap time
        READ TABLE T_LPCACT WITH KEY CHARG = T_LPCHD-CHARGE.
        IF SY-SUBRC = 0.
          T_OUTPUT-TAP_TIME = T_LPCACT-PROD_TIME_START.
        ENDIF.
    Arising material
        READ TABLE T_AUFM_SM_AR WITH KEY AUFNR = T_LPCHD-AUFNR
                                      CHARG = T_LPCHD-CHARGE
                                      BWART = '531'.
        IF SY-SUBRC = 0.
          T_OUTPUT1-AUFNR  = T_AUFM_SM_AR-AUFNR.
          T_OUTPUT1-CHARG  = T_AUFM_SM_AR-CHARG.
          IF T_AUFM_SM_AR-ERFMG >= 10.
            T_OUTPUT1-MATNR_ARS = T_AUFM_SM_AR-MATNR.
            T_OUTPUT1-ARS_QTY = T_AUFM_SM_AR-ERFMG.
            READ TABLE T_MAKT WITH KEY MATNR = T_OUTPUT1-MATNR_ARS
                           BINARY SEARCH TRANSPORTING MAKTX.
            IF SY-SUBRC = 0.
              T_OUTPUT1-MAKTX_ARS = T_MAKT-MAKTX.
            ENDIF.
            APPEND  T_OUTPUT1.
          ENDIF.
        ENDIF.
        PERFORM GET_VALUES_INSP USING 'C_LSA' T_LPCHD-PRUEFLOS
                               CHANGING T_OUTPUT-CAR.
        PERFORM GET_VALUES_INSP USING 'SI_LSA' T_LPCHD-PRUEFLOS
                           CHANGING T_OUTPUT-SI.
        PERFORM GET_VALUES_INSP USING 'MN_LSA' T_LPCHD-PRUEFLOS
                           CHANGING T_OUTPUT-MN.
        PERFORM GET_VALUES_INSP USING 'S_LSA' T_LPCHD-PRUEFLOS
                           CHANGING T_OUTPUT-SUL.
        PERFORM GET_VALUES_INSP USING 'P_LSA' T_LPCHD-PRUEFLOS
                           CHANGING T_OUTPUT-PHO.
        PERFORM GET_VALUES_INSP USING 'AL_LSA' T_LPCHD-PRUEFLOS
                          CHANGING T_OUTPUT-AL.
        PERFORM GET_VALUES_INSP USING 'TI_LSA' T_LPCHD-PRUEFLOS
                          CHANGING T_OUTPUT-TI.
        PERFORM GET_VALUES_INSP USING 'CR_LSA' T_LPCHD-PRUEFLOS
                          CHANGING T_OUTPUT-CR.
        PERFORM GET_VALUES_INSP USING 'NI_LSA' T_LPCHD-PRUEFLOS
                          CHANGING T_OUTPUT-NI.
        PERFORM GET_VALUES_INSP USING 'MO_LSA' T_LPCHD-PRUEFLOS
                          CHANGING T_OUTPUT-MO.
        PERFORM GET_VALUES_INSP USING 'V_LSA' T_LPCHD-PRUEFLOS
                          CHANGING T_OUTPUT-V.
        PERFORM GET_VALUES_INSP USING 'CU_LSA' T_LPCHD-PRUEFLOS
                          CHANGING T_OUTPUT-CU.
        IF T_OUTPUT-CAR = ' ' AND
           T_OUTPUT-SI  = ' ' AND
           T_OUTPUT-MN  = ' ' AND
           T_OUTPUT-SUL = ' ' AND
           T_OUTPUT-PHO = ' ' AND
           T_OUTPUT-AL  = ' ' AND
           T_OUTPUT-TI  = ' ' AND
           T_OUTPUT-CR  = ' ' AND
           T_OUTPUT-NI  = ' ' AND
           T_OUTPUT-MO  = ' ' AND
           T_OUTPUT-V   = ' ' AND
           T_OUTPUT-CU  = ' ' .
          PERFORM GET_VALUES_INSP USING 'C_TPA' T_LPCHD-PRUEFLOS
                                     CHANGING T_OUTPUT-CAR.
          PERFORM GET_VALUES_INSP USING 'SI_TPA' T_LPCHD-PRUEFLOS
                             CHANGING T_OUTPUT-SI.
          PERFORM GET_VALUES_INSP USING 'MN_TPA' T_LPCHD-PRUEFLOS
                             CHANGING T_OUTPUT-MN.
          PERFORM GET_VALUES_INSP USING 'S_TPA' T_LPCHD-PRUEFLOS
                             CHANGING T_OUTPUT-SUL.
          PERFORM GET_VALUES_INSP USING 'P_TPA' T_LPCHD-PRUEFLOS
                             CHANGING T_OUTPUT-PHO.
          PERFORM GET_VALUES_INSP USING 'AL_TPA' T_LPCHD-PRUEFLOS
                            CHANGING T_OUTPUT-AL.
          PERFORM GET_VALUES_INSP USING 'TI_TPA' T_LPCHD-PRUEFLOS
                            CHANGING T_OUTPUT-TI.
          PERFORM GET_VALUES_INSP USING 'CR_TPA' T_LPCHD-PRUEFLOS
                            CHANGING T_OUTPUT-CR.
          PERFORM GET_VALUES_INSP USING 'NI_TPA' T_LPCHD-PRUEFLOS
                            CHANGING T_OUTPUT-NI.
          PERFORM GET_VALUES_INSP USING 'MO_TPA' T_LPCHD-PRUEFLOS
                            CHANGING T_OUTPUT-MO.
          PERFORM GET_VALUES_INSP USING 'V_TPA' T_LPCHD-PRUEFLOS
                            CHANGING T_OUTPUT-V.
          PERFORM GET_VALUES_INSP USING 'CU_TPA' T_LPCHD-PRUEFLOS
                            CHANGING T_OUTPUT-CU.
        ENDIF.
        IF NOT T_OUTPUT-AIM_QTY IS INITIAL.
          T_OUTPUT-PERCEN = ( T_OUTPUT-ACH_QTY / T_OUTPUT-AIM_QTY ) * 100.
        ENDIF.
        APPEND T_OUTPUT.
        CLEAR T_OUTPUT.
      ENDLOOP.
      FREE_TABLE T_LPCHD.
      FREE_TABLE T_AUFM_SM.
      FREE_TABLE T_MAKT.
      FREE_TABLE T_LPCACT.
      FREE_TABLE T_AUFM_SM_AR.
      SORT T_OUTPUT1.
      DELETE ADJACENT DUPLICATES FROM T_OUTPUT1 COMPARING ALL FIELDS.
    ENDFORM.                    " FORMAT_DATA
    *&      Form  GET_DATA_LPCHD                                           *
    FORM GET_DATA_LPCHD.
      SELECT TIMESTAMP
             CHARGE
             PCODE_AIM
             MATNR_AIM
             AUFNR
             ROUTECODE
             BUDAT
             QUANTITY
             PRUEFLOS
             NO_OF_PIECES
             INTO TABLE T_LPCHD
           FROM YMPCT_PP03_LPCHD
           WHERE WERKS = '025'
            AND  BUDAT IN P_BUDAT.
           AND  matnr_aim IN s_matnr
           AND  routecode IN s_rtcode
           AND  CHARGE IN S_CHARG.
      IF T_LPCHD[] IS INITIAL.
       MESSAGE s333(s1) WITH 'No data selected'.
        LEAVE LIST-PROCESSING.
      ENDIF.
    Filling t_matnr for fetching material description in one shot
      LOOP AT T_LPCHD.
        W_TABIX = SY-TABIX.
        T_MATNR-MATNR = T_LPCHD-MATNR_AIM.
        APPEND T_MATNR.
       PERFORM convert_alpha_input CHANGING t_lpchd-aufnr.
        IF T_LPCHD-PCODE_AIM = 'LIQ'.
          MOVE-CORRESPONDING T_LPCHD TO T_LPCHD1.
          APPEND T_LPCHD1.
          DELETE T_LPCHD INDEX W_TABIX.
          CONTINUE.
        ENDIF.
        MODIFY T_LPCHD INDEX W_TABIX TRANSPORTING AUFNR.
      ENDLOOP.
      IF T_LPCHD[] IS INITIAL.
       MESSAGE s333(s1) WITH 'No data selected'.
        LEAVE LIST-PROCESSING.
      ENDIF.
      LOOP AT T_LPCHD1.
        READ TABLE T_LPCHD WITH KEY CHARGE = T_LPCHD1-CHARGE.
        IF SY-SUBRC <> 0.
          DELETE  T_LPCHD1.
        ENDIF.
      ENDLOOP.
      SORT T_LPCHD1 BY AUFNR CHARGE.
    ENDFORM.                    " GET_DATA_LPCHD
    *&      Form  GET_DATA_AUFM                                            *
    FORM GET_DATA_AUFM.
      DATA: L_AUFM LIKE T_AUFM_SM OCCURS 0 WITH HEADER LINE,
            L_TABIX LIKE SY-TABIX,
            L_QTY LIKE AUFM-ERFMG.
      SELECT MBLNR
             MJAHR
             ZEILE
             BWART
             MATNR
             CHARG
             ERFMG
             AUFNR
             INTO TABLE T_AUFM
          FROM AUFM
          FOR ALL ENTRIES IN T_LPCHD
          WHERE AUFNR = T_LPCHD-AUFNR
            AND  CHARG = T_LPCHD-CHARGE
           AND  BWART IN ('101','102','122','531','532','321','322','349',
                           '350').
      LOOP AT T_AUFM.
        T_MATNR-MATNR = T_AUFM-MATNR.
        APPEND T_MATNR.
        MOVE-CORRESPONDING T_AUFM TO T_AUFM_SM.
        IF T_AUFM-BWART = '102'.
          T_AUFM_SM-ERFMG = T_AUFM_SM-ERFMG * -1.
          T_AUFM_SM-BWART = '101'.
        ENDIF.
        IF T_AUFM-BWART = '532'.
          T_AUFM_SM-ERFMG = T_AUFM_SM-ERFMG * -1.
          T_AUFM_SM-BWART = '531'.
        ENDIF.
        COLLECT T_AUFM_SM.
      ENDLOOP.
      LOOP AT T_AUFM_SM WHERE BWART = '531'.
        MOVE-CORRESPONDING T_AUFM_SM TO L_AUFM.
        APPEND L_AUFM.
      ENDLOOP.
      SORT L_AUFM BY AUFNR CHARG ERFMG DESCENDING.
      LOOP AT L_AUFM.
        ON CHANGE OF L_AUFM-AUFNR OR L_AUFM-CHARG.
          MOVE-CORRESPONDING L_AUFM TO T_AUFM_SM_AR.
          APPEND T_AUFM_SM_AR.
        ENDON.
      ENDLOOP.
      SORT T_AUFM_SM BY AUFNR CHARG BWART.
      SORT T_AUFM_SM_AR BY AUFNR CHARG BWART.
      FREE_TABLE T_AUFM.
    ENDFORM.                    " GET_DATA_AUFM
    *&      Form  GET_MATERIAL_DESC                                        *
    FORM GET_MATERIAL_DESC.
      DELETE ADJACENT DUPLICATES FROM T_MATNR COMPARING MATNR.
      T_MATNR-SPRAS = SY-LANGU.
      MODIFY T_MATNR TRANSPORTING SPRAS WHERE SPRAS EQ SPACE.
    Fetch material description into t_makt.
      SELECT MATNR
             MAKTX
             INTO TABLE T_MAKT
      FROM MAKT
      FOR ALL ENTRIES IN T_MATNR
      WHERE MATNR = T_MATNR-MATNR
        AND SPRAS = T_MATNR-SPRAS.
      SORT T_MAKT BY MATNR.
      FREE_TABLE T_MATNR.
    ENDFORM.                    " GET_MATERIAL_DESC
    *&      Form  GET_INSPECTION_VALS                                      *
    FORM GET_INSPECTION_VALS.
    To fetch the quantiy of mn si etc
      SELECT QALS~PRUEFLOS
             PLMK~MERKNR
             PLMK~VERWMERKM
             QAMR~MITTELWERT
            INTO TABLE T_QALS
        FROM QALS INNER JOIN PLMK  ON
           QALSPLNTY = PLMKPLNTY AND
           QALSPLNNR = PLMKPLNNR AND
           QALSZAEHL = PLMKPLNKN
         INNER JOIN QAMR
         ON QAMRPRUEFLOS = QALSPRUEFLOS AND
            QAMRMERKNR = PLMKMERKNR
        FOR ALL ENTRIES IN T_LPCHD
        WHERE QALS~PRUEFLOS = T_LPCHD-PRUEFLOS
          AND QALS~STAT35 = 'X'.
      LOOP AT T_QALS.
        WRITE T_QALS-MITTELWERT TO T_QALS-VALUE EXPONENT 0.
        MODIFY T_QALS INDEX SY-TABIX TRANSPORTING VALUE.
      ENDLOOP.
    ENDFORM.                    " GET_INSPECTION_VALS
    *&      Form  GET_ACTIVITY_DTLS                                        *
    FORM GET_ACTIVITY_DTLS.
      DATA: L_TABIX LIKE SY-TABIX.
      SELECT TIMESTAMP
             AUFNR
             PROD_TIME_START
             INTO TABLE T_LPCACT
             FROM YMPCT_PP03LPCACT
             FOR ALL ENTRIES IN T_LPCHD1
             WHERE AUFNR = T_LPCHD1-AUFNR
             AND ARBPL = 'LD1_VSL'.
      LOOP AT T_LPCACT.
        L_TABIX = SY-TABIX.
        READ TABLE T_LPCHD1 WITH KEY AUFNR = T_LPCACT-AUFNR.
        IF SY-SUBRC = 0.
          T_LPCACT-CHARG = T_LPCHD1-CHARGE.
        ENDIF.
       PERFORM convert_alpha_input CHANGING t_lpcact-aufnr.
        MODIFY T_LPCACT INDEX L_TABIX TRANSPORTING AUFNR CHARG.
      ENDLOOP.
      SORT T_LPCACT BY AUFNR.
    ENDFORM.                    " GET_ACTIVITY_DTLS
    *&      Form  GET_VALUES_INSP                                          *
    FORM GET_VALUES_INSP USING    VALUE(P_0503)
                                  VALUE(P_LOT)
                         CHANGING P_VALUE.
      READ TABLE T_QALS WITH KEY PRUEFLOS = P_LOT
                                 VERWMERKM = P_0503.
      IF SY-SUBRC = 0.
        P_VALUE = T_QALS-VALUE.
      ENDIF.
    ENDFORM.                    " GET_VALUES_INSP
    *&      Form  WRITE_DATA                                               *
    FORM WRITE_DATA.
      SORT T_OUTPUT BY  BUDAT CHARG.
      DELETE ADJACENT DUPLICATES FROM T_OUTPUT COMPARING CHARG.
      FORMAT COLOR COL_NORMAL INTENSIFIED OFF.
      T_OUTPUT2-CHARG  = 'Cast No'.
      T_OUTPUT2-BUDAT = 'PostingDt'.
      T_OUTPUT2-CAR = 'Carbon'.
      T_OUTPUT2-MN = 'mn'.
      T_OUTPUT2-SUL = 'S'.
      T_OUTPUT2-PHO = 'P'.
      T_OUTPUT2-SI = 'Si'.
      T_OUTPUT2-AL = 'Al'.
      T_OUTPUT2-TI = 'Ti'.
      T_OUTPUT2-CR = 'Cr'.
      T_OUTPUT2-NI = 'Ni'.
      T_OUTPUT2-MO = 'Mo'.
      T_OUTPUT2-V  = 'V'.
      T_OUTPUT2-CU = 'Cu'.
      T_OUTPUT2-MATNR_AIM = 'Aim Material'.
      T_OUTPUT2-MAKTX_AIM = 'Aim Material Desc'.
      T_OUTPUT2-ACH_MATNR = 'Ach Material'.
      T_OUTPUT2-ACH_MAKTX = 'Ach Material Desc'.
      T_OUTPUT2-ACH_QTY =  'Ach Qty'.
      T_OUTPUT2-TAP_TIME = 'Tppg Time'.
      T_OUTPUT2-AIM_QTY = 'Aim Quantity'.
      T_OUTPUT2-ROUTE  = 'Route'.
         matnr_ars LIKE aufm-matnr,
         maktx_ars LIKE makt-maktx,
         ars_qty LIKE aufm-erfmg,
      T_OUTPUT2-NO_PCS = 'No of Pcs'.
      T_OUTPUT2-PERCEN = '% Ach'.
      T_OUTPUT2-PENDING = 'Pending'.
      APPEND T_OUTPUT2.
    **added by vinati on 020902
      LOOP AT T_OUTPUT.
        L_TABIX = SY-TABIX.
        PERFORM PENDING_DECS  USING T_OUTPUT-MATNR_AIM
                                         T_OUTPUT-CHARG
                               CHANGING T_OUTPUT-CINSM .
        MODIFY T_OUTPUT INDEX L_TABIX TRANSPORTING CINSM.
        IF T_OUTPUT-CINSM > 0.
          T_OUTPUT-PENDING = 'P'.
        ENDIF.
        MODIFY T_OUTPUT TRANSPORTING CINSM PENDING.
      ENDLOOP.
      LOOP AT T_OUTPUT.
        T_OUTPUT2-CHARG  = T_OUTPUT-CHARG.
        T_OUTPUT2-BUDAT = T_OUTPUT-BUDAT.
        T_OUTPUT2-CAR = T_OUTPUT-CAR.
        T_OUTPUT2-MN = T_OUTPUT-MN.
        T_OUTPUT2-SUL = T_OUTPUT-SUL.
        T_OUTPUT2-PHO = T_OUTPUT-PHO.
        T_OUTPUT2-SI = T_OUTPUT-SI.
        T_OUTPUT2-AL = T_OUTPUT-AL.
        T_OUTPUT2-TI = T_OUTPUT-TI.
        T_OUTPUT2-CR = T_OUTPUT-CR.
        T_OUTPUT2-NI = T_OUTPUT-NI.
        T_OUTPUT2-MO = T_OUTPUT-MO.
        T_OUTPUT2-V  = T_OUTPUT-V.
        T_OUTPUT2-CU = T_OUTPUT-CU.
        T_OUTPUT2-MATNR_AIM = T_OUTPUT-MATNR_AIM.
        T_OUTPUT2-MAKTX_AIM = T_OUTPUT-MAKTX_AIM.
        T_OUTPUT2-ACH_MATNR = T_OUTPUT-ACH_MATNR.
        T_OUTPUT2-ACH_MAKTX = T_OUTPUT-ACH_MAKTX.
        T_OUTPUT2-ACH_QTY =  T_OUTPUT-ACH_QTY.
        T_OUTPUT2-TAP_TIME = T_OUTPUT-TAP_TIME.
        T_OUTPUT2-AIM_QTY = T_OUTPUT-AIM_QTY.
        T_OUTPUT2-ROUTE  = T_OUTPUT-ROUTE.
         matnr_ars LIKE aufm-matnr,
         maktx_ars LIKE makt-maktx,
         ars_qty LIKE aufm-erfmg,
        T_OUTPUT2-NO_PCS = T_OUTPUT-NO_PCS.
        T_OUTPUT2-PERCEN = T_OUTPUT-PERCEN.
        T_OUTPUT2-PENDING = T_OUTPUT-PENDING.
        APPEND T_OUTPUT2.
      ENDLOOP.
      LOOP AT T_OUTPUT.
      INDEX = SY-TABIX + 1.
        LOOP AT T_OUTPUT1 WHERE AUFNR = T_OUTPUT-AUFNR
                           AND CHARG = T_OUTPUT-CHARG.
          IF T_OUTPUT-ACH_MATNR IS INITIAL
          AND T_OUTPUT-ACH_MAKTX IS INITIAL
          AND T_OUTPUT-ACH_QTY = '0.000'.
          MOVE T_OUTPUT1-MATNR_ARS TO  T_OUTPUT-ACH_MATNR.
          MOVE T_OUTPUT1-MAKTX_ARS TO T_OUTPUT-ACH_MAKTX.
          MOVE T_OUTPUT1-ARS_QTY TO T_OUTPUT-ACH_QTY.
          T_OUTPUT-PERCEN = ( T_OUTPUT-ACH_QTY / T_OUTPUT-AIM_QTY ) * 100.
          MODIFY T_OUTPUT TRANSPORTING ACH_MATNR ACH_MAKTX ACH_QTY PERCEN
                          WHERE AUFNR = T_OUTPUT1-AUFNR
                          AND   CHARG = T_OUTPUT1-CHARG.
           ENDIF.
           IF T_OUTPUT-ACH_MATNR IS NOT INITIAL
          AND T_OUTPUT-ACH_MAKTX IS NOT INITIAL
          AND T_OUTPUT-ACH_QTY NE '0.000'.
          move-corresponding t_output1 to wa.
          MOVE T_OUTPUT1-MATNR_ARS TO  WA-ACH_MATNR.
          MOVE T_OUTPUT1-MAKTX_ARS TO WA-ACH_MAKTX.
          MOVE T_OUTPUT1-ARS_QTY TO WA-ACH_QTY.
          MOVE T_OUTPUT-MATNR_AIM TO WA-MATNR_AIM.
          MOVE T_OUTPUT-MAKTX_AIM TO WA-MAKTX_AIM.
          MOVE T_OUTPUT-AIM_QTY TO WA-AIM_QTY.
          MOVE T_OUTPUT-BUDAT TO WA-BUDAT.
          MOVE T_OUTPUT-TAP_TIME TO WA-TAP_TIME.
          MOVE T_OUTPUT-ROUTE1 TO WA-ROUTE1.
          MOVE T_OUTPUT-CHARG TO WA-CHARG.
          MOVE T_OUTPUT-CAR TO WA-CAR.
          MOVE T_OUTPUT-MN TO WA-MN.
          MOVE T_OUTPUT-SUL TO WA-SUL.
          MOVE T_OUTPUT-PHO TO WA-PHO.
          MOVE T_OUTPUT-SI TO WA-SI.
          T_OUTPUT-PERCEN = ( T_OUTPUT1-ARS_QTY / T_OUTPUT-AIM_QTY ) * 100.
          MOVE T_OUTPUT-PERCEN TO WA-PERCEN.
          MOVE T_OUTPUT-NO_PCS TO WA-NO_PCS.
          MOVE T_OUTPUT-ROUTE TO WA-ROUTE.
          MOVE T_OUTPUT-PENDING TO WA-PENDING.
          MOVE T_OUTPUT-AL TO WA-AL.
          MOVE T_OUTPUT-TI TO WA-TI.
         move t_output-BAL_QTY_VAL to wa-BAL_QTY_VAL.
          MOVE T_OUTPUT-NI TO WA-NI.
          MOVE T_OUTPUT-MO TO WA-MO.
          MOVE T_OUTPUT-V TO WA-V.
          MOVE T_OUTPUT-CU TO WA-CU.
          INSERT WA INTO T_OUTPUT INDEX INDEX.
          ENDIF.
        ENDLOOP.
      ENDLOOP.
    DELETE ADJACENT DUPLICATES FROM T_OUTPUT COMPARING ACH_MATNR ACH_QTY CHARG.
                       Added by Rajesh Kumar Choudhary                                *
    LOOP AT T_OUTPUT.
      SELECT SINGLE PROD_DATE
      INTO  T_OUTPUT-PROD_DATE
      FROM  YMPCT_PP03_LPCHD
      WHERE CHARGE = T_OUTPUT-CHARG.
    IF SY-SUBRC = 0.
      MODIFY T_OUTPUT TRANSPORTING PROD_DATE WHERE CHARG = T_OUTPUT-CHARG.
    ENDIF.
    ENDLOOP.
    PERFORM MOVE_DATAA.                  "--- Moving data from internal table t_output to t_output_in
    PERFORM INST_DATAA.                  "---  Insertin data in customized table YMPCT_PP03_LPCIN.
      IF NOT T_OUTPUT[] IS INITIAL.
      ENDIF.
    ENDFORM.                    " WRITE_DATA
    *&      Form  CONVERT_ALPHA_INPUT                                      *
    FORM CONVERT_ALPHA_INPUT CHANGING P_AUFNR.
      CALL FUNCTION 'CONVERSION_EXIT_ALPHA_INPUT'
        EXPORTING
          INPUT  = P_AUFNR
        IMPORTING
          OUTPUT = P_AUFNR.
    ENDFORM.                    " CONVERT_ALPHA_INPUT
    *&      Form  GET_VALUE                                                *
    FORM GET_VALUE.
      DATA BEGIN OF IT_POV_FIELD OCCURS 0.
              INCLUDE STRUCTURE HELP_VALUE.
      DATA END OF IT_POV_FIELD.
      DATA: BEGIN OF IT_POV_FILL OCCURS 0,
            SAV_VAL(200),
            END OF IT_POV_FILL.
      CLEAR IT_POV_FIELD.
      REFRESH IT_POV_FIELD.
      CLEAR IT_POV_FILL.
      REFRESH IT_POV_FILL.
      IT_POV_FIELD-TABNAME    = 'YMPCT_PP03_LPCHD'.
      IT_POV_FIELD-FIELDNAME  = 'ROUTECODE'.
      IT_POV_FIELD-SELECTFLAG = 'X'.
      APPEND IT_POV_FIELD.
    it_pov_field-tabname =  'ZLCIAPMST'.
    it_pov_field-fieldname = 'BUKRS'.
    it_pov_field-selectflag = ' '.
    APPEND it_pov_field.
      DATA: BEGIN OF IT_INTER OCCURS 0,
            ROUTECODE LIKE YMPCT_PP03_LPCHD-ROUTECODE,
            END OF IT_INTER.
      SELECT ROUTECODE  FROM YMPCT_PP03_LPCHD APPENDING
                            CORRESPONDING FIELDS OF TABLE IT_INTER
              WHERE ROUTECODE IN ('ZBC1','ZBC2','ZPIT','ZB1E','ZBCE').
      SORT IT_INTER BY ROUTECODE.
      DELETE ADJACENT DUPLICATES FROM IT_INTER COMPARING ROUTECODE.
      LOOP AT IT_INTER.
        IT_POV_FILL-SAV_VAL = IT_INTER-ROUTECODE.
        APPEND IT_POV_FILL.
      ENDLOOP.
    ENDFORM.                    " GET_VALUE
    *&      Form  PENDING_DECS                                             *
    FORM PENDING_DECS USING    P_T_OUTPUT-MATNR_AIM
                               P_T_OUTPUT-CHARG
                      CHANGING P_T_OUTPUT-CINSM.
      CLEAR P_T_OUTPUT-CINSM.
      SELECT   SUM( CINSM )  INTO P_T_OUTPUT-CINSM
      FROM MCHB
       WHERE MATNR = P_T_OUTPUT-MATNR_AIM
       AND   WERKS = '025'
       AND   LGORT IN ('L1C1','L1C2','L1PS','R001')
       AND   CHARG = P_T_OUTPUT-CHARG.
    ENDFORM.                    " PENDING_DECS
    *&      Form  move_dataa                                               *
    FORM MOVE_DATAA .
      LOOP AT T_OUTPUT.
        MOVE SY-MANDT TO T_OUTPUT_INA-MANDT.
        MOVE T_OUTPUT-CHARG     TO T_OUTPUT_INA-CHARG.
        MOVE T_OUTPUT-PROD_DATE TO T_OUTPUT_INA-PROD_DATE.
        MOVE T_OUTPUT-ACH_MATNR TO T_OUTPUT_INA-ACH_MATNR.
        MOVE T_OUTPUT-ACH_MAKTX TO T_OUTPUT_INA-ACH_MAKTX.
        MOVE T_OUTPUT-ROUTE1    TO T_OUTPUT_INA-ROUTE1.
        MOVE T_OUTPUT-MATNR_AIM TO T_OUTPUT_INA-MATNR_AIM.
        MOVE T_OUTPUT-MAKTX_AIM TO T_OUTPUT_INA-MAKTX_AIM.
        MOVE T_OUTPUT-AIM_QTY   TO T_OUTPUT_INA-AIM_QTY.
        MOVE T_OUTPUT-ACH_QTY   TO T_OUTPUT_INA-ACH_QTY.
    *move-corresponding t_output  to  t_output_ina.
        APPEND T_OUTPUT_INA.
      ENDLOOP.
    ENDFORM.                    " move_dataa
    *&      Form  inst_dataa                                               *
    FORM INST_DATAA .
      INSERT YMPCT_PP03_LPCIN FROM TABLE T_OUTPUT_INA  ACCEPTING DUPLICATE KEYS.
    ENDFORM.                    " inst_dataa

    Hi,
       Its basically based on the functional spec, every organization will follow its own formats based on that you need to design the TS.
    regards
    dj
    reward for all helpful answers.

  • BW func and Tech specification documents

    Hi guys
    Can any body help me in the preparation of Functional and technical specification documents of data monitoring processess and all.
    If u have any douments please mail me to
    [email protected]
    Thanks
    Mahendra D

    please send any one now
    i need very urgent
    dont avoid pls
    i am waiting

  • Need func/tech specification with report program

    hi experts
    i am a fresher.please help me.i am waiting for ur reply
    <b>can anyone send sample funftional and technical specification with report program for SD and MM modules.
    in any format</b>
    please send now to this my mail id
    my mail id is:   [email protected]    (or)   
                     [email protected]
    thanks in advance.

    please send any one now
    i need very urgent
    dont avoid pls
    i am waiting

  • About tech specification

    15.     how will u develop the tech. spec’s?

    Hi,
       Its basically based on the functional spec, every organization will follow its own formats based on that you need to design the TS.
    regards
    dj
    reward for all helpful answers.

  • How to write the tech specification ?

    hi can any 1 tell me how to write the technical specification when a functional spec is given.
    guys i need a sample spec or format of it . any help is appreciated
    please any one send some reports with code

    Hello Selva
    The first link provided by Vijayendra provides an already quite comprehensive specification. What I like in particular is chapter "1.15 Assumptions".
    I add a similar chapter to my specifications called <b>"Assertions"</b> which I prefer to place more at the beginning of the document. This chapter contains all assertions (mainly provided by the customer) on which the application is based. For example: <i>"The receiver (of certain costs) is either a single cost center or a cost center group but never both"</i> (technically possible in the SAP transaction).
    Within the application I try to document these assertions using checkpoint groups and assertions (more about this in the informative Weblog of Claudia Dangers /people/claudia.dangers/blog/2005/09/07/how-to-instrument-your-abap-code-with-checkpoint-groups).
    Why do I place this chapter on top of the specification? The customer should see this assertions/assumptions quite early in order to find any mistakes.
    Finally, what I have missed in the specification was a chapter <b>"Authorizations".</b>
    Regards
       Uwe

  • Functional Specification doubt

    Hi all,
    In the Functional Specification, which table name am i supposed to provide to the ABAP developer? Is it transperant table name or Database table name ? What is the difference between transperant table and Database table?
    Also there is Selection/Parameter coloumn in the specification for a custom report. What does Selection/Parameter mean?
    Any help is highly appreciated.
    Thanks,
    Avani.

    Hi,
    in the FS it is better to give Data base table name, if not available you can propose the Transparent tables but the major difference you can find out with ABAP.
    the selection parameter means when you execute the report the first initial screen displays for selection for example if you go to any std report like MB51 Mat doc it will ask you to input some thing like material , posting date or plant so thes selection will guide the report to fetch data and show it in the report.
    in general selection parameter are the input parameter for the report.
    hope this helps

  • Apple TV: what are the specific settings I should adjust to?

    Hi, there
    I really need your help now. I use a DVD ripper to rip DVD to MP4 for Apple TV. I am trying to achieve quality that is close to a movie (m4v) from iTunes. What are the best settings to get this type of quality? I am not concerned with output file size, and I just want to get the very best quality I can. If so, what are the specific settings I should adjust to? The program I am using allows me to adjust video and audio parameters as below:
    Video parameters:
    Codec: h.264
    Resolution: 1280*720
    Bit rate: ??? (it is said Up to 5 Mbps, but what is the specific bit rate?)
    Frame rate: 24 fps
    Audio parameters:
    Codec: aac
    Sample rate: ???
    Bit rate: ??? it is said 16 to 320 Kbps, but what’s the specific figure?
    Audio channel: mono, stereo and 5.1 channel, which one should I choose?
    Following are the tech specifications I copied from Apple’s official website:
    Video formats supported
    H.264 and protected H.264 (from iTunes Store): Up to 5 Mbps, Progressive Main Profile (CAVLC) with AAC-LC audio up to 160 Kbps (maximum resolution: 1280 by 720 pixels at 24 fps, 960 by 540 pixels at 30 fps) in .m4v, .mp4, and .mov file formats
    iTunes Store purchased video: 320 by 240 pixels, 640 by 480 pixels, 720 by 480 pixels (anamorphic), or high-definition 720p
    MPEG-4: Up to 3 Mbps, Simple Profile with AAC-LC audio up to 160 Kbps (maximum resolution: 720 by 432 pixels at 30 fps) in .m4v, .mp4, and .mov file formats
    Audio formats supported
    AAC (16 to 320 Kbps); protected AAC (from iTunes Store); MP3 (16 to 320 Kbps); MP3 VBR; Apple Lossless; AIFF; WAV; Dolby Digital 5.1 surround sound pass-through
    And I have selected some parameters according to this, please see the above contents, but there is no info about specific video/audio bit rate, audio sample rate, and audio channel. I just wanna know if I want to watch the movie on my 1920×1080 TV, what are the specific settings I should adjust to?
    Any suggestion is appreciated. Thanks in advance.

    Well, then how about playback Apple TV uncompatible video files? I have some other video files(such as avi, mkv,not DVD), and I also have a video converter, i know i can convert them to m4v, mp4, or mov that supported by ATV,but the thing is that i still don't know the best specific settings for conversion. Any suggestion? Many thanks for your kind reply.

  • Standard BAPI/RFC for customer specific pricing

    Hi all,
    We have a requirement for getting the customer specific pricing for a product. .We have few customers who are privelaged of procuring materials at a lesser price than others.We need a procedure or functionality that will pick this discounted price on the product that is raised by the privelaged customer.
    Please let me know if there is any Standard BAPI or RFC for this requirement
    Keerthi

    Hi,
    There is nothing called customer specific pricing in SAP and there is no BAPI to handle pricing for any specific entity.
    These things need to be configured in access sequence, condition tables, condition types etc and you have to configure  pricing in such a way that the pricing elements are common for everybody but depending on the situation, some customer will get materials for lesser price than others by creating condition records as applicable for each customer.
    You have to first configure the pricing procedure.
    Then while maintaining condition records, you have to maintain prices for specific customers where youcan maintain lesser prices. For all others you can maintain normal prices. For example for c.type PR00, you can have two tables in the access sequence. One table may be Sales org/D.C/Div/Customer/Material and the second table can be S.Org/D.C./Div/Material
    Now maintain a condition record like
    5001/00/00/CUSTOMER A/MATERIAL A  Value is 80
    5001/00/00/Material A  Value is 100
    If condition records are maintained like this, the customer A alone will get the material for Rs.80 while all others will get it for Rs.100
    Hope this helps you. If you have specific doubts, pls lemme know.

  • Hp probook 4535s 16 GB support

    Hi
    I bought today HP probook 4535 with the following configuration
    AMD quad core A6
    16 GB of RAM (upgraded from standard 4)
    Ati Radeon
    750 GB Sata
    Guy from customer support says that this PC in his tech. specifications has support for 16GB but he isn't sure if system will be stable. My question if someone here works for HP or knows information I'm looking for to be polite and tells me if this notebook can support 16GB of RAM. I need alot of RAM for my work and I want to be mobile.
    Thanks for reading
    This question was solved.
    View Solution.

    Then I am in doubt too as the specs from only 2 months ago state max is 8 GB.
    Edit:  Hopefully it will work then.
    I have found other HP pc's where the specs stated max memory was less than supported by the chipset and installing the chipset max worked.
    I have an Elitebook 6910p. Chipset is Mobile Intel 965.  Chipset supports 8 GB (2 x 4 GB) of PC2-5300 memory.
    HP specs state max is 4 GB ( 2 x 2 GB).
    I installed 2 x 4GB of PC2-6400 and it works just great with 8 GB. Memory downclocked to 667 Mhz.
    So, maybe you are in luck too.
    Please post back and let us know if 16 GB works.

  • Interview Questions

    Hy Gurus
    I am new to BW.
    Can u please let me know the answers for the following Qs.
    1.     What is a Data warehouse? List Few Properties of a Data warehouse.
    2. What are the major challenges of any Data Warehouse design?
    3. Data loading issues, Reporting, Production support issues?
    4.     Data Modeling, Info cube, ODS obj creation?
    5.     SAP Batch process in BW side?
    6.     How to schedule the Background jobs in ABAP, & BW?
    7.     Variables in Query? User exit variables? How do u create user exit variable? And wt u have used?
    8.     Structures in Query Reporting? What are structures?
    9.     Transportation steps?
    10.     How to compress the Info cube? What happens when you compress the info cube?
    11.     Performance issues in Reporting? How can you improve the performance of the query?
    12.     Where the ABAP routines are used in BW side?
    13.     How to create Primary index & secondary indexes on ODS?
    14.     How to prevent the duplicate records at the data target level?
    15.     Issues regarding double records?
    16.     Info sets and multiprovider differences?
    17.     Issues faced in Delta loading? Why it happened?
    Enhancements to the Data sources?
    18.     Issues in loading the data from Flat files? Delta load issues? Which will u suggest for flat file loading is it delta or full load?
    19.     How to prevent the Replication Errors? What happens when you replicate the Data Sources?
    20.     Process chain steps? Which process type is used to delete the last request when loading the data?
    21.     What is virtual cube? Characteristics? Its significance?
    22.     Diff. methods for Generic Data Sources?
    23.     What is Extract structure? Where it is used?
    24.     Data Modeling – design issues, Tech specifications, Modeling , Reporting, Testing, Transportation
    25.     Extraction on R/3 side steps?LO’s
    26.     How do you setup LIS?
    27.     SAP Batch process? /.where does u setup batch process?
    28.     Reconstruction tab in Info cube? Why it is used?
    29.     Suppose Info cube (A) having 10 records.
                         We want to take the some records say 4-7 from Info cube (A) --&#61664; Info cube (B).
                How does u handle the situation?
    30.     Suppose ODS contains 5 records and the Info cube shows 12 records. How to solve it?
    31.     Landscape
    32.     Tell me typical BW Team & How u work?
    33.     How to Maintain the Master data at Client –Server architecture?
    34.     Query performance problems? How does u improve the performance?
    35.     How does u improve the Info cube design performance?
    36.     How do you improve the Dimension & fact table performance?
    37.     How to push data from PSA to ODS?
    38.     How to postpone daily load?
    39.     The functions of Administrator Workbench are…
    40.     What is RECORD MODE
    41.     What is partition? How to partition the Info cube & PSA. ?..
    42.     How to filter single records when uploading into an ods object?
    43.     How can u connect a new data target to an existing data flow?
    44.     When it is advantageous to create secondary indexes for ODS field?
    45.     Purpose of setup tables?
    46.     What is Delta mechanism?
    47.     Will u create an infosourse for every data souse? How many infosourse can we connect to a Data Sources?
    48.     What is a Star Schema? What is the Differences between a Classic Star Schema & Extended Star schema.
    49.     What is an Attribute? Difference between Display Attribute & Navigational Attribute?
    50.     What is Transfer Rule? List the methods used in Transfer Rules.
    51.     Why we need ODS? /List a few of the technical settings that can be defined when building/modifying an ODSObject?
    52.     What is ODS? What are the three tables associated with an ODS object? What are the two types of ODS.
    53.     Name the two tables that provide detailed information about data sources.
    54.     What are two data transfer methods? Which is the preferred method and why?
    55.     Where will the development take place?&  Who will do the development testing.
    56.     Who will be responsible for long-term support?
    57.     What is a Slowly Changing Dimension?
    58.     What is namespace for SAP BW?
    59.     What are nine decision points of Data warehouse
    60.     How does u install BW Statistics? How you enable monitoring using BW Statistics.
    61.     How do u rate u r self in Modeling, Reporting & Extraction.
    62.     What are the advantages with LO Extraction.
    63.     What are the steps in General to enhance data?
    64.     What are Phases in ASAP Methodology?
    65.     What is the 90 Day rule?
    66.     What is the demo content use?
    67.     What is the use of RSRAJ Transaction?
    68.     What is the use of RSSU53 Transaction?
    69.     Can u repeat the Master Data Source?
    70.     What is diff. b/w DW and BW?
    71.     Will u use idol methods in BW?
    72.     What does the number in the 'Total' column in Transaction RSA7 mean?
    73.       The extract structure was changed when the Delta Queue was empty. Afterwards new delta records were written to the Delta Queue. When loading the delta into the PSA, it shows that some fields were moved. The same result occurs when the contents of the Delta Queue are listed via the detail display. Why are the data displayed differently? What can be done?
    74.     How and where can you control whether a repeat delta is requested?
    75.     Can I use several clients within SAP BW?
    Thanks in Advance
    murali

    Hi
    I have few questions and answer u can check it out which would be more helpful
    Solution
    Questions and answers.
    Question 1:
    What does the number in the 'Total' column in Transaction RSA7 mean?
    Answer:
    The 'Total' column displays the number of LUWs that were written in the delta queue and that have not yet been confirmed. The number includes the LUWs of the last delta request (for repeating a delta request) and the LUWs for the next delta request. An LUW only disappears from the RSA7 display when it has been transferred to the BW System and a new delta request has been received from the BW System.
    Question 2:
    What is an LUW in the delta queue?
    Answer:
    An LUW from the point of view of the delta queue can be an individual document, a group of documents from a collective run or a whole data packet from an application extractor.
    Question 3:
    Why does the number in the 'Total' column, in the overview screen of Transaction RSA7, differ from the number of data records that are displayed when you call up the detail view?
    Answer:
    The number on the overview screen corresponds to the total number of LUWs (see also question 1) that were written to the qRFC queue and that have not yet been confirmed. The detail screen displays the records contained in the LUWs. Both the records belonging to the previous delta request and the records that do not meet the selection conditions of the preceding delta init requests are filtered out. This means that only the records that are ready for the next delta request are displayed on the detail screen. The detail screen of Transaction RSA7 does not take into account a possibly existing customer exit.
    Question 4:
    Why does Transaction RSA7 still display LUWs on the overview screen after successful delta loading?
    Answer:
    Only when a new delta has been requested does the source system learn that the previous delta was successfully loaded into the BW System. The LUWs of the previous delta may then be confirmed (and also deleted). In the meantime, the LUWs must be kept for a possible delta request repetition. In particular, the number on the overview screen does not change if the first delta is loaded into the BW System.
    Question 5:
    Why are selections not taken into account when the delta queue is filled?
    Answer:
    Filtering according to selections takes place when the system reads from the delta queue. This is necessary for performance reasons.
    Question 6:
    Why is there a DataSource with '0' records in RSA7 if delta exists and has been loaded successfully?
    Answer:
    It is most likely that this is a DataSource that does not send delta data to the BW System via the delta queue but directly via the extractor . You can display the current delta data for these DataSources using TA RSA3 (update mode ='D')
    Question 7:
    Do the entries in Table ROIDOCPRMS have an impact on the performance of the loading procedure from the delta queue?
    Answer:
    The impact is limited. If performance problems are related to the loading process from the delta queue, then refer to the application-specific notes (for example in the CO-PA area, in the logistics cockpit area, and so on).
    Caution: As of PlugIn 2000.2 patch 3, the entries in Table ROIDOCPRMS are as effective for the delta queue as for a full update. Note, however, that LUWs are not split during data loading for consistency reasons. This means that when very large LUWs are written to the delta queue, the actual package size may differ considerably from the MAXSIZE and MAXLINES parameters.
    Question 8:
    Why does it take so long to display the data in the delta queue (for example approximately 2 hours)?
    Answer:
    With PlugIn 2001.1 the display was changed: you are now able to define the amount of data to be displayed, to restrict it, to selectively choose the number of a data record, to make a distinction between the 'actual' delta data and the data intended for repetition, and so on.
    Question 9:
    What is the purpose of the function 'Delete Data and Meta Data in a Queue' in RSA7? What exactly is deleted?
    Answer:
    You should act with extreme caution when you use the delete function in the delta queue. It is comparable to deleting an InitDelta in the BW System and should preferably be executed there. Not only do you delete all data of this DataSource for the affected BW System, but you also lose all the information concerning the delta initialization. Then you can only request new deltas after another delta initialization.
    When you delete the data, this confirms the LUWs kept in the qRFC queue for the corresponding target system. Physical deletion only takes place in the qRFC outbound queue if there are no more references to the LUWs.
    The delete function is intended for example, for cases where the BW System, from which the delta initialization was originally executed, no longer exists or can no longer be accessed.
    Question 10:
    Why does it take so long to delete from the delta queue (for example half a day)?
    Answer:
    Import PlugIn 2000.2 patch 3. With this patch the performance during deletion improves considerably.
    Question 11:
    Why is the delta queue not updated when you start the V3 update in the logistics cockpit area?
    Answer:
    It is most likely that a delta initialization had not yet run or that the the delta initialization was not successful. A successful delta initialization (the corresponding request must have QM status 'green' in the BW System) is a prerequisite for the application data to be written to the delta queue.
    Question 12:
    What is the relationship between RSA7 and the qRFC monitor (Transaction SMQ1)?
    Answer:
    The qRFC monitor basically displays the same data as RSA7. The internal queue name must be used for selection on the initial screen of the qRFC monitor. This is made up of the prefix 'BW, the client and the short name of the DataSource. For DataSources whose name is shorter than 20 characters, the short name corresponds to the name of the DataSource. For DataSources whose name is longer than 19 characters (for delta-capable DataSources only possible as of PlugIn 2001.1) the short name is assigned in Table ROOSSHORTN.
    In the qRFC monitor you cannot distinguish between repeatable and new LUWs. Moreover, the data of a LUW is displayed in an unstructured manner there.
    Question 13:
    Why is there data in the delta queue although the V3 update has not yet been started?
    Answer:
    You posted data in the background. This means that the records are updated directly in the delta queue (RSA7). This happens in particular during automatic goods receipt posting (MRRS). There is no duplicate transfer of records to the BW system. See Note 417189.
    Question 14:
    Why does the 'Repeatable' button on the RSA7 data details screen not only show data loaded into BW during the last delta but also newly-added data, in other words, 'pure' delta records?
    Answer:
    It was programmed so that the request in repeat mode fetches both actually repeatable (old) data and new data from the source system.
    Question 15:
    I loaded several delta inits with various selections. For which one
    is the delta loaded?
    Answer:
    For delta, all selections made via delta inits are summed up. This
    means a delta for the 'total' of all delta initializations is loaded.
    Question 16:
    How many selections for delta inits are possible in the system?
    Answer:
    With simple selections (intervals without complicated join conditions or single values), you can make up to about 100 delta inits. It should not be more.
    With complicated selection conditions, it should be only up to 10-20 delta inits.
    Reason: With many selection conditions that are joined in a complicated way, too many 'where' lines are generated in the generated ABAP source code which may exceed the memory limit.
    Question 17:
    I intend to copy the source system, i.e. make a client copy. What will happen with may delta? Should I initialize again after that?
    Answer:
    Before you copy a source client or source system, make sure that your deltas have been fetched from the delta queue into BW and that no delta is pending. After the client copy, an inconsistency might occur between BW delta tables and the OLTP delta tables as described in Note 405943. After the client copy, Table ROOSPRMSC will probably be empty in the OLTP since this table is client-independent. After the system copy, the table will contain the entries with the old logical system name which are no longer useful for further delta loading from the new logical system. The delta must be initialized in any case since delta depends on both the BW system and the source system. Even if no dump 'MESSAGE_TYPE_X' occurs in BW when editing or creating an InfoPackage, you should expect that the delta has to be initialized after the copy.
    Question 18.
    Am I permitted to use the functions in Transaction SMQ1 to manually control processes?
    Answer:
    Use SMQ1 as an instrument for diagnosis and control only. Make changes to BW queues only after informing BW Support or only if this is explicitly requested in a note for Component 'BC-BW' or 'BW-WHM-SAPI'.
    Question 19.
    Despite the delta request only being started after completion of the collective run (V3 update), it does not contain all documents. Only another delta request loads the missing documents into BW. What is the cause for this "splitting"?
    Answer:
    The collective run submits the open V2 documents to the task handler for processing. The task handler processes them in one or several parallel update processes in an asynchronous way. For this reason, plan a sufficiently large "safety time window" between the end of the collective run in the source system and the start of the delta request in BW. An alternative solution where this problem does not occur is described in Note 505700.
    Question 20.
    Despite deleting the delta init, LUWs are still written into the DeltaQueue
    Answer:
    In general, delta initializations and deletions of delta inits should always be carried out at a time when no posting takes place. Otherwise, buffer problems may occur: If you started the internal mode at a time when the delta initialization was still active, you post data into the queue even though the initialization had been deleted in the meantime. This is the case in your system.
    Question 21.
    In SMQ1 (qRFC Monitor) I have status 'NOSEND'. In the Table TRFCQOUT, some entries have the status 'READY', others 'RECORDED'. ARFCSSTATE is 'READ'. What do these statuses mean? Which values in the field 'Status' mean what and which values are correct and which are alarming? Are the statuses BW-specific or generally valid in qRFC?
    Answer:
    Table TRFCQOUT and ARFCSSTATE: Status READ means that the record was read once either in a delta request or in a repetition of the delta request. However, this still does not mean that the record has successfully reached the BW. The status READY in the TRFCQOUT and RECORDED in the ARFCSSTATE means that the record has been written into the delta queue and will be loaded into the BW with the next delta request or a repetition of a delta. In any case only the statuses READ, READY and RECORDED in both tables are considered to be valid. The status EXECUTED in TRFCQOUT can occur temporarily. It is set before starting a delta extraction for all records with status READ present at that time. The records with status EXECUTED are usually deleted from the queue in packages within a delta request directly after setting the status before extracting a new delta. If you see such records, it means that either a process which confirms and deletes records loaded into the BW is successfully running at the moment, or, if the records remain in the table for a longer period of time with status EXECUTED, it is likely that there are problems with deleting the records which have already been successfully been loaded into the BW. In this state, no more deltas are loaded into the BW. Every other status indicates an error or an inconsistency. NOSEND in SMQ1 means nothing (see note 378903). However the value 'U' in field 'NOSEND' of table TRFCQOUT is of concern.
    Question 22.
    The extract structure was changed when the delta queue was empty. Afterwards new delta records were written to the delta queue. When loading the delta into the PSA, it shows that some fields were moved. The same result occurs when the contents of the delta queue are listed via the detail display. Why is the data displayed differently? What can be done?
    Answer:
    Make sure that the change of the extract structure is also reflected in the database and that all servers are synchronized. We recommend resetting the buffers using Transaction $SYNC. If the extract structure change is not communicated synchronously to the server where delta records are being created, the records are written with the old structure until the new structure has been generated. This may have disastrous consequences for the delta. When the problem occurs, the delta needs to be re-initialized.
    Question 23. How and where can I control whether a repeat delta is requested?
    Answer:
    Via the status of the last delta in the BW Request Monitor. If the request is RED, the next load will be of type 'Repeat'. If you need to repeat the last load for any reason, manually set the request in the monitor to red. For the contents of the repeat, see Question 14. Delta requests set to red when data is already updated lead to duplicate records in a subsequent repeat, if they have not already been deleted from the data targets concerned.
    Question 24.
    As of PI 2003.1, the Logistic Cockpit offers various types of update methods. Which update method is recommended in logistics? According to which criteria should the decision be made? How can I choose an update method in logistics?
    Answer:
    See the recommendation in Note 505700.
    Question 25.
    Are there particular recommendations regarding the maximum data volume of the delta queue to avoid danger of a read failure due to memory problems?
    Answer:
    There is no strict limit (except for the restricted number area of the 24-digit QCOUNT counter in the LUW management table - which is of no practical importance, however - or the restrictions regarding the volume and number of records in a database table).
    When estimating "soft" limits, both the number of LUWs and the average data volume per LUW are important. As a rule, we recommend bundling data (usually documents) as soon as you write to the delta queue to keep number of LUWs low (this can partly be set in the applications, for example in the Logistics Cockpit). The data volume of a single LUW should not be much larger than 10% of the memory available to the work process for data extraction (in a 32-bit architecture with a memory volume of about 1 GByte per work process, 100 MByte per LUW should not be exceeded). This limit is of rather small practical importance as well since a comparable limit already applies when writing to the delta queue. If the limit is observed, correct reading is guaranteed in most cases.
    If the number of LUWs cannot be reduced by bundling application transactions, you should at least make sure that the data is fetched from all connected BWs as quickly as possible. But for other, BW-specific, reasons, the frequency should not exceed one delta request per hour.
    To avoid memory problems, a program-internal limit ensures that no more than 1 million LUWs are ever read and fetched from the database per delta request. If this limit is reached within a request, the delta queue must be emptied by several successive delta requests. We recommend, however, to try not to reach that limit but trigger the fetching of data from the connected BWs as soon as the number of LUWs reaches a 5-digit value.
      THANKS =POINTS in SDN
    SANJEEV

  • Add Button to ALV Grid

    I made my first attempt to use OO programing in ABAP and created an ALV Grid using CL_GUI_ALV_GRID.  I have excluded toolbar buttons without a problem, but now I would like to add a button and code my own reaction to its ok_code.  Can anyone tell me how to do this? Please keep in mind I am very new to ABAP Objects.

    Hi Jason,
    Have you had a look at the example program BCALV_GRID_05 ?
    The program demonstrates exactly what you are intending to do.
    Please get back with any specific doubts you may encounter.
    Regards,
    Anand MAndalika.

  • New Ipod nano not working with my Windows 2000

    I have just bought an ipod nano 8GB, and tried to install it. The latest itunes I can put on my computer is 7.3.2 as it is a Windows 2000 not an XP. Unfortunately the nano is saying it needs 7.4 and above. can anyone help please?

    I wish you would have asked or checked on the tech specifications for the Nano prior to purchase. These are the required tech specs, copied directly from the Nano page. I'm sorry there's nothing you can do.
    # PC with USB 2.0 port
    # Windows Vista or Windows XP Home or Professional with Service Pack 2 or later
    # iTunes 7.6 or later

  • Settle Production Variances to COPA- Cost elements and Value fields

    Dear All,
    I know this question has been discussed in the past, but I have one specific doubt regarding this topic.:
    When assigning cost elements to variance categories in t-code KEI1, how do we figure out what combination of cost elements (in the top half of the screen) constitute Input Price Variance, Scrap variance etc (in the bottom half of the screen)? I know the net of the postings on those cost elements tells us what variances we are looking it, but how do we get the cost elements (group) for let's say, 'Input/Output Quanity Varinace or 'Lot size Variance' ?
    Or is this a futile exercise? May be I should just create three types of variances: Labor, Machine and Overhead. And I know what cost elements (net of the postings) would, in total, make up the $ variance in each of those categories. I can then use them in my report painter reports.
    Please help clear the fog for me.
    Ajay?
    Thanks a lot,
    Deepak

    Hi Deepak,
    Welcome to SDN!!
    There are 2 ways of updating variances in COPA... I Prefer the 2nd option always...
    1. Category wise variances (Input Prc, Usage var, etc) - Here, create a Cost ele group, where in you include all the Cost elements that can be posted to the Prod orders
    For the sake of simplicity, you can include Cost elements 1 to 99999999 in the Cost element group...
    2. Cost Comp Structure wise variances -
    a. Create as many assignment lines in PA Trf Structure as in your Cost Comp Str...
    Eg: If your Cost Comp Str in OKTZ has Raw Mat, Labor, Overhead - Create 3 Assignments in PA Trf Structure..
    b. Assign the same cost elements in the SOURCE as in the Cost Comp Str
    c. Choose the radio button "Costs/Revenues" in your assignment line, instead of " Variance on Production orders"
    d. Assign each Assignment line to a separate Value Field
    br, Ajay M

  • Creation of products / materials in CRM

    Dear all,
    I'm starting to work on CRM 2007, and I want to create some products.
    I'm using transaction COMMPR01, but nothing exists and I got this message: No basis hierarchy for product type 02 (Services).
    I don't know what to do and where to start for this creation of products. Everything seems to be linked to categories, hierarchies or attributes...I looked in customizing, but I didn't found anything...
    Thanks for your help.
    Kind regards,
    Gregory

    Hello Gregory,
    If you CRM is integrated to R/3,then make sure that you get the hierarchies from R/3.You can do this by downloading the
    customizing objects DNL_CUST_PROD0 and  and DNL_CUST_PROD1.
    Alternatively,you can maintain this in SPRO of CRM as well,but it would be tedious.
    If your CRM is not connected to R/3,then you can create hierarchies and categories in CRM using txn:COMM_HIERARCHY.
    Also,make sure that you assign set-types to categories.
    Also,please note that you assign categories to product and accordinly you need to assign set-type to categoryies so that
    you can use these set-types in your product.
    If all these conditons are met,then you can go ahead with product creation in txn:COMMPR01.
    Let me know if you have any specific doubts in customizing.
    Hope this helps!
    Regards,
    Shanthala Kudva.

Maybe you are looking for

  • 2005 Help center is it complete or is it the wrong file..?

    Ihave just downloaded the 2005 sdk help Center to get some information abou the UserQueries Object and the downloaded file (b1_sdk.zip) starts off with the homepage titled 'SAP Business One SDK 2004' !! and no ref at all to the UserQueries Object. so

  • Ipad suddenly stopped working

    ipad suddenly will not turn on.  Is there a way to restart it?  It is fully charged

  • Problems with iPhoto sort of events.

    In PC talk, I often nest folders within folders to better differentiate my images.  The lowest level of folder becomes an iPhoto event.  After loading into iPhoto, a sort of events includes all events independent of the next layer of folders not the

  • Caml query to check current logged in user - SharePoint designer

    Hi, I need to create a caml query in SharePoint designer to satisfy the below conditions. If the logged in user (current user) is a member of a specific group. e.g. Group Name = ISS Owners, ID=5 (OR) If the logged in user (current user) exists in ass

  • Why does my Illustrator CS6(Not Cloud) Keep crashing

    It was working perectly fine today and now it crashes when I try to work on a file. I dont have maveriks I stil have mountain lion. What should I do?