AE error fix

When will a fix be released for the error message internal verification failure, sorry! {unexpected match name searched for in group} (29 :: 0)?

What version of AE and What OS? I'm not getting any errors with the latest builds of CC, CC 2014 or CS6 on OSX 10.9.5 with the most of Red Giant, Tapcode, Magic Bullet, Digi Effects, and about 40 other plug-ins installed using footage from a half dozen professional cameras, iPhones, GoPro's and Canon and Sony DSLR's. Without knowing exactly what you are doing and what you are using when you do it it's impossible for us to guess what is going wrong. The only guess I can intelligently give is that you are using the old version of Unmult, which will produce this error. Follow Mylenium's link and read the known issues. I am not getting this error because I downloaded the new Unmult from Red Giant.

Similar Messages

  • Urgent plz help me.error fixing--full marks given

    Hi..this is regarding error fixing for prgm below in ecc 6.0
    *& Report  ZCLEAREM
    REPORT  ZCLEAREM.
    TABLES: LFA1, LFB1, BSIK.
    PARAMETERS: CLRDATE LIKE BSIK-AUGDT.
    SELECT-OPTIONS:  ALLOCATE FOR BSIK-ZUONR,
                     CLIENT   FOR BSIK-MANDT.
    DATA:  BEGIN OF CLEARING OCCURS 3000,
           LIFNR  LIKE BSIK-LIFNR,
           BUKRS  LIKE BSIK-BUKRS,
           BUDAT  LIKE BSIK-BUDAT,
           ZUONR  LIKE BSIK-ZUONR.
    DATA:  END OF CLEARING.
    DATA: SESSION(12) VALUE 'CLEARVENDORS'.
    DATA: BEGIN OF BDC_TAB OCCURS 10.
            INCLUDE STRUCTURE BDCDATA.
    DATA: END OF BDC_TAB.
    DATA: FROM_DATE(10), TO_DATE(10), COMPANY_CODE LIKE KOST1-BUKRS.
    DATA: CTR(4) TYPE N VALUE 0, HOLD_LIFNR LIKE BSIK-LIFNR.
    DATA: HOLD_BUKRS LIKE BSIK-BUKRS.
    CALL FUNCTION 'BDC_OPEN_GROUP'
         EXPORTING
              CLIENT   = SY-MANDT
              GROUP    = SESSION
              HOLDDATE = '07/01/96'
              USER     = SY-UNAME
              KEEP     = 'X'.
    CONCATENATE: CLRDATE4(2) '/' CLRDATE6(2) '/'
      CLRDATE+0(4) INTO FROM_DATE.
    WRITE : / 'CLEARING DATE USED IS ', CLRDATE.
    START-OF-SELECTION.
    GET BSIK LATE.
      CHECK CLIENT.
      CHECK ALLOCATE.
      IF ( BSIK-QSSHB GT 0 ) AND ( BSIK-AUGBL EQ '          ' ).
        MOVE-CORRESPONDING BSIK TO CLEARING.
        APPEND CLEARING.
      ENDIF.
    END-OF-SELECTION.
      WRITE : / 'SELECTED ', CTR, ' RECORDS FOR CLEARING...'.
      SORT CLEARING BY LIFNR BUKRS BUDAT.
      DELETE ADJACENT DUPLICATES FROM CLEARING COMPARING LIFNR BUKRS.
      LOOP AT CLEARING.
        WRITE : / CLEARING-LIFNR, ' ', CLEARING-BUKRS, ' CLEARED. '.
        PERFORM GENERATE_BDC_DATA.
        CTR = CTR + 1.
        CALL FUNCTION 'BDC_INSERT'
             EXPORTING
                  TCODE     = 'F-44'
             TABLES
                  DYNPROTAB = BDC_TAB.
      ENDLOOP.
      CALL FUNCTION 'BDC_CLOSE_GROUP'.
      WRITE: /'end of generation of bdc session - ', SESSION, SY-MANDT,
             SY-UNAME, SY-UZEIT.
      WRITE: / 'WILL CLEAR A TOTAL OF ', CTR, ' RECORDS.'.
          FORM GENERATE_BDC_DATA                                        *
    FORM GENERATE_BDC_DATA.
      REFRESH BDC_TAB.
      PERFORM DYNPRO USING:
           'X' 'SAPMF05A' '0131',
           '' 'RF05A-AGKON' CLEARING-LIFNR,
           '' 'BKPF-BUKRS'  CLEARING-BUKRS,
           '' 'BKPF-BUDAT'  FROM_DATE,
           '' 'RF05A-XPOS1(2)' 'X',
           '' 'BDC_OKCODE' '/16',
           'X' 'SAPMF05A'  '0731',
           '' 'RF05A-SEL01(1)' CLEARING-ZUONR,
           '' 'BDC_OKCODE' '/16',
    LOOP AT
           'X' 'SAPDF05X' '1102',
           ''  'BDC_OKCODE'  'BU'.
    ENDFORM.
          FORM DYNPRO                                                   *
    -->  DYNBEGIN                                                      *
    -->  NAME                                                          *
    -->  VALUE                                                         *
    FORM DYNPRO USING DYNBEGIN NAME VALUE.
      IF DYNBEGIN = 'X'.
        CLEAR BDC_TAB.
        MOVE: NAME TO BDC_TAB-PROGRAM,
        VALUE TO BDC_TAB-DYNPRO,
        'X' TO BDC_TAB-DYNBEGIN.
        APPEND BDC_TAB.
      ELSE.
        CLEAR BDC_TAB.
        MOVE: NAME TO BDC_TAB-FNAM,
            VALUE TO BDC_TAB-FVAL.
        APPEND BDC_TAB.
      ENDIF.
    ENDFORM.

    In abap editor menu path
    Goto-->Attributes
    here in Logical Database name define KDF.
    It will work.
    regards
    shiba dutta

  • Hi all..very urgent..error fixing..full marks wud be given for the answers.

    Hi guys..facing problem in error fixing.in bdc...prgm is in ECC 6.0..
    prgm is
    *& Report  ZCJI_CNV_POSTGOODSRECEIPT_ALT1
    REPORT  ZCJI_CNV_POSTGOODSRECEIPT_ALT1.
    *REPORT ZCJI_CNV_POSTGOODSRECEIPT_ALT NO STANDARD PAGE HEADING
                      LINE-SIZE 255.
    *Program:  ZCJI_CNV_POSTGOODSRECEIPT_ALT                               *
    *Function: This program is used to carry out GR transaction MB0A for
             CJI import logistics purchase orders. The objective is to
             choose only those purchase orders for which billing has been
             carried out already. Once GR document is posted, the status
             of delivery document items is also updated.
    DATE        AUTHOR      SCR #         CHANGE DESCRIPTION
    11/04/03   Ohm Reddy   BRD # 90      Initial version
                           DEVK928402
    02/25/04   Ohm Reddy                 In BDC session for posting Goods
                           DEVK929329    Receipt document, update document
                                         date with system local date
                                         (SYST-DATLO) rather than with
                                         system date(SYST-DATUM)
    06/23/04   Ohm Reddy                 Post GR only when sales order
                           DEVK931359    item SKU and PO item SKU matches
    03/21/05   Alex Mutia  13829/DEVK934135                              *
                           Phase II modifications:                       *
                           1. Added criteria in the selection screen;    *
                           2. Modified record selection logic;           *
                           3. Added fields in the Control Report;        *
    04/08/05   Alex Mutia  13829/DEVK934262                              *
                           Fixed bug in processing MFRGR field;          *
    04/13/05   Alex Mutia  13829/DEVK934283                              *
                           1.Fixed bug in assigning error record pointers*
                             to part-success part-error POs;             *
                           2.Added SO and SO line item numbers in report;*
                           3.Compressed report to fit in 255 columns;    *
    04/27/05   Alex Mutia  13829/DEVK934384                              *
                           1.Material documents retrieval changed from   *
                             MSEG to EKBE for performance.               *
                           2.Display empty ALV columns when no records   *
                             were selected for processing;               *
    TYPE-POOLS: SLIS.
    DATA:   GT_FIELDCAT TYPE SLIS_T_FIELDCAT_ALV.
    DATA:   G_LAYOUT_ALV_SPEC TYPE SLIS_LAYOUT_ALV.
    *INCLUDE ZMMCJI_CNV_POSTGR_BDC2.
    INCLUDE ZCJI_CNV_PGR_DATA_ALT.
    $--"DEVK934135 Begin;-$
    INITIALIZATION.                                  "DEVK934135
      PERFORM INITIALIZE_VENDOR.                     "DEVK934135
      PERFORM INITIALIZE_PRICE.                      "DEVK934135
    $--"DEVK934135 End;---$
    START-OF-SELECTION.
      IF P_LIFNR IS INITIAL.                         "DEVK934135
        PERFORM INITIALIZE_VENDOR.                   "DEVK934135
      ENDIF.                                         "DEVK934135
      IF P_NETPR IS INITIAL.                         "DEVK934135
        PERFORM INITIALIZE_PRICE.                    "DEVK934135
      ENDIF.                                         "DEVK934135
      PERFORM 100_SELECT_DATA.
    END-OF-SELECTION.
    CHECK: g_return_code IS INITIAL.               "DEVK934384
    IF NOT itab[] IS INITIAL.                      "DEVK934384
      IF G_RETURN_CODE IS INITIAL  AND               "DEVK934384
         NOT ITAB[] IS INITIAL.                      "DEVK934384
        PERFORM 200_PROCESS_DATA.
        PERFORM 300_POST_DOCUMENTS.
        PERFORM 399_RETRIEVE_DOCUMENTS.
        PERFORM REORG_ITAB.
        PERFORM BUILD_HEADER_CATALOG.
        PERFORM FIELDCAT_INIT USING GT_FIELDCAT[].
        SY_COPY = SYST.
        PERFORM SHOW_TRANSACTION_ERRORS.
      ELSE.                                          "DEVK934384
        PERFORM SHOW_EMPTY_LIST.                     "DEVK934384
      ENDIF.
    *&      Form  SELECT_DATA
    FORM 100_SELECT_DATA.
      PERFORM 110_SELECT_OPEN_PO_QTY.
      CHECK: G_RETURN_CODE IS INITIAL.
      PERFORM 120_SELECT_PO_BILLED_QTY.
    ENDFORM.                    " 100_SELECT_DATA
    *&      Form  110_SELECT_OPEN_PO_QTY
    FORM 110_SELECT_OPEN_PO_QTY.
    $--"DEVK934135 Begin;-$
      SELECT T1~VGBEL
             T1~VGPOS
             T1~VBELN
             T1~POSNR
             T1~MATNR
             T1~LFIMG
             T1~MFRGR
             T2~LIFEX
             T2~LFDAT
             FROM       LIPS AS T1
             INNER JOIN LIKP AS T2
             ON T1MANDT EQ T2MANDT  AND
                T1VBELN EQ T2VBELN
             APPENDING CORRESPONDING FIELDS OF TABLE ITAB_LIPS
             WHERE T1~MANDT EQ SY-MANDT         "client is system client
              AND  T1~VBELN IN S_VBELN          "billing doc in criteria
              AND  T1~VGBEL IN S_EBELN          "po reference in criteria
              AND  T1~PSTYV EQ 'ELN'            "billing item category
              AND  T1~WERKS EQ 'JDC1'           "plant
              AND  T1~MFRGR NE 'C'              "material freight group
              AND  T2~LIFNR EQ  P_LIFNR.        "vendor is param vendor
      LOOP AT ITAB_LIPS.
        ITAB_LIPS-EBELN = ITAB_LIPS-VGBEL.
        ITAB_LIPS-EBELP = ITAB_LIPS-VGPOS.
        ITAB_LIPS-CHARG = ITAB_LIPS-LIFEX.
        ITAB_LIPS-OLDMFRGR
                        = ITAB_LIPS-MFRGR.
        MODIFY ITAB_LIPS.
      ENDLOOP.
      IF ITAB_LIPS[] IS INITIAL.
      MESSAGE i032(zm) WITH text-m11.              "DEVK934384
        G_RETURN_CODE = 'X'.
        EXIT.
      ENDIF.
      SELECT T1~EBELN
             T1~EBELP
             T1~LICHA
             T2~MATNR
             T2~MENGE
             T2~LOEKZ
             T2~ELIKZ
             T2~NETPR
             T3~IHREZ
             FROM       EKET AS T1
             INNER JOIN EKPO AS T2
             ON T1MANDT EQ T2MANDT  AND
                T1EBELN EQ T2EBELN  AND
                T1EBELP EQ T2EBELP
             INNER JOIN EKKO AS T3
             ON T1MANDT EQ T3MANDT  AND
                T1EBELN EQ T3EBELN
             APPENDING CORRESPONDING FIELDS OF TABLE ITAB
             FOR ALL ENTRIES IN ITAB_LIPS
             WHERE T1~MANDT EQ SY-MANDT         "client is system client
              AND  T1~EBELN EQ ITAB_LIPS-EBELN  "po# matches w/ billing
              AND  T3~BSART IN ('YT', 'YN').    "po type
      IF ITAB[] IS INITIAL.
      MESSAGE i032(zm) WITH text-m11.              "DEVK934384
        G_RETURN_CODE = 'X'.
        EXIT.
      ENDIF.
    $--"DEVK934135 End;---$
    delete any duplicate entries in itab table
      SORT ITAB BY EBELN EBELP.
      DELETE ADJACENT DUPLICATES FROM ITAB COMPARING EBELN EBELP.
      LOOP AT ITAB.
        ITAB-RECID = SY-TABIX.
        IF NOT ITAB-IHREZ IS INITIAL.
          WHILE ITAB-IHREZ+0(1) EQ ' '.
            SHIFT ITAB-IHREZ.
          ENDWHILE.
          WHILE ITAB-IHREZ+9(1) EQ ' '.
            SHIFT ITAB-IHREZ RIGHT.
            ITAB-IHREZ+0(1) = '0'.
          ENDWHILE.
        ENDIF.
        MODIFY ITAB.
      ENDLOOP.
    delete  ITAB_LIPS entries that are not there in ITAB
      LOOP AT ITAB_LIPS.
        SY_COPY-TABIX = SY-TABIX.
        CLEAR ITAB.
        READ TABLE ITAB WITH KEY EBELN = ITAB_LIPS-EBELN
                                 EBELP = ITAB_LIPS-EBELP BINARY SEARCH.
        SY_COPY-INDEX = SY-TABIX.
        IF SY-SUBRC NE 0.
          DELETE ITAB_LIPS.
        ELSE.
          ITAB_LIPS-IHREZ = ITAB-IHREZ.
          MODIFY ITAB_LIPS INDEX SY_COPY-TABIX.
          ITAB-MFRGR = ITAB_LIPS-MFRGR.
          ITAB-LIFEX = ITAB_LIPS-LIFEX.
          ITAB-OLDMFRGR
                     = ITAB_LIPS-OLDMFRGR.
          MODIFY ITAB      INDEX SY_COPY-INDEX.
        ENDIF.
      ENDLOOP.
    select the goods receipts documents created for the above deliveries
      SELECT EBELN EBELP BELNR GJAHR
                     INTO TABLE ITAB_EKBE FROM EKBE
                                FOR ALL ENTRIES IN ITAB_LIPS
                                WHERE EBELN = ITAB_LIPS-EBELN
                                AND   EBELP = ITAB_LIPS-EBELP.
    select Goods receipt data from MSEG table for the above deliveries
      IF NOT ITAB_EKBE[] IS INITIAL.
        SELECT EBELN EBELP CHARG BWART MENGE MBLNR MJAHR ZEILE
                       INTO TABLE ITAB_MSEG FROM MSEG
                                  FOR ALL ENTRIES IN ITAB_EKBE
                                  WHERE MBLNR = ITAB_EKBE-BELNR
                                  AND   MJAHR = ITAB_EKBE-GJAHR.
      ENDIF.
      SORT ITAB_MSEG BY EBELN EBELP CHARG.
    calculate the GR qty eligible to be posted
      SORT ITAB_LIPS BY EBELN EBELP.
      LOOP AT ITAB_LIPS.
        ITAB_LIPS-POSTQTY = ITAB_LIPS-LFIMG.
        CLEAR ITAB_MSEG.
        LOOP AT ITAB_MSEG WHERE EBELN = ITAB_LIPS-EBELN
                          AND   EBELP = ITAB_LIPS-EBELP
                          AND   CHARG = ITAB_LIPS-CHARG.
          IF ITAB_MSEG-BWART = '101'.
            ITAB_LIPS-POSTQTY = ITAB_LIPS-POSTQTY - ITAB_MSEG-MENGE.
          ELSEIF ITAB_MSEG-BWART = '102'.
            ITAB_LIPS-POSTQTY = ITAB_LIPS-POSTQTY + ITAB_MSEG-MENGE.
          ENDIF.
        ENDLOOP.
        MODIFY ITAB_LIPS.
        CLEAR ITAB_LIPS.
      ENDLOOP.
      LOOP AT ITAB.
        ITAB-RECID = SY-TABIX.
        MODIFY ITAB.
        LOOP AT ITAB_LIPS WHERE EBELN EQ ITAB-EBELN
                           AND  EBELP EQ ITAB-EBELP.
          ITAB_LIPS-RECID = ITAB-RECID.
          MODIFY ITAB_LIPS.
        ENDLOOP.
      ENDLOOP.
    free the memory of unnecessary internal tables
    $--"DEVK934135 Begin;-$
      CLEAR: ITAB_EKBE.
      FREE:  ITAB_EKBE.
    $--"DEVK934135 End;---$
    ENDFORM.                    " 110_SELECT_OPEN_PO_QTY
    *&      Form  120_SELECT_PO_BILLED_QTY
    FORM 120_SELECT_PO_BILLED_QTY.
    $--"DEVK934135 Begin;-$
      SELECT T1~VBELN
             T1~POSNR
             T1~FKIMG
             T1~AUBEL
             T1~AUPOS
             APPENDING CORRESPONDING FIELDS OF TABLE ITAB_VBRP
             FROM       VBRP AS T1
             INNER JOIN VBRK AS T2
             ON T1MANDT EQ T2MANDT  AND
                T1VBELN EQ T2VBELN
             FOR ALL ENTRIES IN ITAB
             WHERE T1~MANDT EQ SY-MANDT         "client is system client
              AND  T1~VBELN EQ ITAB-IHREZ+0(10) "billing doc = your ref.
              AND  T2~FKSTO EQ ' '.             "status NOT cancelled
    Match ITAB-IHREZ <-> ITAB_VBRP-VBELN...
           ITAB-LICHA <-> ITAB_VBRP-POSNR...
      LOOP AT ITAB.
        SY_COPY-TABIX = SY-TABIX.
      Check your reference (IHREZ) field;
        IF ITAB-IHREZ IS INITIAL.                    "your-ref blank
          ITAB-ERRFA = 'X'.
          GT_ERROR-RECID = ITAB-RECID.
          GT_ERROR-ERRTX = TEXT-E0A.
          APPEND GT_ERROR.
        ELSE.                                        "your-ref NOT blank
          IF ITAB-IHREZ CO ' 0123456789'.            "your-ref numeric
          ENDIF.                                     "your-ref numeric
          IF SY-FDPOS NE 12.                         "your-ref NOT numeric
            ITAB-ERRFA = 'X'.
            GT_ERROR-RECID = ITAB-RECID.
            GT_ERROR-ERRTX = TEXT-E0A.
            APPEND GT_ERROR.
          ELSE.                                      "your-ref NOT numeric
          Check PO line item (LICHA) field;
            IF ITAB-LICHA IS INITIAL.                "line item blank
              ITAB-ERRFA = 'X'.
              GT_ERROR-RECID = ITAB-RECID.
              GT_ERROR-ERRTX = TEXT-E01.
              APPEND GT_ERROR.
            ELSE.                                    "line item NOT blank
              IF ITAB-LICHA CO ' 0123456789'.        "line item numeric
              ENDIF.                                 "line item numeric
              IF SY-FDPOS NE 15.                     "line item NOT numeric
                ITAB-ERRFA = 'X'.
                GT_ERROR-RECID = ITAB-RECID.
                GT_ERROR-ERRTX = TEXT-E01.
                APPEND GT_ERROR.
              ELSE.                                  "line item NOT numeric
                SY_COPY-SUBRC = 4.
                READ TABLE ITAB_VBRP
                     WITH KEY VBELN = ITAB-IHREZ+0(10)
                              POSNR = ITAB-LICHA+0(6)    BINARY SEARCH.
                SY_COPY-SUBRC = SY-SUBRC.
                IF SY_COPY-SUBRC NE 0.
                  ITAB-ERRFA = 'X'.
                  GT_ERROR-RECID = ITAB-RECID.
                  GT_ERROR-ERRTX = TEXT-E01.
                  APPEND GT_ERROR.
                ELSE.                                "DEVK934283
                  ITAB-AUBEL = ITAB_VBRP-AUBEL.      "DEVK934283
                  ITAB-AUPOS = ITAB_VBRP-AUPOS.      "DEVK934283
                ENDIF.
              ENDIF.                                 "line item NOT numeric
            ENDIF.                                   "line item blank
          ENDIF.                                     "your-ref NOT numeric
        ENDIF.                                       "your-ref blank
      Check ID - LIFEX;
        IF ITAB-LIFEX EQ ' '.                        "LIFEX is blank
          ITAB-ERRFB = 'X'.
          GT_ERROR-RECID = ITAB-RECID.
          GT_ERROR-ERRTX = TEXT-ERB.
          APPEND GT_ERROR.
        ELSE.                                        "LIFEX is NOT blank
        Check ID - MFRGR;
          IF ITAB-MFRGR NE 'G'.                      "MFRGR NOT G
            ITAB-ERRFC = 'X'.
            GT_ERROR-RECID = ITAB-RECID.
            GT_ERROR-ERRTX = TEXT-ERC.
            APPEND GT_ERROR.
          ENDIF.                                     "MFRGR NOT G
        ENDIF.                                       "LIFEX is blank
      Check PO - Deletion indicator;
        IF ITAB-LOEKZ NE ' '.                        "LOEKZ NOT blank
          ITAB-ERRFD = 'X'.
          GT_ERROR-RECID = ITAB-RECID.
          GT_ERROR-ERRTX = TEXT-ERD.
          APPEND GT_ERROR.
        ENDIF.                                       "LOEKZ NOT blank
      Check PO - Delivery completed flag;
        IF ITAB-ELIKZ NE ' '.                        "ELIKZ NOT blank
          ITAB-ERRFE = 'X'.
          GT_ERROR-RECID = ITAB-RECID.
          GT_ERROR-ERRTX = TEXT-ERE.
          APPEND GT_ERROR.
        ENDIF.                                       "ELIKZ NOT blank
      Check PO - Net price;
        IF ITAB-NETPR LT P_NETPR.                    "price < parameter
          ITAB-ERRFF = 'X'.
          GT_ERROR-RECID = ITAB-RECID.
          CONCATENATE TEXT-ERF
                      G_NETPR
                      TEXT-USD
                      INTO GT_ERROR-ERRTX SEPARATED BY SPACE.
          APPEND GT_ERROR.
        ENDIF.                                       "ELIKZ NOT blank
        IF ITAB-AUPOS EQ '000000'.
          CLEAR: ITAB-AUPOS.
        ENDIF.
        MODIFY ITAB INDEX SY_COPY-TABIX.
      ENDLOOP.
      LOOP AT ITAB.                                  "DEVK934283
        READ TABLE ITAB_LIPS                         "DEVK934283
             WITH KEY VGBEL = ITAB-EBELN             "DEVK934283
                      VGPOS = ITAB-EBELP             "DEVK934283
             BINARY SEARCH.                          "DEVK934283
        SY_COPY-TABIX = SY-TABIX.                    "DEVK934283
        IF SY-SUBRC EQ 0.                            "DEVK934283
          ITAB_LIPS-AUBEL = ITAB-AUBEL.              "DEVK934283
          ITAB_LIPS-AUPOS = ITAB-AUPOS.              "DEVK934283
          MODIFY ITAB_LIPS INDEX SY_COPY-TABIX.      "DEVK934283
        ENDIF.                                       "DEVK934283
      ENDLOOP.                                       "DEVK934283
    Transfer errors from ITAB to ITAB_LIPS;
      LOOP AT ITAB WHERE ERRFA EQ 'X'
                    OR   ERRFB EQ 'X'
                    OR   ERRFC EQ 'X'
                    OR   ERRFD EQ 'X'
                    OR   ERRFE EQ 'X'
                    OR   ERRFF EQ 'X'.
        READ TABLE ITAB_LIPS
             WITH KEY VGBEL = ITAB-EBELN
                      VGPOS = ITAB-EBELP  BINARY SEARCH.
        SY_COPY-TABIX = SY-TABIX.
        IF SY-SUBRC EQ 0.
          ITAB_LIPS-ERRFA    = ITAB-ERRFA.
          ITAB_LIPS-ERRFB    = ITAB-ERRFB.
          ITAB_LIPS-ERRFC    = ITAB-ERRFC.
          ITAB_LIPS-ERRFD    = ITAB-ERRFD.
          ITAB_LIPS-ERRFE    = ITAB-ERRFE.
          ITAB_LIPS-ERRFF    = ITAB-ERRFF.
          ITAB_LIPS-NEWMFRGR = 'E'.
          MODIFY ITAB_LIPS INDEX SY_COPY-TABIX.
        ENDIF.
      ENDLOOP.
    $--"DEVK934135 End;---$
    ENDFORM.                    " 120_SELECT_PO_BILLED_QTY
    *&      Form  200_PROCESS_DATA
    FORM 200_PROCESS_DATA.
      PERFORM 210_CONSOLIDATE_DATA.
      PERFORM 220_PROCESS_DATA.
    ENDFORM.                    " 200_PROCESS_DATA
    *&      Form  210_consolidate_data
    FORM 210_CONSOLIDATE_DATA.
    Get the PO item open qty and billed qty into one table
      LOOP AT ITAB.
        CLEAR ITAB_LIPS.
        LOOP AT ITAB_LIPS WHERE EBELN = ITAB-EBELN
                          AND   EBELP = ITAB-EBELP.
         ITAB-IDQTY = ITAB-IDQTY + ITAB_LIPS-POSTQTY.      "inbound delv qty
        ENDLOOP.
        CLEAR ITAB_VBRP.
        LOOP AT ITAB_VBRP WHERE VBELN = ITAB-IHREZ
                          AND   POSNR = ITAB-LICHA.
          ITAB-FKIMG = ITAB-FKIMG + ITAB_VBRP-FKIMG.    "PO item billed qty
        ENDLOOP.
        CLEAR ITAB_MSEG.
        LOOP AT ITAB_MSEG WHERE EBELN = ITAB-EBELN
                          AND   EBELP = ITAB-EBELP.
          IF ITAB_MSEG-BWART = '101'.
           ITAB-GRQTY = ITAB-GRQTY + ITAB_MSEG-MENGE.        "PO item GR qty
          ELSEIF ITAB_MSEG-BWART = '102'.
           ITAB-GRQTY = ITAB-GRQTY - ITAB_MSEG-MENGE.        "PO item GR qty
          ELSEIF ITAB_MSEG-BWART = '122'.            "DEVK934135
           ITAB-GRQTY = ITAB-GRQTY - ITAB_MSEG-MENGE.        "PO item GR qty
          ENDIF.
        ENDLOOP.
        ITAB-RCVQTY = ITAB-FKIMG - ITAB-GRQTY.  "qty billed but not received
    calculate the quantity to be processed for which GRs are to be posted
        IF ITAB-RCVQTY > 0 AND ITAB-RCVQTY > ITAB-IDQTY.
          ITAB-PROCQTY = ITAB-IDQTY.
        ELSEIF ITAB-RCVQTY > 0 AND ITAB-RCVQTY < ITAB-IDQTY.
          ITAB-PROCQTY = ITAB-RCVQTY.
        ELSEIF ITAB-RCVQTY > 0 AND ITAB-RCVQTY = ITAB-IDQTY.
          ITAB-PROCQTY = ITAB-IDQTY.
        ENDIF.
        MODIFY ITAB.
        CLEAR ITAB.
      ENDLOOP.
    free the memory of unnecessary internal tables
    $--"DEVK934135 Begin;-$
      CLEAR: ITAB_MSEG.
      FREE:  ITAB_MSEG.
    $--"DEVK934135 End;---$
    ENDFORM.                    " 210_consolidate_data
    *&      Form  220_PROCESS_DATA
    FORM 220_PROCESS_DATA.
      DATA: L0_FISCAL_PERIOD  LIKE BAPI0002_4-FISCAL_PERIOD,
            L0_FISCAL_YEAR    LIKE BAPI0002_4-FISCAL_YEAR,
            L0_RETURN         LIKE BAPIRETURN1,
            L1_FISCAL_PERIOD  LIKE BAPI0002_4-FISCAL_PERIOD,
            L1_FISCAL_YEAR    LIKE BAPI0002_4-FISCAL_YEAR,
            L1_RETURN         LIKE BAPIRETURN1.
      SORT ITAB_LIPS BY VGBEL VGPOS EBELN EBELP
                        LFDAT DESCENDING POSNR ASCENDING.
      SORT ITAB BY EBELN EBELP.
    Calculate the GR quanities to be posted for all inbound deliveries
      LOOP AT ITAB_LIPS.
        AT NEW EBELP.
          CLEAR ITAB.
          CLEAR V_RCVQTY.
          READ TABLE ITAB WITH KEY EBELN = ITAB_LIPS-EBELN
                                   EBELP = ITAB_LIPS-EBELP BINARY SEARCH.
          V_RCVQTY = ITAB-RCVQTY.
        ENDAT.
        IF ITAB-PROCQTY GT 0.
          IF ITAB_LIPS-POSTQTY GT ITAB-PROCQTY.
            ITAB_LIPS-PROCQTY = ITAB-PROCQTY.
            ITAB_LIPS-NEWMFRGR = 'B'.
            ITAB-PROCQTY = 0.
          ELSEIF ITAB_LIPS-POSTQTY LT ITAB-PROCQTY.
            ITAB_LIPS-PROCQTY = ITAB_LIPS-POSTQTY.
            ITAB_LIPS-NEWMFRGR = 'C'.
            ITAB-PROCQTY = ITAB-PROCQTY - ITAB_LIPS-POSTQTY.
          ELSEIF ITAB_LIPS-POSTQTY EQ ITAB-PROCQTY.
            ITAB_LIPS-PROCQTY = ITAB_LIPS-POSTQTY.
            ITAB_LIPS-NEWMFRGR = 'C'.
            ITAB-PROCQTY = 0.
          ENDIF.
    Compare the Inbound delivery processing quantity with the pending
    billing quantity to write it in the report log
          IF ITAB_LIPS-POSTQTY LT V_RCVQTY.
            ITAB_LIPS-GRIND = 'D'.            "GR will be created for ID qty
            V_RCVQTY = V_RCVQTY - ITAB_LIPS-POSTQTY.
          ELSEIF ITAB_LIPS-POSTQTY GT V_RCVQTY.
            ITAB_LIPS-GRIND = 'B'.       "GR will be created for Billied qty
            V_RCVQTY = 0.
          ELSEIF ITAB_LIPS-POSTQTY EQ V_RCVQTY.
            ITAB_LIPS-GRIND = 'S'.            "Billed qty is equal to ID qty
            V_RCVQTY = 0.
          ENDIF.
        ELSE.
    Decide why this inbound delivery could not have GR quantity -
    excess GR quantity or unavailable Billing quantity
          IF ITAB-RCVQTY LT ITAB-IDQTY.
            ITAB_LIPS-GRIND = 'C'.      "GR not created - Lack of Billed qty
          ENDIF.
          IF ITAB-RCVQTY LT 0.
            ITAB_LIPS-GRIND = 'A'.       "GR not created - GR qty > Bill qty
          ENDIF.
        ENDIF.
        MODIFY ITAB_LIPS.
        CLEAR ITAB_LIPS.
      ENDLOOP.
    $--"DEVK934135-Begin;-$
      LOOP AT ITAB_LIPS.
        AT NEW EBELP.
          CLEAR ITAB.
          CLEAR V_RCVQTY.
          READ TABLE ITAB WITH KEY EBELN = ITAB_LIPS-EBELN
                                   EBELP = ITAB_LIPS-EBELP BINARY SEARCH.
          V_RCVQTY = ITAB-FKIMG - ITAB-GRQTY.
        ENDAT.
        IF ITAB_LIPS-ERRFA IS INITIAL.
          IF V_RCVQTY EQ 0.
            ITAB_LIPS-ERRF1    = 'X'.
            ITAB_LIPS-NEWMFRGR = 'E'.
            GT_ERROR-RECID = ITAB-RECID.
            GT_ERROR-ERRTX = TEXT-R01.
            APPEND GT_ERROR.
          ELSEIF V_RCVQTY LT 0.
            ITAB_LIPS-ERRF2    = 'X'.
            ITAB_LIPS-NEWMFRGR = 'E'.
            GT_ERROR-RECID = ITAB-RECID.
            GT_ERROR-ERRTX = TEXT-R02.
            APPEND GT_ERROR.
          ELSEIF V_RCVQTY GT 0.
            IF V_RCVQTY EQ ITAB_LIPS-LFIMG.
              ITAB_LIPS-ERRF3    = 'X'.
              ITAB_LIPS-NEWMFRGR = 'C'.
            ELSEIF V_RCVQTY GT ITAB_LIPS-LFIMG.
              ITAB_LIPS-ERRF4    = 'X'.
              ITAB_LIPS-NEWMFRGR = 'C'.
              ITAB_LIPS-PROCQTY  =  ITAB_LIPS-LFIMG.
              GT_ERROR-RECID = ITAB-RECID.
              GT_ERROR-ERRTX = TEXT-R04.
              APPEND GT_ERROR.
            ELSEIF V_RCVQTY LT ITAB_LIPS-LFIMG.
              ITAB_LIPS-ERRF5    = 'X'.
              ITAB_LIPS-NEWMFRGR = 'E'.
              GT_ERROR-RECID = ITAB-RECID.
              GT_ERROR-ERRTX = TEXT-R05.
              APPEND GT_ERROR.
            ENDIF.
          ENDIF.
        ENDIF.
        CLEAR: ITAB_LIPS-BLDAT.
        READ TABLE ITAB WITH KEY EBELN = ITAB_LIPS-VGBEL
                                 EBELP = ITAB_LIPS-VGPOS BINARY SEARCH.
        SELECT SINGLE FKDAT
               FROM  VBRK
               INTO (ITAB_LIPS-BLDAT)
               WHERE VBELN EQ ITAB-IHREZ+0(10).
        CALL FUNCTION 'BAPI_COMPANYCODE_GET_PERIOD'
             EXPORTING
                  COMPANYCODEID = 'C800'
                  POSTING_DATE  =  ITAB_LIPS-BLDAT
             IMPORTING
                  FISCAL_YEAR   =  L0_FISCAL_YEAR
                  FISCAL_PERIOD =  L0_FISCAL_PERIOD
                  RETURN        =  L0_RETURN.
        CALL FUNCTION 'BAPI_COMPANYCODE_GET_PERIOD'
             EXPORTING
                  COMPANYCODEID = 'C800'
                  POSTING_DATE  =  SY-DATLO
             IMPORTING
                  FISCAL_YEAR   =  L1_FISCAL_YEAR
                  FISCAL_PERIOD =  L1_FISCAL_PERIOD
                  RETURN        =  L1_RETURN.
        IF L0_FISCAL_YEAR   EQ L1_FISCAL_YEAR  AND
           L0_FISCAL_PERIOD EQ L1_FISCAL_PERIOD.
          ITAB_LIPS-BUDAT = ITAB_LIPS-BLDAT.
        ELSE.
          ITAB_LIPS-BUDAT = SY-DATLO.
        ENDIF.
        MODIFY ITAB_LIPS.
        CLEAR ITAB_LIPS.
      ENDLOOP.
    $--"DEVK934135-End;---$
    collect all the inbound deliveries for which goods receipt are to be
    made / material freight status  are to be updated
      LOOP AT ITAB_LIPS    WHERE ERRFA IS INITIAL       "DEVK934135
                            AND  ERRFB IS INITIAL       "DEVK934135
                            AND  ERRFC IS INITIAL       "DEVK934135
                            AND  ERRFD IS INITIAL       "DEVK934135
                            AND  ERRFE IS INITIAL       "DEVK934135
                            AND  ERRFF IS INITIAL       "DEVK934135
                            AND  ERRF1 IS INITIAL       "DEVK934135
                            AND  ERRF2 IS INITIAL       "DEVK934135
                            AND  ERRF5 IS INITIAL.      "DEVK934135
        IF ITAB_LIPS-PROCQTY GT 0 AND ITAB_LIPS-LFIMG NE 0.
          ITAB_LIPS_G-VBELN = ITAB_LIPS-VBELN.
          ITAB_LIPS_G-BLDAT = ITAB_LIPS-BLDAT.       "DEVK934135
          ITAB_LIPS_G-BUDAT = ITAB_LIPS-BUDAT.       "DEVK934135
          ITAB_LIPS_G-IHREZ = ITAB_LIPS-IHREZ.       "DEVK934135
          APPEND ITAB_LIPS_G.
        ENDIF.
      ENDLOOP.
      SORT ITAB_LIPS_G BY VBELN.
      DELETE ADJACENT DUPLICATES FROM ITAB_LIPS_G.
      LOOP AT ITAB_LIPS    WHERE NOT ERRFA IS INITIAL       "DEVK934135
                            OR   NOT ERRFB IS INITIAL       "DEVK934135
                            OR   NOT ERRFC IS INITIAL       "DEVK934135
                            OR   NOT ERRFD IS INITIAL       "DEVK934135
                            OR   NOT ERRFE IS INITIAL       "DEVK934135
                            OR   NOT ERRFF IS INITIAL       "DEVK934135
                            OR   NOT ERRF1 IS INITIAL       "DEVK934135
                            OR   NOT ERRF2 IS INITIAL       "DEVK934135
                            OR   NOT ERRF3 IS INITIAL       "DEVK934135
                            OR   NOT ERRF4 IS INITIAL       "DEVK934135
                            OR   NOT ERRF5 IS INITIAL.      "DEVK934135
          ITAB_LIPS_X-VBELN = ITAB_LIPS-VBELN.
          ITAB_LIPS_X-BLDAT = ITAB_LIPS-BLDAT.       "DEVK934135
          ITAB_LIPS_X-BUDAT = ITAB_LIPS-BUDAT.       "DEVK934135
          ITAB_LIPS_X-IHREZ = ITAB_LIPS-IHREZ.       "DEVK934135
          APPEND ITAB_LIPS_X.
      ENDLOOP.
      SORT ITAB_LIPS_X BY VBELN.
      DELETE ADJACENT DUPLICATES FROM ITAB_LIPS_X.
      LOOP AT ITAB_LIPS.
          READ TABLE ITAB WITH KEY RECID = ITAB_LIPS-RECID.
          SY_COPY-INDEX = SY-TABIX.
          IF SY-SUBRC EQ 0.
            ITAB-ERRFA = ITAB_LIPS-ERRFA.
            ITAB-ERRFB = ITAB_LIPS-ERRFB.
            ITAB-ERRFC = ITAB_LIPS-ERRFC.
            ITAB-ERRFD = ITAB_LIPS-ERRFD.
            ITAB-ERRFE = ITAB_LIPS-ERRFE.
            ITAB-ERRFF = ITAB_LIPS-ERRFF.
            ITAB-ERRF1 = ITAB_LIPS-ERRF1.
            ITAB-ERRF2 = ITAB_LIPS-ERRF2.
            ITAB-ERRF3 = ITAB_LIPS-ERRF3.
            ITAB-ERRF4 = ITAB_LIPS-ERRF4.
            ITAB-ERRF5 = ITAB_LIPS-ERRF5.
            MODIFY ITAB INDEX SY_COPY-INDEX.
          ENDIF.
      ENDLOOP.
    Decide the goods receipt item number for the delivery items that are
    to be processed. Delivery items with zero quantities are not shown up
    in MB0A transaction for GR
      CLEAR V_DEL_ZERO.
      IF NOT ITAB_LIPS_G[] IS INITIAL.
        SELECT VBELN POSNR LFIMG
                  INTO CORRESPONDING FIELDS OF TABLE ITAB_LIPS_Z FROM LIPS
                                  FOR ALL ENTRIES IN ITAB_LIPS_G
                                  WHERE VBELN = ITAB_LIPS_G-VBELN
                                  AND LFIMG EQ 0.
        IF SY-SUBRC EQ 0.
          V_DEL_ZERO = 'X'.
          CLEAR ITAB_LIPS_Z.
          FREE ITAB_LIPS_Z.
          SELECT VBELN POSNR LFIMG
                   INTO CORRESPONDING FIELDS OF TABLE ITAB_LIPS_Z FROM LIPS
                                    FOR ALL ENTRIES IN ITAB_LIPS_G
                                    WHERE VBELN = ITAB_LIPS_G-VBELN.
          SORT ITAB_LIPS_Z BY VBELN POSNR.
          LOOP AT ITAB_LIPS_Z.
            AT NEW VBELN.
              CLEAR V_ZEILE.
            ENDAT.
            IF ITAB_LIPS_Z-LFIMG NE 0.
              V_ZEILE = V_ZEILE + 1.
            ENDIF.
            ITAB_LIPS_Z-ZEILE = V_ZEILE.
            MODIFY ITAB_LIPS_Z.
          ENDLOOP.
        ELSE.
          V_DEL_ZERO = ' '.
        ENDIF.
      ENDIF.
      SORT ITAB_LIPS_Z BY VBELN POSNR.
      LOOP AT ITAB_LIPS.
        IF V_DEL_ZERO = ' '.
          ITAB_LIPS-ZEILE = ITAB_LIPS-POSNR.
        ELSE.
          CLEAR ITAB_LIPS_Z.
          READ TABLE ITAB_LIPS_Z WITH KEY VBELN = ITAB_LIPS-VBELN
                                    POSNR = ITAB_LIPS-POSNR BINARY SEARCH.
          ITAB_LIPS-ZEILE = ITAB_LIPS_Z-ZEILE.
        ENDIF.
        MODIFY ITAB_LIPS.
      ENDLOOP.
      SORT ITAB_LIPS BY VBELN DESCENDING POSNR ASCENDING.
    ENDFORM.                    " 220_PROCESS_DATA
    *&      Form  300_post_documents
    FORM 300_POST_DOCUMENTS.
      LOOP AT ITAB_LIPS_G.
        PERFORM 310_POST_GR_DOC.
        MODIFY ITAB_LIPS_G.
        CLEAR ITAB_LIPS_G.
      ENDLOOP.
      CLEAR: BDCDATA, BDCDATA[].
      ITAB_LIPS_R[] = ITAB_LIPS_G[].
      ITAB_LIPS_G[] = ITAB_LIPS_X[].
      LOOP AT ITAB_LIPS_G.
        PERFORM 350_UPDATE_DELIVERY_DOC.
        MODIFY ITAB_LIPS_G.
        CLEAR ITAB_LIPS_G.
      ENDLOOP.
    PERFORM close_group.
    ENDFORM.                    " 300_post_documents
    *&      Form  310_POST_GR_DOC
    FORM 310_POST_GR_DOC.
      PERFORM 320_POST_GR_HEADER.
      LOOP AT ITAB_LIPS WHERE VBELN = ITAB_LIPS_G-VBELN
                        AND   LFIMG NE 0
                        AND PROCQTY NE 0
                        AND ERRFA   IS INITIAL
                        AND ERRFB   IS INITIAL
                        AND ERRFC   IS INITIAL
                        AND ERRFD   IS INITIAL
                        AND ERRFE   IS INITIAL
                        AND ERRFF   IS INITIAL
                        AND ERRF1   IS INITIAL
                        AND ERRF2   IS INITIAL
                        AND ERRF5   IS INITIAL.
        IF ITAB_LIPS-ZEILE EQ 1.
          PERFORM 335_POST_GR_ITEMS.
        ELSE.
          PERFORM 330_POST_GR_ITEMS.
        ENDIF.
      ENDLOOP.
      PERFORM 340_SAVE_GR_DOC.
    ENDFORM.                    " 310_POST_GR_DOC
    *&      Form  320_POST_GR_HEADER
    FORM 320_POST_GR_HEADER.
      DATA: L_BLDAT    TYPE SYDATUM,
            L_BUDAT    TYPE SYDATUM.
      WRITE: ITAB_LIPS_G-BLDAT TO L_BLDAT,
             ITAB_LIPS_G-BUDAT TO L_BUDAT.
      IF ITAB_LIPS_G-IHREZ+0(10) NE '0000000000'  AND
         ITAB_LIPS_G-IHREZ+0(10) NE '          '.
        WHILE ITAB_LIPS_G-IHREZ+0(1) EQ '0'.
          SHIFT ITAB_LIPS_G-IHREZ.
        ENDWHILE.
      ENDIF.
      perform bdc_dynpro      using 'SAPMM07M' '0201'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'RM07M-VLIEF'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '/00'.
      PERFORM BDC_FIELD       USING 'MKPF-BKTXT'
                                    ITAB_LIPS_G-IHREZ.
      perform bdc_field       using 'MKPF-BLDAT'
                                    L_BLDAT.
      perform bdc_field       using 'MKPF-BUDAT'
                                    L_BUDAT.
      perform bdc_field       using 'RM07M-BWARTWE'
                                    '101'.
      perform bdc_field       using 'RM07M-WERKS'
      perform bdc_field       using 'RM07M-LGORT'
      perform bdc_field       using 'RM07M-XNUVO'
                                    'X'.
      perform bdc_field       using 'XFULL'
      perform bdc_field       using 'RM07M-VLIEF'
                                    ITAB_LIPS_G-VBELN.
      perform bdc_dynpro      using 'SAPMM07M' '0221'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=SELN'.
      perform bdc_dynpro      using 'SAPMM07M' '0221'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'MSEG-ERFMG(01)'.
    ENDFORM.                    " 320_POST_GR_HEADER
    *&      Form  330_POST_GR_ITEMS
    FORM 330_POST_GR_ITEMS.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=KLA'.
      perform bdc_dynpro      using 'SAPMM07M' '1501'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=OK'.
      VV_ZEILE = ITAB_LIPS-ZEILE.
      PERFORM BDC_FIELD       USING 'RM07M-ZEILE'
                                    VV_ZEILE.
      perform bdc_dynpro      using 'SAPMM07M' '0221'.
      perform bdc_field       using 'RM07M-XSELK(01)'
                                    'X'.
      VV_PROCQTY = ITAB_LIPS-PROCQTY.
      perform bdc_field       using 'MSEG-ERFMG(01)'
                                    VV_PROCQTY.
      perform bdc_field       using 'MSEG-CHARG(01)'
                                    ITAB_LIPS-CHARG.
      perform bdc_field       using 'MSEG-INSMK(01)'
                                    'S'.
    ENDFORM.                    " 330_POST_GR_ITEMS
    *&      Form  340_SAVE_GR_DOC
    FORM 340_SAVE_GR_DOC.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=BU'.
      CLEAR V_FAIL_IND.
      PERFORM BDC_TRANSACTION USING 'MB0A'
                              CHANGING V_FAIL_IND.
    ENDFORM.                    " 340_SAVE_GR_DOC
    *&      Form  350_UPDATE_DELIVERY_DOC
    FORM 350_UPDATE_DELIVERY_DOC.
      PERFORM 360_UPDATE_DELIVERY_HEADER.
      LOOP AT ITAB_LIPS WHERE VBELN = ITAB_LIPS_G-VBELN
                         AND  ERRFA IS INITIAL
                         AND  ERRFB IS INITIAL
                         AND  ERRFC IS INITIAL.
                       AND  errfd IS INITIAL
                       AND  errfe IS INITIAL.
        PERFORM 370_UPDATE_DELIVERY_ITEMS.
      ENDLOOP.
      PERFORM 380_SAVE_DELIVERY_DOC.
    ENDFORM.                    " 350_UPDATE_DELIVERY_DOC
    *&      Form  360_UPDATE_DELIVERY_HEADER
    FORM 360_UPDATE_DELIVERY_HEADER.
      perform bdc_dynpro      using 'SAPMV50A' '0108'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'LIKP-VBELN'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=UELA'.
      perform bdc_field       using 'LIKP-VBELN'
                                    ITAB_LIPS_G-VBELN.
    ENDFORM.                    " 360_UPDATE_DELIVERY_HEADER
    *&      Form  370_UPDATE_DELIVERY_ITEMS
    FORM 370_UPDATE_DELIVERY_ITEMS.
      IF ITAB_LIPS-ERRFD EQ 'X'  OR
         ITAB_LIPS-ERRFE EQ 'X'  OR
         ITAB_LIPS-ERRFF EQ 'X'.
        ITAB_LIPS-NEWMFRGR = 'E'.
      ENDIF.
      perform bdc_dynpro      using 'SAPMV50A' '0270'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'RV50A-VERUR_LA'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=POPO'.
      perform bdc_dynpro      using 'SAPMV50A' '0111'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'RV50A-POSNR'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=POPO'.
      VV_POSNR =  ITAB_LIPS-POSNR.
      perform bdc_field       using 'RV50A-POSNR'
                                    VV_POSNR.
      perform bdc_dynpro      using 'SAPMV50A' '0270'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'LIPS-POSNR(01)'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=LAPD'.
      perform bdc_field       using 'RV50A-LIPS_SELKZ(01)'
                                    'X'.
      perform bdc_dynpro      using 'SAPMV50A' '0570'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'LIPS-MFRGR'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=BACK'.
      perform bdc_field       using 'LIPS-MFRGR'
                                    ITAB_LIPS-NEWMFRGR.
    ENDFORM.                    " 370_UPDATE_DELIVERY_ITEMS
    *&      Form  380_SAVE_DELIVERY_DOC
    FORM 380_SAVE_DELIVERY_DOC.
      perform bdc_dynpro      using 'SAPMV50A' '0270'.
      perform bdc_field       using 'BDC_CURSOR'
                                    'RV50A-VERUR_LA'.
      perform bdc_field       using 'BDC_OKCODE'
                                    '=SICH'.
    If GR document is not posted successfully, then do not update the
    status of delivery document
      CLEAR V_FAIL_IND.
      PERFORM BDC_TRANSACTION USING 'VL32'
                              CHANGING V_FAIL_IND.
      IF V_FAIL_IND = 'X'.
        CALL FUNCTION 'BDC_INSERT'
             EXPORTING
                  TCODE     = 'VL32'
             TABLES
                  DYNPROTAB = BDCDATA.
        REFRESH BDCDATA.
      ENDIF.
    ENDFORM.                    " 380_SAVE_DELIVERY_DOC
           Start new transaction according to parameters                 *
    FORM BDC_TRANSACTION USING TCODE
                         CHANGING V_FAILURE_IND.
      DATA: L_MSTRING(480).
      DATA: L_SUBRC LIKE SY-SUBRC.
      REFRESH MESSTAB.
      CALL TRANSACTION TCODE USING BDCDATA
                       MODE   CTUMODE
                       UPDATE CUPDATE
                       MESSAGES INTO MESSTAB.
      L_SUBRC = SY-SUBRC.
      CLEAR V_FAILURE_IND.
      IF L_SUBRC NE 0.
        V_FAILURE_IND = 'X'.
        CLEAR V_IND.
        LOOP AT MESSTAB.
          SELECT SINGLE * FROM T100 WHERE SPRSL = MESSTAB-MSGSPRA
                                    AND   ARBGB = MESSTAB-MSGID
                                    AND   MSGNR = MESSTAB-MSGNR.
          IF SY-SUBRC = 0.
            L_MSTRING = T100-TEXT.
            IF L_MSTRING CS '&1'.
              REPLACE '&1' WITH MESSTAB-MSGV1 INTO L_MSTRING.
              REPLACE '&2' WITH MESSTAB-MSGV2 INTO L_MSTRING.
              REPLACE '&3' WITH MESSTAB-MSGV3 INTO L_MSTRING.
              REPLACE '&4' WITH MESSTAB-MSGV4 INTO L_MSTRING.
            ELSE.
              REPLACE '&' WITH MESSTAB-MSGV1 INTO L_MSTRING.
              REPLACE '&' WITH MESSTAB-MSGV2 INTO L_MSTRING.
              REPLACE '&' WITH MESSTAB-MSGV3 INTO L_MSTRING.
              REPLACE '&' WITH MESSTAB-MSGV4 INTO L_MSTRING.
            ENDIF.
            CONDENSE L_MSTRING.
            IF MESSTAB-MSGTYP = 'E'.
              ERRORTAB-TCODE       = TCODE.
              ERRORTAB-VBELN       = ITAB_LIPS_G-VBELN.
              ERRORTAB-ERROR_TEXT  = L_MSTRING.
              APPEND ERRORTAB.
              V_IND = 'X'.
            ENDIF.
          ELSE.
            IF MESSTAB-MSGTYP = 'E'.
              ERRORTAB-TCODE       = TCODE.
              ERRORTAB-VBELN       = ITAB_LIPS_G-VBELN.
              ERRORTAB-ERROR_TEXT  = TEXT-U01.
              APPEND ERRORTAB.
              V_IND = 'X'.
            ENDIF.
          ENDIF.
        ENDLOOP.
        IF V_IND IS INITIAL.
          ERRORTAB-TCODE       = TCODE.
          ERRORTAB-VBELN       = ITAB_LIPS_G-VBELN.
          ERRORTAB-ERROR_TEXT  = TEXT-U01.
          APPEND ERRORTAB.
        ENDIF.
      ELSE.
        IF TCODE = 'MB0A'.
          LOOP AT MESSTAB WHERE MSGTYP = 'S'
                          AND   MSGID = 'M7'
                          AND   MSGNR = '060'.
            IF NOT MESSTAB-MSGV1 IS INITIAL.
              ITAB_LIPS_G-MBLNR = MESSTAB-MSGV1.
            ENDIF.
          ENDLOOP.
        ELSEIF TCODE = 'VL32'.
          ITAB_LIPS_G-DLVIND = 'X'.
        ENDIF.
      ENDIF.
      IF L_SUBRC <> 0 AND E_GROUP <> SPACE.
        IF E_GROUP_OPENED = ' '.
          CALL FUNCTION 'BDC_OPEN_GROUP'
               EXPORTING
                    CLIENT   = SY-MANDT
                    GROUP    = E_GROUP
                    USER     = E_USER
                    KEEP     = E_KEEP
                    HOLDDATE = E_HDATE.
          E_GROUP_OPENED = 'X'.
        ENDIF.
        CALL FUNCTION 'BDC_INSERT'
             EXPORTING
                  TCODE     = TCODE
             TABLES
                  DYNPROTAB = BDCDATA.
      ENDIF.
      REFRESH BDCDATA.
    ENDFORM.
    *&      Form  335_POST_GR_ITEMS
    FORM 335_POST_GR_ITEMS.
      VV_ZEILE = ITAB_LIPS-ZEILE.
      perform bdc_field       using 'RM07M-XSELK(01)'
                                    'X'.
      VV_PROCQTY = ITAB_LIPS-PROCQTY.
      perform bdc_field       using 'MSEG-ERFMG(01)'
                                    VV_PROCQTY.
      perform bdc_field       using 'MSEG-CHARG(01)'
                                    ITAB_LIPS-CHARG.
      perform bdc_field       using 'MSEG-INSMK(01)'
                                    'S'.
    ENDFORM.                    " 335_POST_GR_ITEMS
    *&      Form  399_RETRIEVE_DOCUMENTS
    &----

    that is a warning message only ... But if you want to fix it then replace all 000 with 001 in your write statement. The position instead of 000 you have to give 001
    write : /000(10)....instead of this
    write : /1(10) or write : /(10) or write : /001(10) any thing you can use.
    regards
    shiba dutta

  • LONG PATH ERROR FIXER SOLVED

    i have try LONG PATH ERROR FIXER
    did you encounter this error
    *Path too long
    *Error cannot delete file: cannot read from source file or disk
    *Cannot delete file: Access is denied
    www-LongPathTool-com
    Just download it.. it may help you guys

    Hello guys, i want to suggest Long Path Tool program. Because it get rids out of long path errors. Such as, deleting, copying or renaming.
    For more details pls visit longpathtool(dot)com, or just Google "Long Path Tool".
    You will not waste time. It is very effective. Try it now!

  • Time Machine Errors FIXED!!

    Time Machine Errors FIXED!!
    My TM is now WORKING WELL for about 4 days without a single problem!!
    I had many of the Time Machine errors that others are dealing with. Here are some that I had:
    Error writing to backup log. NSFileHandleOperationException:* -[NSConcreteFileHandle writeData:]: Result too large
    Error: (-1401) copying ...
    Error: (-43) copying ...
    Error: (-50) copying ...
    Error: (-8088) copying ...
    Error: (22) setxattr for key:com.apple.backupd.SnapshotVolumeFSEventStoreUUID path:...
    Error: (-36) Creating directory 33CDCE6F-413B-4E5B-B807-561561AAE90C
    Failed to make snapshot.
    Error: (5) getxattr for key:com.apple.backupd.SnapshotState path:...
    Backup failed with error: 2
    Volume at path /Volumes/BackUp does not appear to be the correct backup volume for this computer.
    Backup failed with error: 18
    Error writing to backup log. NSFileHandleOperationException:* -[NSConcreteFileHandle writeData:]: Input/output error
    And other errors...
    I tried the following things, but these did not help:
    1. Reinstalled Leopard.
    2. Reinstalled 10.5.1.
    3. Reformatted my external USB drive (several times, GUID partition table).
    4. Excluded large files from TM.
    5. Turned off Spotlight.
    6. Repaired permissions.
    I found a posting somewhere (sorry, I can't find the original) that indicated there may be a problem with DiskUtility in Leopard. The post suggested that you re-partition your drive to have MORE THAN ONE PARTITION. Once that is done, you can re-partition your drive to have only one partition and that will fix the TM errors. So I used DiskUtility in Leopard to re-partition my drive to 16 partitions (16 is the max, 2 will probably work fine) with GUID (I have an Intel iMac). Once that was done, I immediately re-partitioned my drive to have only 1 partition (GUID). I started TM and it has run without a hitch since. So the problem may be with DiskUtility and NOT TM!

    If running Disk Utility while started up from the Mac OS X installation disc does not show the internal drive in the sidebar, it is possible that it has become faulty. However, try doing the following, if you have not done so already.
    Reset PRAM
    http://support.apple.com/kb/HT1379
    and if that does not improve the situation, reset SMU.
    http://support.apple.com/kb/HT1767
    Note: That is the procedure for an iMac G5, since you are posting in the iMac G5 category. However, you profile says 10.6.2, which is not possible for an iMac G5 (PowerPC), so if you have an Intel iMac, this is the procedure
    http://support.apple.com/kb/HT1543
    This is basically disconnecting all cables and power from the iMac, then reconnecting following a precise procedure. When you reconnect it to power, if you had it connected to an over-crowded or old power strip (surge suppressor), try connecting it directly to a wall outlet, at least initially. You want to make sure the iMac has a reliable power connection. Initially start it up with nothing connected, except for the power cord. If it does start up normally, connect only your standard keyboard/mouse and use it that way for a while. If it is still working normally, connect one peripheral device at a time; you may want to try restarting as a test since that was your problem. If the problem recurs at some point, note what device was connected last. It may be faulty in some way that is interfering with the iMac.
    If it still does not start up properly, even with nothing connected, please post back.

  • Invalid file specification object. How is this error fixed?

    Invalid file specification object. How is this error fixed?
    I am using Adobe Pro XI

    Hi mikruzo2,
    What version of Acrobat are you using?
    Does this happen with all files?
    Regards,
    Rave

  • Shuffle "cannot be read from or written to" error - FIXED

    To fix the error that occurs when we try to update or copy music from iTunes and that returns the message error -50 and/or 1481, we have to set the "Enable Disk Use" - at iPod settings tab on iTunes - as marked.
    OK, but this error occurs cause iTunes - when still running - unmount the iPod device (and I don't know why - hello Apple!); so, the time that we have to apply this setting is very shortly.
    So, we have to keep the iPod device mounted putting there a file, as a Notepad file, and open it when iTunes is closed and iPod device is mounted (plug in the iPod - iTunes will open -, remove the hardware (iPod), quit iTunes, plug in iPod again and open the file on iPod disk). Now we can open iTunes and set iPod as told before.

    Thanks for this thread. I kinda followed what you meant, but just in case anyone else is having any problems, here are the steps I took to 'fix' my shuffle 2nd gen:
    Here's what actually happens:
    Quote:
    * windows recognises ipod straight away as a removable hdd
    * itunes opens and reads the ipos
    * seconds later, windows ejects the drive on its own.
    * itunes thinks it's still there
    * any attemps to update anything via itunes, fail.
    Here's the fix:
    Quote:
    * create a new blank text file in notepad. Save it to your desktop. ctrl-c the file, ready to paste it somewhere else.
    * Open my computer, so you can see a list of your drives
    * plug the ipod in
    * watch for the ipod drive appearing, and QUICKLY open it, and ctrl-v the blank text file.
    * QUICKLY open the blank text file by double-clicking it. This will prevent windows from ejecting the ipod drive, because it's in use.
    * whilst in itunes, alter the preferences for the ipod... you need to 'enable disk use', as it's disabled by default.
    * save the changes, delete the text file if you wish, and exit itunes.
    All fixed.

  • Shuffle "cannot be read from or written to" error FIXED - windows xp

    This is a quote from another post, I'm not taking any credit for this fix. However, I spent HOURS trying to fix my Shuffle 2nd Gen. I did the 5R's, no help there, absolutely worthless. Even trying to Restore the shuffle, it would error. Basically every time I tried to communicate to the Shuffle, it would hang. Eventually I'd get the "cannot read or write" error, and sometimes that was error -50, sometimes 1418, sometime no code, just the "cannot read or write" error.
    On to the fix - FYI at the bottom where it says check "enable disk use" - mine is checked, but with all the room still reserved for songs. i.e., 0 meg for disk use. Also, the format I did was without the "quick format" box checked.
    Here is the quote: (formatted to be easier to follow)
    Alright, this is what I did, my only fix.
    1) Disconnect the iPod from the computer.
    2) Go to "start> right click my computer> manage> services and applications> services>
    3) Click iPod service> click stop service."
    4) Connect the ipod and it should show up in my computer.
    5) Format it so all content is gone. (ohno: right click, select format, uncheck "quick format" and click OK - should take just a couple seconds to format)
    6) Go back to "start> right click my computer>
    manage> services and applications> services> click iPod service> click Start service. This should have the service running again.
    7) Open iTunes and connect the shuffle. When it says to automatically fill it (the window that pops up) dont unclick it, proceed so the shuffle autofills. Before it stops autofilling, quickly go to the settings tab. Then, scroll down to where it says "enable disk use" and check the box, then hit apply. Don't worry about the slider position for disk space, mine has worked with this all the way to the left with 0 meg for disk use.
    8) Done.
    9) How to use: drag and drop songs / playlists in iTunes onto your iPod within the iTunes device list, just hit the eject button next to your iPod device when done.
    All management done from iTunes, for some reason formatting via windows and then enabling disk use cleans up the Shuffle, and allows windows to communicate with it. Mine works 100% now.
    Only thing is I have not tried the Autofill commands as I don't use them. I drag and drop what I want onto the iPod and it immediately updates. Finally.

    I'm a new iPod owner and have spent the past 3 days researching solutions to this problem. Through research and testing I came to the same conclusion. I fixed mine using a slightly different solution:
    I took the Shuffle to a local Apple store, had them enable disk usage, brought it home and everything works perfectly now.
    The key to the problem is this: When you plug in the iPod, Windows sees it as a mass storage device. As soon as the iPod system service kicks in, it acquires the mass storage device and disallows Windows from seeing it.

  • Memory could not be read Error Fixed

    At least 6 months ago, I noticed that every time I opened my
    default page in Dreamweaver and closed it, Dreamweaver would crash.
    I would get the famous Application Error, "The instruction at
    "0x5ad71531" referenced memory at "0x00000014". The memory could
    not be "read". Click OK to terminate the program."
    What I figured out is that right about that time, I had
    switched my default browser for viewing to Firefox Mozilla.
    Today, while I was testing some things out, I noticed that
    the Check Browser Support list, only had Internet Explorer and
    Netscape.
    After I added Firefox Mozilla to the list of browser to check
    compatibility for, the problem disappeared.
    Go figure.

    > At least 6 months ago, I noticed that every time I
    opened my default page in
    > Dreamweaver and closed it, Dreamweaver would crash. I
    would get the famous
    > Application Error, "The instruction at "0x5ad71531"
    referenced memory at
    > "0x00000014". The memory could not be "read". Click OK
    to terminate the
    > program."
    >
    > What I figured out is that right about that time, I had
    switched my default
    > browser for viewing to Firefox Mozilla.
    >
    > Today, while I was testing some things out, I noticed
    that the Check Browser
    > Support list, only had Internet Explorer and Netscape.
    >
    > After I added Firefox Mozilla to the list of browser to
    check compatibility
    > for, the problem disappeared.
    Great detective work!
    I can't seem to reproduce this problem. What version of DW do
    you use?
    Was Internet Explorer or Netscape defined as either Primary
    or Secondary
    browsers? Any other details to help me reproduce this so we
    can fix it
    if it's still in the code?
    Thanks,
    Randy

  • I recently got my GPU error fixed, but now my MacBook Pro shuts down whenever I close the lid.

    I bought my computer in July 2010.  After 3 and a half years I finally discovered there was and an issue.  GPU error. Fine. ok.  I went to the store and even though they were nice enough to fix it for free, I'm now having another issue.  Whenever I shut my computer lid, the screen and keyboard doesn't work.  I can hear the computer fans but no matter what I do I can't get the keyboard or screen to work.  In order to get it to turn back on, I have to hold down the power button until I hear the inside turn off.  Then I have to hold the power button again to turn it back on.  DId they give me a faulty part when they fixed it? Or is there something I can do? My computer is in great condition. No scratches, never been dropped, etc.  HOW DO I GET MY SCREEN AND KEYBOARD TO WORK?

    Try resetting the  SMC http://support.apple.com/kb/ht3964
    If not take it back to where you had the work done.

  • Adobe reader 11 error fix

    I installed the new reader 11 and now have problems opening up my files now. I get the error "Adobe failed to load its core dll." As an IT professional, it means that the program is corrupt somewhere. I did the basic troubleshooting such as in-uninstalling, deleting the reader folder out of the adobe folder. My system is Win 7, 64 bit. This problem also occurred when adobe reader was at 10. I need help. When Im in MS Word, it makes the .pdf but when I try to open it, it gives me that error. I even went on ahead and got a trail sample of acrobat pro 10, in hopes that maybe it will fix the error, but it has not. I really need an answer from a Adobe staff member because they know the product. What folder do I need to go into to try and find the missing data this program needs? Ive done all kinds of trouble shooting and it still doesn't work, and I even did a system restore, and THAT didnt help neither. Please help.
    Ms. Z

    There is no guarantee that Adobe staff will reply here in this user-to-user forum.
    Can you find anything in here that helps: http://blogs.adobe.com/dmcmahon/2009/04/12/acrobatreader-acrobat-fail-to-load-its-core-dll -error-after-installation/ ?
    Also, another user reported earlier today that the same message was the result of a rootkit infection.  Is your system clean of malware?

  • How to make xml validation with automatic error fixed

    Hi', i have some string which i want to validate it:
    String word = "<style>body {background-color:transparent}";     
    byte[] bytes = word.getBytes();
    InputStream inputStream = new ByteArrayInputStream(bytes);
    DocumentBuilderFactory docBuilderFactory = DocumentBuilderFactory.newInstance();
    docBuilderFactory.setValidating(true);                    
    DocumentBuilder docBuilder = docBuilderFactory.newDocumentBuilder();
    DOcument doc = docBuilder.parse(inputStream);This code will produce some exception like this:
    Warning: validation was turned on but an org.xml.sax.ErrorHandler was not set, which is probably not what is desired.  Parser will use a default ErrorHandler to print the first 10  errors.  Please call the setErrorHandler method to fix this.
    Error: URI = "null", Line = "1", : Document root element "style", must match DOCTYPE root "null".
    Error: URI = "null", Line = "1", : Document is invalid: no grammar found.
    org.xml.sax.SAXParseException: XML document structures must start and end within the same entity.Is there anyway to make this validation not only show the errors but automatic fix it?
    Thanks a lot...

    I mean there is no general method which is capable of correcting all possible errors found by schema validation.
    For example if the validation says it expected to find an <organization> element or a <company> element but it found a <banana> element, there is no way to determine what repair is necessary.
    Anyway the requirement is fighting against the way things work in the real world. The purpose of validation is just to find out whether a document matches a schema. If it doesn't, then too bad. Send it back to be fixed or replaced. If you are having a problem because you repeatedly get documents which don't quite match your schema, then you need to train the users to produce valid documents or to give them tools which help them do that.

  • Syntax error fix needed for "...getHelperForLanguage: function(language) null,..."

    Getting the syntax error, and having limited technical experience, I do not know how to fix the problem. This is in regard to a web site asset, an mp3 file. I am having problems getting such files to play within Chrome (though they play in Internet Explorer, for instance), so I am trying to troubleshoot from within Dreamweaver, as well as from the Chrome extensions side.
    Here is the line including the syntax error, with additional lines
        getInterfaces: function(countRef) {
            var interfaces = [Ci.nsIDOMGeoPositionCoords, Ci.nsIClassInfo, Ci.nsISupports];
            countRef.value = interfaces.length;
            return interfaces;
    getHelperForLanguage: function(language) null,
        contractID: "",
    Thanks for help.

    Use HTML5 <audio>. 
    <!doctype html>
    <html>
    <head>
    <meta charset="utf-8">
    <title>HTML5 Audio Demo</title>
    <!--[if lt IE 9]><script src="http://html5shiv.googlecode.com/svn/trunk/html5.js"></script><![endif]-->
    </head>
    <body>
    <audio controls>
    <source src="path/yourSong.ogg" type="audio/ogg">
    <source src="path/yourSong.mp3" type="audio/mp3">
    <p>Ooooops.  Looks like your browser is out of date and doesn't support the audio tag.  Please upgrade to a modern browser.</p>
    </audio>
    </body>
    </html>
    Nancy O.

  • Hi all..very urgent..error fixing..

    Hi i am running a program in ECC 6.0...its going for short dump..The possibilty of going for short dumb wud be here in the following code..kindly lookinto this in ECC 6.0..full marks wud be given
    -->  p1        text
    <--  p2        text
    FORM BUILD_HEADER_CATALOG_03.
      REFRESH: EVENTCAT.
      CLEAR EVENTCAT_LN.
      EVENTCAT_LN-NAME = 'TOP_OF_PAGE'.
      EVENTCAT_LN-FORM = 'TOP_OF_PAGE_01'.
      APPEND EVENTCAT_LN TO EVENTCAT.
    ENDFORM.                    " BUILD_HEADER_CATALOG_03
    *&      Form  BUILD_FIELD_CATALOGS_03
          text
    -->  p1        text
    <--  p2        text
    FORM BUILD_FIELD_CATALOGS_03.
      REFRESH: I_FIELDCAT.
    material
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'MATNR'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Material'.
      V_FIELDCAT_LN-REF_TABNAME   = 'S947'.
      V_FIELDCAT_LN-DDICTXT       = 'L'.
      V_FIELDCAT_LN-OUTPUTLEN     = 19.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    red/stop light icon
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'ICON1'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = ' '.
      V_FIELDCAT_LN-ICON          = 'X'.
      V_FIELDCAT_LN-OUTPUTLEN     = 2.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    yellow light icon
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'ICON2'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = ' '.
      V_FIELDCAT_LN-ICON          = 'X'.
      V_FIELDCAT_LN-OUTPUTLEN     = 2.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    mvgr2
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'MVGR2'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Dept.'.
      V_FIELDCAT_LN-REF_TABNAME   = 'MVKE'.
      V_FIELDCAT_LN-DDICTXT       = 'L'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-NO_OUT        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    mvgr3
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'MVGR3'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Class'.
      V_FIELDCAT_LN-REF_TABNAME   = 'MVKE'.
      V_FIELDCAT_LN-DDICTXT       = 'L'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-NO_OUT        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    mvgr4
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'MVGR4'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Sub-class'.
      V_FIELDCAT_LN-REF_TABNAME   = 'MVKE'.
      V_FIELDCAT_LN-DDICTXT       = 'L'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-NO_OUT        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    reference unit of measure
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'MEINS'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-DDICTXT       = 'L'.
      V_FIELDCAT_LN-OUTPUTLEN     = 3.
      V_FIELDCAT_LN-NO_OUT        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    allocation month 1
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'ALLOCATION1'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Alloc.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    booked qty month 1
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'BOOKED1'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Booked'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    diffirence qty month 1
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'DIFFERENCE1'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Diff'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    rejected qty month 1
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'REJECTED1'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Rej.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    allocation month 2
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'ALLOCATION2'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Alloc.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    booked qty month 2
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'BOOKED2'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Booked'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    diffirence qty month 2
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'DIFFERENCE2'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Diff'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    rejected qty month 2
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'REJECTED2'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Rej.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    allocation month 3
      V_FIELDCAT_LN-FIELDNAME     = 'ALLOCATION3'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Alloc.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    booked qty month 3
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'BOOKED3'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Booked'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    diffirence qty month 3
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'DIFFERENCE3'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Diff'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    rejected qty month 3
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'REJECTED3'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Rej.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 6.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    total allocation
      V_FIELDCAT_LN-FIELDNAME     = 'TOTAL_ALLOCATION'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Alloc.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 7.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    total booked
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'TOTAL_BOOKED'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Booked'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 7.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    total difference
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'TOTAL_DIFFERENCE'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Diff'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 7.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    total rejected
      CLEAR: V_FIELDCAT_LN.
      V_FIELDCAT_LN-FIELDNAME     = 'TOTAL_REJECTED'.
      V_FIELDCAT_LN-TABNAME       = 'REPORT_03'.
      V_FIELDCAT_LN-SELTEXT_L     = 'Rej.'.
      V_FIELDCAT_LN-QFIELDNAME    = 'MEINS'.
      V_FIELDCAT_LN-REF_TABNAME   = 'VBAP'.
      V_FIELDCAT_LN-REF_FIELDNAME = 'KWMENG'.
      V_FIELDCAT_LN-QTABNAME      = 'REPORT_03'.
      V_FIELDCAT_LN-OUTPUTLEN     = 7.
      V_FIELDCAT_LN-JUST          = 'C'.
      V_FIELDCAT_LN-NO_ZERO       = 'X'.
      V_FIELDCAT_LN-DO_SUM        = 'X'.
      APPEND V_FIELDCAT_LN TO I_FIELDCAT.
    sort 1
      REFRESH: I_SORT.
      CLEAR: H_SORT.
      H_SORT-SPOS      = 1.
      H_SORT-FIELDNAME = 'MVGR2'.
      H_SORT-TABNAME   = 'REPORT_03'.
      H_SORT-UP        = 'X'.
      H_SORT-SUBTOT    = 'X'.
      APPEND H_SORT TO I_SORT.
      CLEAR: H_SORT.
      H_SORT-SPOS      = 2.
      H_SORT-FIELDNAME = 'MVGR3'.
      H_SORT-TABNAME   = 'REPORT_03'.
      H_SORT-UP        = 'X'.
      H_SORT-SUBTOT    = 'X'.
      APPEND H_SORT TO I_SORT.
      CLEAR: H_SORT.
      H_SORT-SPOS      = 3.
      H_SORT-FIELDNAME = 'MVGR4'.
      H_SORT-TABNAME   = 'REPORT_03'.
      H_SORT-UP        = 'X'.
      H_SORT-SUBTOT    = 'X'.
      APPEND H_SORT TO I_SORT.
      CLEAR: H_SORT.
      H_SORT-SPOS      = 4.
      H_SORT-FIELDNAME = 'MATNR'.
      H_SORT-TABNAME   = 'REPORT_03'.
      H_SORT-UP        = 'X'.
      H_SORT-SUBTOT    = ''.
      H_SORT-GROUP     = ''.
      APPEND H_SORT TO I_SORT.
    ENDFORM.                    " BUILD_FIELD_CATALOGS_03
    *&      Form  PERFORM_ALV_03
          text
    -->  p1        text
    <--  p2        text
    FORM PERFORM_ALV_03.
    layouts
      G_REPID = SY-REPID.
      LAYOUT-ZEBRA                = 'X'.
      LAYOUT-COLWIDTH_OPTIMIZE    = ''.
      LAYOUT-BOX_TABNAME          = '1'.
      LAYOUT-GET_SELINFOS         = 'X'.
      LAYOUT-DETAIL_POPUP         = 'X'.
      LAYOUT-NO_SUBTOTALS         = ''.
      LAYOUT-GROUP_CHANGE_EDIT    = 'X'.
      PRINT-NO_PRINT_SELINFOS     = ''.
      PRINT-NO_PRINT_LISTINFOS    = ''.
    Output a simple list (single line or several lines)
      CALL FUNCTION 'REUSE_ALV_LIST_DISPLAY'
        EXPORTING
          I_CALLBACK_PROGRAM       = G_REPID
          IS_LAYOUT                = LAYOUT
          I_CALLBACK_PF_STATUS_SET = G_STATUS2
          I_CALLBACK_USER_COMMAND  = G_USER_COMMAND_01
          IT_FIELDCAT              = I_FIELDCAT
          I_DEFAULT                = 'X'
          I_SAVE                   = 'A'
          IT_EVENTS                = EVENTCAT
          IS_PRINT                 = PRINT
          IT_SORT                  = I_SORT[]
        TABLES
          T_OUTTAB                 = REPORT_03
        EXCEPTIONS
          PROGRAM_ERROR            = 1
          OTHERS                   = 2.
    ENDFORM.                    " PERFORM_ALV_03

    Hi Sahil,
       If you see in dumb screen, you can fix the exact line of code.
    Can you tell the line.
    Note: An arrow mark will be pointing your code where error occured and the description also will be there.
    Thanks,
    Rajesh

  • None of the -8008 error fixes working!

    I was able to download tv show purchases two weeks ago, but tonight i've gotten the dreaded 8008 error on 6 different files...only songs downloads are successfull.
    I've tried the delete the .tmp fixes to no avail...got a long flight tomorrow and no new iTunes TV shows to help pass the time.
    I'm using XP, but nothing has changed on my end so I am confused as to what it going wrong now?

    Since the iPhone should not be opened or repaired by the user or another 3rd party without loosing the warranty or the Out-Of-Warranty Service option, we can only speculate, that one of the repair steps you took is the reason for the problems.
    The only solution would be seeking help from a 3rd party repair shop and hope that they will be able to solve the issue.

  • My error fixed #-35___ by using DiskWarrior

    Sorry about the error number I have forgotten it. Maybe 35402-72 This was under IDVD06 and i was getting a error #-1 under IDVD05.
    For me I just couldn't burn anything or create a Image at all on either version. Even with the new Magic DVD feature on 06.
    I couldn't find a problem. I tried fixing permissions but no underlying errors where found. Until I popped Diskwarrior in and it found numerous on my start up disk. After the repair I tried to IDVD06 again a bingo worked 1st time.
    I hope this will help anyone who just can't burn anything or create a image

    Thanks for the report!!!

Maybe you are looking for

  • Calling a method from an external component

    Hi All: I have comp1 with a view1 and comp2 with a view2. If I have view 2 embed in view1, how can I call a method in view2 from view1. I´m new in Web Dynpro, so I will appreciate a little bit of help. Thanks

  • CS6 Auto-Save: 1 step forward, 1 step back

    I have done a little testing with the auto-save, and there is some progress with CS6 - especially in the area where earlier versions would stop playback or scrubbing to fire off an auto-save.  It looks like the auto-save does not stop playback or scr

  • Employee Expense Report ( US Nacha) in excel output...

    Hello, I developed e-text template which gives .csv output with AP Payment processing ( Format Instruction Payments). I asked the user to save the output with .csv extension and open it again in excel.But user needs the output in excel itself which I

  • Concatenate text and property of dimension in script logic

    hello experts, how to concatenate text and property of dimension in script logic? as example: dimension : interco property    : mgmtallocdefcc *WHEN TIME.YEAR *IS %YEAR_VAR% *REC(EXPRESSION=%VALUE%,ACCOUNT=12345,ENTITY="I_" [INTERCO],MGMTALLOCDEFCC)

  • FireFox 4 beta 8 freezes on startup, 25 CPU usage, over 2 GB RAM usage

    Safe Mode does not work, the same thing happens if I do that. I have tried uninstalling, restarting and reinstalling but the same thing still happens again. What else can I do? I have also tried going back to the 3.6 release of FireFox but it crashes