Report for Power Injector State

I need a report for all Power Inyector installed with a AP, how i have this information in a report?
please i need help

The is no way to detect if your using a power injector or not.  There are commands to enable if your using a power injector, but that doesn't mean its not connected to a PoE switch.  
That would be a manual process of going to each ap and looking.

Similar Messages

  • Power Injector State

    We have 1131 LWAP's and WCS v.5.0.56.2
    On the controller you have a checkbox when configuring AP's that enables the AP's to override the POE capabilities of the switch. I've been searching in the WCS for the same checkbox, but cant find it. Has Cisco forgot this option in WCS?

    Hi Stefan,
    Sadly this setting cannot be changed via the WCS :( This restriction has carried across all Versions/Releases of the WCS.
    Hope this helps!
    Rob

  • Report for stock statement

    hi guy's,
       i am doing report for the stock statement .... my issue is in MB5B if i reverse some document it shows as it move's to issue QTY and my receipt is same but my closing stock is correct ...is there any std report avalible ....
    thank's in advance

    Use this code :
    TABLES : MSEG,MKPF,MARA,MAKT,BEWART,MSLB,BSIM.
    TYPE-POOLS : SLIS.
    DATA : IT_FLDCAT TYPE SLIS_T_FIELDCAT_ALV,
           IT_LIST_HEADER TYPE SLIS_T_LISTHEADER,
           IT_EVENTS TYPE SLIS_T_EVENT,
           GS_LAYOUT TYPE SLIS_LAYOUT_ALV,
           WA_SORT TYPE SLIS_SORTINFO_ALV,
           IT_SORT TYPE SLIS_T_SORTINFO_ALV,
           REPID LIKE SY-REPID,
           FRM_DATE(10),TO_DATE(10),
           DISPTEXT(255),DISPTEXT2(255).
    TYPES : BEGIN OF ST_OPBAL,
             MATNR LIKE MSEG-MATNR,
             MAKTX LIKE MAKT-MAKTX,
             BATCH LIKE MSEG-CHARG,
             BWART LIKE MSEG-BWART,
             MENGE LIKE MSEG-MENGE,
             ZEILE LIKE MSEG-ZEILE,
             WERKS LIKE MSEG-WERKS,
             SOBKZ LIKE MSEG-SOBKZ,
             BUDAT LIKE MKPF-BUDAT,
             SHKZG LIKE MSEG-SHKZG,
             DMBTR LIKE MSEG-DMBTR,
             MBLNR LIKE MSEG-MBLNR,
             LGORT LIKE MSEG-LGORT,
           END OF ST_OPBAL.
    DATA : OPBAL TYPE ST_OPBAL OCCURS 0 WITH HEADER LINE,
           TMP_OPBAL TYPE ST_OPBAL OCCURS 0 WITH HEADER LINE.
    DATA : BEGIN OF BAL_NOREF OCCURS 0,
              MATNR LIKE MARA-MATNR,
              SHKZG LIKE MSEG-SHKZG,
              DMBTR LIKE MSEG-DMBTR,
           END OF BAL_NOREF.
    DATA : BEGIN OF OPBAL2 OCCURS 0,
             SNO(3)      TYPE N,
             MATNR       LIKE MSEG-MATNR,
             MAKTX       LIKE MAKT-MAKTX,
             OP_BAL      LIKE MSEG-MENGE,
             OP_STKVAL   LIKE MSEG-DMBTR,   "NEW
             REC         LIKE MSEG-MENGE,
             T_OPBAL_REC LIKE MSEG-MENGE,
             REC_STKVAL  LIKE MSEG-DMBTR,   "NEW
             ISS         LIKE MSEG-MENGE,
             ISS_STKVAL  LIKE MSEG-DMBTR,   "NEW
             SALES       LIKE MSEG-MENGE,
             T_ISS       LIKE MSEG-MENGE,
             CL_BAL      LIKE MSEG-MENGE,
             BATCH       LIKE MSEG-CHARG,
             SUBCON      LIKE MSEG-MENGE,
             CL_STKVAL   LIKE MSEG-DMBTR,
           END OF OPBAL2.
    DATA  SERNO(4) TYPE C.
    DATA OPTOT  TYPE P DECIMALS 3.
    DATA RECTOT TYPE P DECIMALS 3.
    DATA ISSTOT TYPE P DECIMALS 3.
    DATA TOTALL TYPE P DECIMALS 3.
    DATA FLG        TYPE N.
    DATA FLAG       TYPE N.
    DATA STOCKVAL        TYPE MSEG-DMBTR.
    DATA REC_STOCKVAL    TYPE MSEG-DMBTR.
    DATA ISS_STOCKVAL    TYPE MSEG-DMBTR.
    DATA CL_STKVAL       TYPE MSEG-DMBTR.
    SELECTION-SCREEN BEGIN OF BLOCK X WITH FRAME.
         SELECT-OPTIONS: P_MATNR FOR MSEG-MATNR,
                         P_MGRP  FOR MARA-MATKL,
                         P_DATE FOR MKPF-BUDAT,
         P_PLANT FOR MSEG-WERKS DEFAULT  'NB01' OBLIGATORY NO INTERVALS
                                                    NO-EXTENSION .
         SELECT-OPTIONS: P_STLOC FOR MSEG-LGORT NO INTERVALS NO-EXTENSION.
    SELECTION-SCREEN END OF BLOCK X.
    INITIALIZATION.
       REPID = SY-REPID.
       PERFORM FILL_FLDCAT USING IT_FLDCAT.
       PERFORM FILL_EVENTS USING IT_EVENTS.
       PERFORM FILL_LAYOUT USING GS_LAYOUT.
    START-OF-SELECTION.
      CONCATENATE P_DATE-LOW6(2) '.' P_DATE-LOW4(2) '.' P_DATE-LOW+0(4)
      INTO FRM_DATE.
      CONCATENATE P_DATE-HIGH6(2) '.' P_DATE-HIGH4(2) '.' P_DATE-HIGH+0(4)
      INTO TO_DATE.
      CONCATENATE TEXT-003 FRM_DATE' TO : ' TO_DATE INTO DISPTEXT.
      CONCATENATE TEXT-004 P_PLANT-LOW ' Storage Location : ' P_STLOC-LOW
      INTO DISPTEXT2.
      PERFORM FILL_HEADER USING IT_LIST_HEADER.
      SELECT  A~MATNR
              F~MAKTX
              A~CHARG
              A~BWART
              A~MENGE
              A~ZEILE
              A~WERKS
              A~SOBKZ
              D~BUDAT
              A~SHKZG
              A~DMBTR
              A~MBLNR
              A~LGORT
              INTO TABLE OPBAL
       FROM MKPF AS D JOIN MSEG AS A
               ON DMBLNR = AMBLNR  AND
                  DMJAHR = AMJAHR
            JOIN MARA AS E
               ON EMATNR = AMATNR
            JOIN MAKT AS F
               ON FMATNR = AMATNR
       WHERE   A~MATNR IN P_MATNR
         AND   A~WERKS IN P_PLANT
         AND   A~KZBEW IN (' ','B')
         AND   E~MATKL IN P_MGRP
         AND   A~BWART NOT IN ('541','542','321','322','121')
         AND   A~KZVBR NOT IN ('A')
         AND   D~BUDAT LE P_DATE-HIGH.
    LOOP AT OPBAL WHERE BWART EQ '544' AND LGORT EQ ''.
       TMP_OPBAL = OPBAL.
       APPEND TMP_OPBAL.
    ENDLOOP.
    DELETE OPBAL WHERE ( BWART EQ '309' AND DMBTR EQ 0  ).
    DELETE OPBAL WHERE ( BWART NE '543' AND LGORT EQ '' ).
    LOOP AT TMP_OPBAL.
       OPBAL = TMP_OPBAL.
       APPEND OPBAL.
    ENDLOOP.
    STOCKVAL = 0.
    SORT OPBAL BY MATNR BATCH BUDAT.
    LOOP AT OPBAL.
      SELECT SINGLE LBLAB INTO MSLB-LBLAB FROM MSLB
                            WHERE MATNR = OPBAL-MATNR.
      IF OPBAL-BUDAT LT P_DATE-LOW.
         IF OPBAL-SHKZG = 'H'.
            OPTOT = OPTOT - OPBAL-MENGE.
         ELSEIF OPBAL-SHKZG = 'S'.
            OPTOT = OPTOT + OPBAL-MENGE.
         ENDIF.
    For the duration   II part  *****************
      ELSEIF OPBAL-BUDAT IN P_DATE.
         IF OPBAL-SHKZG = 'H'.
            ISSTOT      = ISSTOT + OPBAL-MENGE.
         ELSEIF OPBAL-SHKZG = 'S'.
            RECTOT = RECTOT + OPBAL-MENGE.
         ENDIF.
      ENDIF.
    AT END OF BATCH. " modified for chek
       READ TABLE OPBAL INDEX SY-TABIX.
       CLEAR BAL_NOREF. REFRESH BAL_NOREF.
       SELECT MATNR SHKZG SUM( DMBTR )
         INTO TABLE BAL_NOREF
         FROM BSIM
        WHERE BUDAT LT P_DATE-LOW  AND
              MATNR EQ OPBAL-MATNR AND
              BWTAR EQ OPBAL-BATCH AND
              BWKEY IN P_PLANT     AND
              BLART IN ('RE','WE','WA','PR')
        GROUP BY MATNR SHKZG.
       LOOP AT BAL_NOREF.
          IF BAL_NOREF-SHKZG = 'H'.
             STOCKVAL = STOCKVAL - BAL_NOREF-DMBTR.
          ELSE.
             STOCKVAL = STOCKVAL + BAL_NOREF-DMBTR.
          ENDIF.
       ENDLOOP.
       CLEAR BAL_NOREF. REFRESH BAL_NOREF.
       SELECT MATNR SHKZG SUM( DMBTR )
         INTO TABLE BAL_NOREF
         FROM BSIM
        WHERE BUDAT IN P_DATE AND
              MATNR EQ OPBAL-MATNR AND
              BWTAR EQ OPBAL-BATCH AND
              BWKEY IN P_PLANT     AND
              BLART IN ('RE','WE','WA','PR')
        GROUP BY MATNR SHKZG.
       LOOP AT BAL_NOREF.
          IF BAL_NOREF-SHKZG = 'H'.
             ISS_STOCKVAL = ISS_STOCKVAL + BAL_NOREF-DMBTR.
          ELSE.
             REC_STOCKVAL = REC_STOCKVAL + BAL_NOREF-DMBTR.
          ENDIF.
       ENDLOOP.
       " MSLB-LBLAB (STOCK WITH SUBCONTRACTOR).
       CL_STKVAL       = STOCKVAL + REC_STOCKVAL - ISS_STOCKVAL.
       TOTALL =  OPTOT + RECTOT - ISSTOT.
       IF OPTOT = '0'   AND RECTOT = '0'  AND ISSTOT = '0'.
          FLG = 1.
       ENDIF.
       IF FLG = 1.
          CLEAR FLG.
       ELSE.
          SERNO = SERNO + 1.
          OPBAL2-SNO         = SERNO.
          OPBAL2-MATNR       = OPBAL-MATNR.
          OPBAL2-MAKTX       = OPBAL-MAKTX.
          OPBAL2-OP_BAL      = OPTOT.
          OPBAL2-REC         = RECTOT.
          OPBAL2-T_OPBAL_REC = OPTOT + RECTOT.
          OPBAL2-ISS         = ISSTOT.
          OPBAL2-T_ISS       = ISSTOT.
          OPBAL2-CL_BAL      = TOTALL.
          OPBAL2-BATCH       = OPBAL-BATCH.
          OPBAL2-SUBCON      = MSLB-LBLAB.
          OPBAL2-OP_STKVAL   = STOCKVAL.
          OPBAL2-ISS_STKVAL  = ISS_STOCKVAL.
          OPBAL2-REC_STKVAL  = REC_STOCKVAL.
          OPBAL2-CL_STKVAL   = CL_STKVAL.
          APPEND OPBAL2.
       ENDIF.
      OPTOT = 0.
      RECTOT = 0.
      ISSTOT = 0.
      STOCKVAL = 0.
      ISS_STOCKVAL = 0.
      REC_STOCKVAL = 0.
      CL_STKVAL    = 0.
    ENDAT.
    ENDLOOP.
      WA_SORT-SPOS = 1.
      WA_SORT-FIELDNAME = 'MATNR'.
      WA_SORT-UP = 'X'.
    WA_SORT-SUBTOT = 'X'.
    APPEND WA_SORT TO IT_SORT.
    CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
        EXPORTING
          I_CALLBACK_PROGRAM = REPID
          IT_FIELDCAT        = IT_FLDCAT
          IT_EVENTS          = IT_EVENTS
          IS_LAYOUT          = GS_LAYOUT
          IT_SORT            = IT_SORT
        TABLES
          T_OUTTAB           = OPBAL2.
    FORM FILL_FLDCAT USING P_FLDCAT TYPE SLIS_T_FIELDCAT_ALV.
       PERFORM FILL_PARAM_FLDCAT USING  1 'SNo'          'SNO'       ' ' 'X'
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  2 'Material No.' 'MATNR'     ' ' 'X'
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  3 'Description'  'MAKTX'     ' ' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  4 'Op.Bal'      'OP_BAL'     'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  5 'Op.Stock Val' 'OP_STKVAL' 'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  6 'Receipts'     'REC'       'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  7 'Total'     'T_OPBAL_REC'  'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  8 'Rect.Val.' 'REC_STKVAL'   'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING  9 'Issues'    'ISS'          'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 10 'Iss. Val.' 'ISS_STKVAL'   'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 11 'Cl. Bal.'     'CL_BAL'    'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 12 'Cl.Stock Val' 'CL_STKVAL' 'X' ' '
       'OPBAL2' P_FLDCAT.
       PERFORM FILL_PARAM_FLDCAT USING 13 'BATCH '       'BATCH'     ' ' ' '
       'OPBAL2' P_FLDCAT.
    ENDFORM.
    FORM FILL_PARAM_FLDCAT USING VALUE(P_COL) VALUE(P_TEXT) VALUE(P_FLDNAME)
                           VALUE(P_DOSUM) VALUE(P_NOZERO) VALUE(P_TABNAME)
                           PP_FLDCAT TYPE SLIS_T_FIELDCAT_ALV.
       DATA : WA_FLDCAT TYPE SLIS_FIELDCAT_ALV.
       CLEAR WA_FLDCAT.
         WA_FLDCAT-COL_POS   = P_COL.
         WA_FLDCAT-SELTEXT_M = P_TEXT.
         WA_FLDCAT-FIELDNAME = P_FLDNAME.
         WA_FLDCAT-TABNAME   = P_TABNAME.
         WA_FLDCAT-DO_SUM    = P_DOSUM.
         WA_FLDCAT-NO_ZERO   = P_NOZERO.
       APPEND WA_FLDCAT TO PP_FLDCAT.
    ENDFORM.
    FORM FILL_HEADER USING P_IT_LIST_HEADER TYPE SLIS_T_LISTHEADER.
      DATA: LS_LINE TYPE SLIS_LISTHEADER.
      CLEAR LS_LINE.
      LS_LINE-TYP = 'S'.
      LS_LINE-INFO = TEXT-002.
      APPEND LS_LINE TO P_IT_LIST_HEADER.
      CLEAR LS_LINE.
      LS_LINE-TYP = 'S'.
      LS_LINE-INFO = DISPTEXT.
      APPEND LS_LINE TO P_IT_LIST_HEADER.
      CLEAR LS_LINE.
      LS_LINE-TYP = 'S'.
      LS_LINE-INFO = DISPTEXT2.
      APPEND LS_LINE TO P_IT_LIST_HEADER.
    ENDFORM.
    FORM FILL_EVENTS USING P_IT_EVENTS TYPE SLIS_T_EVENT.
       DATA LS_EVENT TYPE SLIS_ALV_EVENT.
       MOVE 'TOP_OF_PAGE' TO LS_EVENT-FORM.
       MOVE 'TOP_OF_PAGE' TO LS_EVENT-NAME.
       APPEND LS_EVENT TO P_IT_EVENTS.
    ENDFORM.
    FORM TOP_OF_PAGE.
      CALL FUNCTION 'REUSE_ALV_COMMENTARY_WRITE'
       EXPORTING
         IT_LIST_COMMENTARY       = IT_LIST_HEADER.
    ENDFORM.
    FORM FILL_LAYOUT USING P_GS_LAYOUT TYPE SLIS_LAYOUT_ALV.
       P_GS_LAYOUT-COLWIDTH_OPTIMIZE = 'X'.
       P_GS_LAYOUT-ZEBRA             = 'X'.
       P_GS_LAYOUT-FLEXIBLE_KEY      = 'X'.
    ENDFORM.
    FOR TESTING PURPOSE.
    *SORT OPBAL BY BUDAT.
    *CALL FUNCTION 'REUSE_ALV_GRID_DISPLAY'
       EXPORTING
         I_CALLBACK_PROGRAM = REPID
         IT_FIELDCAT        = IT_FLDCAT
         IT_EVENTS          = IT_EVENTS
       TABLES
         T_OUTTAB           = OPBAL.
    *FORM FILL_FLDCAT USING P_FLDCAT TYPE SLIS_T_FIELDCAT_ALV.
      PERFORM FILL_PARAM_FLDCAT USING  1 'MBLNR'        'MBLNR'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  2 'CREDIT/DEBIT' 'SHKZG'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  3 'MOV.TYP.'     'BWART'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  4 'ST.LOC.'     'LGORT'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  5 'STOCK VAL'    'DMBTR'
      'OPBAL' P_FLDCAT.
      PERFORM FILL_PARAM_FLDCAT USING  6 'POS.DATE'     'BUDAT'
      'OPBAL' P_FLDCAT.
    *ENDFORM.

  • LWAP PoE settings when using power injector

    We have 3500 series access points connected to a 5508 WLC. What power over ethernet option should I select for an AP thats using a power injector? Prestandard State or Power Injector State?

    Just leave it alone.  This setting is for old APs like the 1130 and 1240 and older.

  • Reconcillation report for controlling

    My requirement as follows.
    this is a report for developing reconcillation statement for a company.
    i created program as per requirement it is not executing becasuse of  COEP table taking much time for executing.
    any body have reconcillation report with sourcode kindly forward me.
    TECHNICAL SPECIFICATIONS FOR RECONCILIATION REPORT
    SELECTION SCREEN:
    COMPANY CODE:  T001-BUKRS
    FISCAL YEAR         :  BKPF-GJAHR
    PERIOD                :  BKPF-MONAT
    OUTPUT FORMAT:
         PARTICULARS     AMOUNT
    A     TOTAL OF FI P/L ACCOUNTS     
    B     LESS: TOTAL OF FI P/L ACCOUNTS NOT FLOWN TO CO (including VVGK values)     
    C     TOTAL OF FI P/L ACCOUNTS FLOWN TO CO     
    D     TOTAL OF COST VOLUME (MAT+ FEK+MGK+WVK)     
    E     LESS : TOTAL OF RECONCILIATION ITEMS (ITEMS APPEARING ONLY IN CO - FOR E.G. ED,CC ETC)     
    F     (D) – (E)     
         RECONCILIATION -
    ( C ) = ( F )     
    START OF FIELD A
    TABLE : SKB1 (G/L Account Master Table)
    INPUT :  BUKRS (Company Code)
    SAKNR - NUMBER RANGE  4* (G/L Account No.)
    OUTPUT : SAKNR (G/L Account No)
    Result : This step will provide a list of Expenses G/L Accounts
    TABLE : GLT0 (G/L Account Balances table)
    INPUT :  BUKRS (Company Code)
    SAKNR - NUMBER RANGE  4*) (G/L Account No.)
    DRCRK = S (Debit / Credit Indicator)
    RYEAR =  GJAHR (Fiscal year)
    OUTPUT :  HSL0*( * -PERIOD ENTERED IN SELECTION) [G/L Account Balance Amount field in the Table]
    SORT AND SUM  SAKNR WISE WHILE DISPLAYING IN THE REPORT
    Result : This step will provide balances for the list of the  expenses G/L accounts fetched from table SKB1 for the company code, fiscal year and period mentioned in the selection screen
    LIST OF EXPS. G/L ACCOUNTS WITH VALUES AND THEIR TOTAL– LIST A
    TOTAL OF ABOVE LIST = FIELD A
    The List Is To Be Displayed In The Report On Double-Clicking On The Total (Field A)
    END OF FIELD A----
    START OF FIELD B
    TABLE    : SETLEAF (Table for values in a group)
    INPUT     : SETCLASS = 0102 (Code for Cost Element groups)
    SETNAME = FIXED, VARIABLE (Cost Element group names)
    OUTPUT :  VALFROM, VALTO (Cost Element from & to)
    Result : This step will provide a list of cost elements within the cost element groups – Fixed and Variable
    TABLE    : COSP (Cost Accounting postings)
    INPUT     :  GJAHR (Fiscal year)
    KSTAR = VALFROM TO VALTO – SETLEAF (Cost Elements range)
    VRGNG = COIN (CO Business transaction type)
    BEKNZ   = D (Debit / Credit indicator)
    OUTPUT :  KSTAR (Cost Element), WKG0( -PERIOD ENTERED IN SELECTION) [Amount field in the table]
    Result : This step will provide a list of Cost Centre values used for calculating Activity rate and Overheard rates)
    LIST OF COST ELEMENTS WITH VALUES AND THEIR TOTAL – LIST B
    COMPARE LIST A WITH LIST B FIND RECORDS THAT DON’T MATCH
    MAKE A LIST OF UNMATCHED RECORDS (FOUND ONLY IN LIST A) AND THEIR TOTALS – LIST C
    TABLE    : SETLEAF (Table for values in a group)
    INPUT     : SETCLASS = 0101 (Code for Cost Centre groups)
    SETNAME = JL-VVGK (Cost Centre group name)
    OUTPUT :  VALFROM ( COST CENTRE)
    Result : This will provide a list of Cost centers in the JL-VVGK cost element group
    TABLE    : COSP (Cost Accounting Postings)
    INPUT     : OBJNR   = CONCATENATE ‘KSKBX’ TO SETLEAF- VALFROM WITH SPACE, (OBJNR = Object Number)
    GJAHR (Fiscal year)
    VRGNG = COIN (CO Business transaction type)
    OUTPUT :  WKG0( -PERIOD ENTERED IN SELECTION) [Amount field in the table]
    Result : This will provide a list of Cost centers values in the in the JL-VVGK cost element group
    LIST OF VVGK COST CENTRES WITH VALUES AND IT’S TOTAL – LIST D
    ADD LIST C WITH LIST D THE TOTAL OF WHICH IS EQUAL TO FIELD B
    Result : This will provide the costs which are not used to apply Activity Rates and Overhead Rates on the products
    The Lists (List C & D) are To Be Displayed In The Report On Double-Clicking On The Total (Field B)
    END OF FIELD B----
    START OF FIELD C
    SUBTRACT FIELD B FROM FIELD A WHICH IS EQUAL TO FIELD C (NO LINE ITEMS REQUIRED)
    END OF FIELD C----
    START OF FIELD D
    TABLE    :  AUFK (Header table for Orders)
    INPUT     :  KOKRS = KBX (Controlling Area)
    BUKRS = SELECTION SCREEN (Company Code)
    AUART = RM01 (Order Type)
    OUTPUT :   OBJNR (Object Number)
    Result : This will provide a list Product Cost Collector Numbers
    MAT :
    TABLE    :  COSP (Cost Accounting Postings)
    INPUT     :  OBJNR-AUFK (Object number fetched from AUFK table)
    GJAHR = SELECTION SCREEN (fiscal year)
    WRTTP = 4 (Value type for Actuals)
    KSTAR = 41261 TO 41265 (Cost elements range)
    BEKNZ = D (Debit / Credit indicator)
    OUTPUT :  KSTAR (Cost Element), WTG00X (Amount field in the table), OBJNR –CONCATENATE (Object Number)
    Result : This will provide the MAT costs applied to the products through Product Cost Collectors - MATLIST
    FEK :
    TABLE    :  COEP (Cost Accounting Postings)
    INPUT     :  KOKRS = KBX (Controlling Area)
    PERIO = SELECTION SCREEN (Period)
    OBJNR-AUFK (Object Number fetched from AUFK table)
    GJAHR = SELECTION SCREEN (Fiscal year)
    KSTAR = 430001 TO 430010 (Cost Elements range)
    BUKRS = SELECTION SCREEN (Company Code)
    OUTPUT :  KSTAR (Cost Element), WTGBTR (Amount field), OBJNR –CONCATENATE (Object number)
    Result : This will provide the FEK costs applied to the products through Product Cost Collectors - FEKLIST
    MGK :
    TABLE    :  COEP (Cost Accounting Postings)
    INPUT     :  KOKRS = KBX (Controlling Area)
    PERIO = SELECTION SCREEN (Period)
    OBJNR-AUFK (Object Number fetched from AUFK table)
    GJAHR = SELECTION SCREEN (Fiscal year)
    KSTAR = 410001 (Cost Element)
    BUKRS = SELECTION SCREEN (Company Code)
    OUTPUT :  KSTAR (Cost Element), WTGBTR (Amount field), OBJNR – CONCATENATE (Object Number)
    Result : This will provide the MGK costs applied to the products through Product Cost Collectors - MGKLIST
    WVK :
    TABLE    :  COEP (Cost Accounting postings)
    INPUT     :  KOKRS = KBX (Controlling Area)
    PERIO = SELECTION SCREEN (Period)
    OBJNR-AUFK (Object Number fetched from AUFK table)
    GJAHR = SELECTION SCREEN (Fiscal year)
    KSTAR = 410015 (Cost Element)
    BUKRS = SELECTION SCREEN (Company Code)
    OUTPUT :  KSTAR (Cost Element), WTGBTR (Amount field), OBJNR – CONCATENATE (Object Number)
    Result : This will provide the WVK costs applied to the products through Product Cost Collectors - WVKLIST
    TOTAL OF MAT – WTG00X, FEK - WTGBTR, MGK - WTGBTR, WVK – WTGBTR = FIELD D
    The Lists  are (MATLIST, FEKLIST, MGKLIST, WVKLIST) To Be Displayed categorically In The Report On Double-Clicking On The Total (Field D)
    END OF FIELD D----
    START OF FIELD E
    TABLE    :  COSS (Cost Accounting Postings)
    INPUT     :  KOKRS = KBX (Controlling Area)
    GJAHR = SELECTION SCREEN (Fiscal year)
    WRTTP = 4 (Value type for Actuals)
    KSTAR = 44951 TO 44958 (Cost Elements range)
    VRGNG = COIN, RKU1, RKU3, (CO Business transaction type)
    BEKNZ = D (Debit / Credit Indicator)
    OUTPUT :  KSTAR (Cost Element), WTG00X (Amount field)
    Result : This will provide the costs posted only through Controlling (not FI, MM, SD, PP) which are used to calculate Activity rates and Overhead rates applied to the product – EDCCLIST
    The EDCCLIST Is To Be Displayed In The Report On Double-Clicking On The Total (Field E)
    END OF FIELD E----
    START OF FIELD F
    SUBTRACT FIELD D FROM FIELD E WHICH IS EQUAL TO FIELD F (NO LINE ITEMS REQUIRED)
    END OF FIELD F----
    I have return code like as follows.
    *& Report  ZCO_RECONCILIATION_REPORT                                   *
    REPORT  zco_reconciliation_report  NO STANDARD PAGE HEADING
                                    LINE-COUNT 60 LINE-SIZE 180.
    TABLES : t001.
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
    PARAMETERS : p_bukrs  LIKE t001-bukrs MEMORY ID buk ,
                 p_year   LIKE glt0-ryear MEMORY ID gjh ,
                 p_period LIKE bkpf-monat .
    SELECTION-SCREEN END OF BLOCK b1 .
    DATA : BEGIN OF it_skb1 OCCURS 0,
           saknr LIKE skb1-saknr ,
           END OF it_skb1.
    DATA : BEGIN OF it_glt0 OCCURS 0,
           racct LIKE glt0-racct ,
           hsl01 LIKE glt0-hsl01,
           END OF it_glt0.
    DATA : BEGIN OF it_glt0_sum OCCURS 0,
           racct LIKE glt0-racct ,
           hsl01 LIKE glt0-hsl01,
           END OF it_glt0_sum.
    DATA : BEGIN OF it_setb1 OCCURS 0,
           valfrom LIKE cosp-kstar,                " setleaf-valfrom,
           valto   LIKE setleaf-valto,
           END OF it_setb1.
    DATA : BEGIN OF it_setb2 OCCURS 0,
           valfrom LIKE setleaf-valfrom,
           objnr LIKE coss-objnr,
           END OF it_setb2.
    DATA : BEGIN OF it_setd OCCURS 0,
           valfrom LIKE setleaf-valfrom,
           objnr LIKE coss-objnr,
           END OF it_setd.
    DATA : BEGIN OF it_sete OCCURS 0,
           valfrom LIKE setleaf-valfrom,
           objnr LIKE coss-objnr,
           END OF it_sete.
    DATA : BEGIN OF it_cospb OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_cospb.
    DATA : BEGIN OF it_cossb OCCURS 0,
           objnr LIKE coss-objnr,
           kstar LIKE coss-kstar,
           wkg001 LIKE coss-wkg001,
           END OF it_cossb.
    DATA : BEGIN OF it_bkpf OCCURS 0,
           belnr LIKE bkpf-belnr,
           END OF it_bkpf.
    DATA : BEGIN OF it_cossd1 OCCURS 0,
          objnr LIKE coss-objnr,
           belnr  LIKE bseg-belnr,
           wkg001 LIKE coss-wkg001,
           END OF it_cossd1.
    DATA : BEGIN OF it_cossd2 OCCURS 0,
           objnr LIKE coss-objnr,
           kstar LIKE coss-kstar,
           wkg001 LIKE coss-wkg001,
           END OF it_cossd2.
    DATA : BEGIN OF it_cosse OCCURS 0,
           objnr LIKE coss-objnr,
           kstar LIKE coss-kstar,
           wkg001 LIKE coss-wkg001,
           END OF it_cosse.
    dATA : itab_period TYPE string .
    DATA : BEGIN OF it_cospb_sum OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_cospb_sum.
    DATA : BEGIN OF it_cossb_sum OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_cossb_sum.
    DATA : BEGIN OF it_cossd1_sum OCCURS 0,
           kstar  LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_cossd1_sum.
    DATA : BEGIN OF it_cossd2_sum OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_cossd2_sum.
    DATA : BEGIN OF it_cosse_sum OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_cosse_sum.
    DATA : BEGIN OF it_unmatch OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_unmatch.
    DATA : BEGIN OF it_merge OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_merge.
    DATA : BEGIN OF it_merged OCCURS 0,
           kstar LIKE cosp-kstar,
           wkg001 LIKE cosp-wkg001,
           END OF it_merged.
    DATA : BEGIN OF it_field OCCURS 0,
           fielda TYPE p DECIMALS 2,
           fieldb TYPE p DECIMALS 2,
           fieldc TYPE p DECIMALS 2,
           fieldd TYPE p DECIMALS 2,
           fielde TYPE p DECIMALS 2,
           fieldf TYPE p DECIMALS 2,
           END OF it_field.
    DATA : v_fielda TYPE p DECIMALS 2,
           v_fieldb TYPE p DECIMALS 2,
          v_fieldc TYPE p DECIMALS 2,
           v_fieldd TYPE p DECIMALS 2,
           v_fielde TYPE p DECIMALS 2,
          v_fieldf TYPE p DECIMALS 2,
           v_objnr LIKE coss-objnr,
          v_kstar LIKE cosp-kstar,
           v_field(1).
          yr(4),
          mon(2),
          day(2),
          v_date LIKE sy-datum,
          v_date1 LIKE sy-datum,
          flag1 TYPE c ,
          flag2 TYPE c ,
          flag3 TYPE c ,
          flag4 TYPE c,
          flag5 TYPE c.
    data : begin of iaufk occurs 0 ,
           objnr like aufk-objnr,
           end of iaufk .
    DATA : BEGIN OF IFEK OCCURS 0 ,
           KSTAR LIKE COEP-KSTAR,
           WTGBTR LIKE COEP-WTGBTR,
           OBJNR  LIKE COEP-OBJNR,
           END OF IFEK.
    DATA : BEGIN OF IMAT OCCURS 0 ,
           KSTAR LIKE COSP-KSTAR,
           WTG001 LIKE COSP-WTG001,
           WTG002 LIKE COSP-WTG002,
           WTG003 LIKE COSP-WTG003,
           WTG004 LIKE COSP-WTG004,
           WTG005 LIKE COSP-WTG005,
           WTG006 LIKE COSP-WTG006,
           WTG007 LIKE COSP-WTG007,
           WTG008 LIKE COSP-WTG008,
           WTG009 LIKE COSP-WTG009,
           WTG010 LIKE COSP-WTG010,
           WTG011 LIKE COSP-WTG011,
           WTG012 LIKE COSP-WTG012,
           WTG013 LIKE COSP-WTG013,
           WTG014 LIKE COSP-WTG014,
           WTG015 LIKE COSP-WTG015,
           WTG016 LIKE COSP-WTG016,
           OBJNR LIKE COSP-OBJNR,
           END OF IMAT.
    data : begin of imgk occurs 0 ,
            kstar like coep-kstar,
            wtgbtr like coep-wtgbtr,
            objnr   like coep-objnr,
            end of imgk.
    data : begin of iwvk occurs 0 ,
            kstar  like coep-kstar,
            wtgbtr like coep-wtgbtr,
            objnr  like coep-objnr,
            end of iwvk.
    AT SELECTION-SCREEN.
      PERFORM validity.
    START-OF-SELECTION .
      PERFORM get_period.
      PERFORM fill_skb1.
      PERFORM get_aufk .
      perform get_COEP .
      PERFORM GET_MGK.
      perform get_wvk.
      PERFORM fill_it_glt0.
      PERFORM fill_it_glt0_sum.
      PERFORM fill_set.
      PERFORM fill_cospb_cossb.
      PERFORM sum_cospb_cossb.
      PERFORM fill_cossd1_cossd2.
      PERFORM sum_cossd1_cossd2.
      PERFORM fill_cosse.
      PERFORM sum_cosse.
      PERFORM fill_it_unmatch.
      PERFORM fill_it_merge.
      PERFORM fill_it_merged.
      PERFORM fill_it_fieldb.
      PERFORM fill_it_fieldc.
      PERFORM fill_it_fieldd.
      PERFORM fill_it_fieldf.
      PERFORM display.
    PERFORM fill_it_fielde.
    TOP-OF-PAGE.
      PERFORM header.
    AT LINE-SELECTION.
      PERFORM list_display.
    *&      Form  VALIDITY
          text
    -->  p1        text
    <--  p2        text
    FORM validity .
      SELECT SINGLE bukrs FROM t001 INTO t001-bukrs WHERE bukrs = p_bukrs.
      IF sy-subrc NE 0.
      ENDIF.
    ENDFORM.                    " VALIDITY
    *&      Form  FILL_SKB1
          text
    -->  p1        text
    <--  p2        text
    FORM fill_skb1 .
      SELECT saknr FROM skb1 INTO TABLE it_skb1
               WHERE bukrs = p_bukrs
               AND   saknr LIKE '000004%' .
      SORT it_skb1 BY saknr.
    ENDFORM.                                                    " FILL_SKB1
    *&      Form  FILL_IT_GLT0
          text
    -->  p1        text
    <--  p2        text
    FORM fill_it_glt0 .
      CASE p_period.
        WHEN '1'  OR '01'.
          SELECT racct hsl01
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '2' .
          SELECT racct hsl02
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '3' .
          SELECT racct hsl03
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '4' .
          SELECT racct hsl04
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '5' .
          SELECT racct hsl05
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '6' .
          SELECT racct hsl06
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '7' .
          SELECT racct hsl07
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '8' .
          SELECT racct hsl08
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '9' .
          SELECT racct hsl09
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '10' .
          SELECT racct hsl10
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '11' .
          SELECT racct hsl11
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '12' .
          SELECT racct hsl12
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '13' .
          SELECT racct hsl13
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '14' .
          SELECT racct hsl14
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '15' .
          SELECT racct hsl15
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
        WHEN '16' .
          SELECT racct hsl16
                 FROM glt0
                 INTO TABLE it_glt0
                 FOR ALL ENTRIES IN it_skb1
                 WHERE racct = it_skb1-saknr
                   AND   bukrs = p_bukrs
                   AND   drcrk = 'S'
                   AND   ryear = p_year.
                  AND   rtcur = 'INR' .
      ENDCASE.
      SORT it_glt0 BY racct.
    ENDFORM.                    " FILL_IT_GLT0
    *&      Form  FILL_IT_GLT0_SUM
          text
    -->  p1        text
    <--  p2        text
    FORM fill_it_glt0_sum .
      SORT it_glt0 BY racct.
      LOOP AT it_glt0.
        it_glt0_sum-racct = it_glt0-racct.
        AT END OF racct.
          SUM.
          it_glt0_sum-hsl01 = it_glt0-hsl01.
          APPEND it_glt0_sum.
          CLEAR it_glt0_sum.
        ENDAT.
      ENDLOOP.
      LOOP AT it_glt0_sum.
        AT LAST.
          SUM.
         it_fielda-fielda = it_glt0_SUM-hsl01.
          it_field-fielda = it_glt0_sum-hsl01.
          APPEND it_field.
        ENDAT.
      ENDLOOP.
    ENDFORM.                    " FILL_IT_GLT0_SUM
    *&      Form  fill_SET
          text
    -->  p1        text
    <--  p2        text
    FORM fill_set .
      SELECT valfrom valto FROM setleaf INTO TABLE it_setb1
                          WHERE setclass = '0102' AND
                                setname IN ('FIXED', 'VARIABLE') .
      SORT it_setb1 BY valfrom .
      SELECT valfrom FROM setleaf INTO CORRESPONDING FIELDS OF TABLE it_setb2
                         WHERE setclass = '0101' AND
                               setname = 'JL-VVGK'.
      SORT it_setb2 BY valfrom .
      SELECT valfrom FROM setleaf INTO CORRESPONDING FIELDS OF TABLE it_setd
                          WHERE setclass = '0102' AND
                                setname IN ('FBK', 'MAT').
      SORT it_setd BY valfrom .
      SELECT valfrom FROM setleaf INTO CORRESPONDING FIELDS OF TABLE it_sete
                          WHERE setclass = '0102' AND
                                setname = 'CO-RECON'.
      SORT it_sete BY valfrom .
      LOOP AT it_sete.
        CONCATENATE 'KSKBX' it_sete-valfrom INTO v_objnr SEPARATED BY space.
        it_sete-objnr = v_objnr.
        MODIFY it_sete.
      ENDLOOP.
      SORT it_sete BY valfrom .
      LOOP AT it_setb2.
        CONCATENATE 'KSKBX' it_setb2-valfrom INTO v_objnr SEPARATED BY space.
        it_setb2-objnr = v_objnr.
        MODIFY it_setb2.
      ENDLOOP.
      LOOP AT it_setd.
        CONCATENATE 'KSKBX' it_setd-valfrom INTO v_objnr SEPARATED BY space.
        it_setd-objnr = v_objnr.
        MODIFY it_setd.
      ENDLOOP.
    ENDFORM.                    " fill_SET
    *&      Form  fill_cospb_cossb
          text
    -->  p1        text
    <--  p2        text
    FORM fill_cospb_cossb .
      CASE p_period.
        WHEN '1' .
          SELECT kstar wkg001 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg001 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '2' .
          SELECT kstar wkg002 FROM cosp INTO TABLE it_cospb
           FOR ALL ENTRIES IN it_setb1
                        WHERE kstar = it_setb1-valfrom
                        AND   gjahr = p_year
                       AND     vrgng = 'COIN'
                       AND     beknz = 'S'.
          SELECT objnr kstar wkg002 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '3' .
          SELECT kstar wkg003 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg003 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '4' .
          SELECT kstar wkg004 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg004 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '5' .
          SELECT kstar wkg005 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg005 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '6' .
          SELECT kstar wkg006 FROM cosp INTO TABLE it_cospb
            FOR ALL ENTRIES IN it_setb1
                         WHERE kstar = it_setb1-valfrom
                         AND   gjahr = p_year
                        AND     vrgng = 'COIN'
                        AND     beknz = 'S'.
          SELECT objnr kstar wkg006 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '7' .
          SELECT kstar wkg007 FROM cosp INTO TABLE it_cospb
           FOR ALL ENTRIES IN it_setb1
                        WHERE kstar = it_setb1-valfrom
                        AND   gjahr = p_year
                       AND     vrgng = 'COIN'
                       AND     beknz = 'S'.
          SELECT objnr kstar wkg007 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '8' .
          SELECT kstar wkg008 FROM cosp INTO TABLE it_cospb
           FOR ALL ENTRIES IN it_setb1
                        WHERE kstar = it_setb1-valfrom
                        AND   gjahr = p_year
                       AND     vrgng = 'COIN'
                       AND     beknz = 'S'.
          SELECT objnr kstar wkg008 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '9' .
          SELECT kstar wkg009 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg009 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '10' .
          SELECT kstar wkg010 FROM cosp INTO TABLE it_cospb
           FOR ALL ENTRIES IN it_setb1
                        WHERE kstar = it_setb1-valfrom
                        AND   gjahr = p_year
                       AND     vrgng = 'COIN'
                       AND     beknz = 'S'.
          SELECT objnr kstar wkg010 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '11' .
          SELECT kstar wkg011 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg011 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '12' .
          SELECT kstar wkg012 FROM cosp INTO TABLE it_cospb
           FOR ALL ENTRIES IN it_setb1
                        WHERE kstar = it_setb1-valfrom
                        AND   gjahr = p_year
                       AND     vrgng = 'COIN'
                       AND     beknz = 'S'.
          SELECT objnr kstar wkg012 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '13' .
          SELECT kstar wkg013 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg013 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '14' .
          SELECT kstar wkg014 FROM cosp INTO TABLE it_cospb
         FOR ALL ENTRIES IN it_setb1
                      WHERE kstar = it_setb1-valfrom
                      AND   gjahr = p_year
                     AND     vrgng = 'COIN'
                     AND     beknz = 'S'.
          SELECT objnr kstar wkg014 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '15' .
          SELECT kstar wkg015 FROM cosp INTO TABLE it_cospb
          FOR ALL ENTRIES IN it_setb1
                       WHERE kstar = it_setb1-valfrom
                       AND   gjahr = p_year
                      AND     vrgng = 'COIN'
                      AND     beknz = 'S'.
          SELECT objnr kstar wkg015 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
        WHEN '16' .
          SELECT kstar wkg016 FROM cosp INTO TABLE it_cospb
           FOR ALL ENTRIES IN it_setb1
                        WHERE kstar = it_setb1-valfrom
                        AND   gjahr = p_year
                       AND     vrgng = 'COIN'
                       AND     beknz = 'S'.
          SELECT objnr kstar wkg016 FROM cosp
                           INTO TABLE it_cossb
                           FOR ALL ENTRIES IN it_setb2
                            WHERE objnr = it_setb2-objnr
                             AND  vrgng  IN ('COIN','RKIV')
                            AND   gjahr = p_year.
      ENDCASE.
      SORT it_cospb BY kstar.
      SORT it_cossb BY kstar.
    ENDFORM.                    " fill_cospb_cossb
    *&      Form  SUM_COSPB_COSSB
          text
    -->  p1        text
    <--  p2        text
    FORM sum_cospb_cossb .
      LOOP AT it_cospb.
        it_cospb_sum-kstar = it_cospb-kstar.
        AT END OF kstar.
          SUM.
          it_cospb_sum-wkg001 = it_cospb-wkg001.
          APPEND it_cospb_sum.
          CLEAR it_cospb_sum.
        ENDAT.
      ENDLOOP.
      LOOP AT it_cossb.
        it_cossb_sum-kstar = it_cossb-kstar.
        AT END OF kstar.
          SUM.
          it_cossb_sum-wkg001 = it_cossb-wkg001.
          APPEND it_cossb_sum.
          CLEAR it_cossb_sum.
        ENDAT.
      ENDLOOP.
      SORT it_cospb_sum BY kstar.
      SORT it_cossb_sum BY kstar.
    ENDFORM.                    " SUM_COSPB_COSSB
    *&      Form  fill_it_unmatch
          text
    -->  p1        text
    <--  p2        text
    FORM fill_it_unmatch .
      LOOP AT it_glt0_sum.
        READ TABLE it_cospb_sum WITH KEY kstar = it_glt0_sum-racct.
        IF sy-subrc NE 0.
          it_unmatch-kstar = it_glt0_sum-racct.
          it_unmatch-wkg001 = it_glt0_sum-hsl01.
          APPEND it_unmatch.
          CLEAR it_unmatch.
        ENDIF.
      ENDLOOP.
    ENDFORM.                    " fill_it_unmatch
    *&      Form  fill_it_merge
          text
    -->  p1        text
    <--  p2        text
    ----

    We can't really tell without seeing the code. Would you post it please? (Just the portions that are overly slow.)
    Rob

  • P&L Report for Month wise

    Hi all,
    can any one tell me which t.code using for get the report for Profit & Loss Statement in monthwise?
    Regards,
    Mohan.

    You need to create a financial statement version using OB58 for your P&L accounts and then run F.01 with that financial statement version.

  • AP Line-Item Report for State Auditors

    Dear Members,
    I am preparing one Report named AP Line-Item Report for State Auditors and i need the following fields in my report.
    Check Number                PAYR-CHECT
    Voucher Number             BSEG-BELNR
    Check Date                     PAYR-ZALDT
    Voucher Date                     BKPF-BUDAT
    Vendor Number             LFA1-LIFNR
    Vendor Name                     ADRC-NAME1
    Vendor Street Address     ADRC-STREET
    Vendor City                     ADRC-CITY1
    Vendor State                     ADRC-REGIO
    Vendor Zip Code             ADRC-POST_CODE1
    General Ledger Acct No     BSEG-HKONT
    Purchase Order Number     BSEG-EBELN
    Tax Status Code             BSEG-MWSKZ
    Taxable Amount             BSEG-HWBAS
    Exempt Amount             BSEG-MWSTS
    Tax                                     BSEG-MWSTS
    Tax Accrued                     BSEG-MWSTS
    Total Invoice                      BSEG-DMBTR
    I am new to FI.So I request some one please let me know which datasources contain the above fields and which CUBE is best suited for this.
    Thanks in Advance for help and quick reply is much much appreciated.
    Best Regards
    RC

    0VENDOR_ATTR - Vendor Master Data Attributes
    0FI_AP_51 - Check Register Line Items
    0FI_AP_4 - Accounts Payable Line Items
    It should be noted, however, that this won't get you everything that you need, so you may have to create enhance one or more of these DataSources and create User Exit ABAP code to get the required data. Also, the 0FI_AP_51 DataSource isn't available if your source system isn't ECC6 EHP3 or higher. If your source system is less than that, you're going to have to create a generic DataSource for the data from the PAYR table.

  • Reporting on DSO for Broker's Statement (Line Item Reporting)?

    Dear experts,
    I need to create a BW report based on data from FS-CD and ICM for a client in the insurance industry. The report is broker's statement which has in total 3 sections/pages (or in 3 levels). The requirements are as follows:
    1. Overview of the total commissions (grouped by different categories) earned by a broker for a specific month
    2. When the broker clicks on the "commission group", it will jump to another page showing each commission items of that group
    3. Details for each commission item (line item in DSO) can be drill-downed in another separate page
    Currently, I have a consolidated DSO for the commission line items. The data will be loaded to an InfoCube followed by a MultiProvider for reporting.
    I am new to BI and I assume that I should follow the following approach:
    1. Use RRI for the jumps between different details levels
    2. Use DSO for reporting the line item on third page
    3. Use Report Designer for the layout because the reports are formatted like Balance Sheet
    Is it possible that I report on the InfoCube via MultiProvider for the 1st and 2nd levels whereas DSO for the 3rd level?
    Could anyone please give me some suggestions on this?
    Thanks in advance.
    Regards,
    Joon

    Hi,
    any updates? I read that the RRI capability of the query is not supported in BEx report. Is it true?
    If so, is there any workaround to enable this?
    Regards,
    Joon

  • State wise Reports for Taxes

    Hi  MM Gurus,
    Good Morning !!!!
    I have a situation where i have many branches sales offices in different States, but in SAP we have created only one plant for one state and we have created Storage Locations for other states Branch offices. Now the issue is, from other branches (States) also my client used to raise Vendor Invoices and Customer Billing document, So they need separate report for Input/Output Tax.
    Shall i use business Place for other states under one Plant?? Is this is possible? OR in my case how can i get separate reports for Taxes for different states  (Storage Locations).
    Kindly suggest.
    Thanks in advance.
    Regards,
    Neeraj

    Hi,
    I dont think business place will help in your case since we assign business places to plant. So in your case you have only one plant.
    Which tax procedure are you using ?
    How system calculates different taxes in case of different states ?
    Thanks & Regards,

  • Power Injector for Airport Extreme (Generation 5)

    Hello.
    Is there any support for using Power Injector (PoE) instead of the supplied power apdater to run Airport Extreme.
    Cheers
    Mr Apro

    Sorry, but Power over Ethernet is not supported on the AirPort Extreme.

  • Can not find Power Injector for wap2000.

    Hello everybody.
    Not long ago i was bought Cisco wap2000 access point for small business, and now the problem is to find power injector for this device.
    I am already tried to use AIR-PWRINJ3, but access point did't turn on.
    Why?
    Which power injector should i use with this device?
    Thanks.
    PS.
    Please, don't judge me, for my bad english. =)

    I would think that:
    http://www.google.com/products/catalog?hl=en&biw=1168&bih=723&q=cisco+AIR-PWRINJ4%3D&um=1&ie=UTF-8&tbm=shop&cid=1924636136971570879&sa=X&ei=oGf_TcGfHoy40AH2xLDjAg&ved=0CIMBEPICMAU#
    should work, Cisco should be able to confirm . . .
    If not then I would try:
    http://www.versatek.com/products/cisco_power_injector.htm?_kk=cisco%20PoE%20injector&_kt=90d05a21-707c-456a-8dc9-c92b9a334f1b&gclid=CPnpz-nlxKkCFUqM5godGH4Mmw
    I know your original post was in January and you may have created that 100m power cord but I hope this helps others.

  • Power Injector for WAP200

    Hello
    I need your advice on whether power Injector for Aironet AP’s can be also used for SB WLAN products.
    Is AIR-PWRINJ4= compatible with WAP200??
    Any advice would be very appreciated.
    Best Regards,
    Allan Kim

    Hi, My name is Eric Moyers. I am a Network Support Engineer in the Cisco Small Business Support Center.
    Currently there are no Cisco/Linksys POE approved injectors for this device or any of our other small business products. Our recommendation for powering these units are to use either the supplied power adapter or a POE Switch that is 802.3af compliant. Any of our switches with a P in the model number would be perfect. Here is a link for you to our switches.
    http://www.cisco.com/cisco/web/solutions/small_business/products/routers_switches/index.html
    While it is possible for that Cisco Enterprise Injector to mentioned above should work, It has just not been tested so we can not completely recommend it.
    Hope this helps.
    Eric Moyers
    Cisco Network Support Engineer
    1-866-606-1866

  • What is the condition for First write statement in reports?

    What is the condition for First write statement in reports?

    In
    TOP-OF-PAGE & START-OF-SELECTION.
    U have to write what ever u want to dispaly.
    Top-of-page will trigger first and write the statements.
    SAmple report program for reference.
    REPORT ztemplate
              NO STANDARD PAGE HEADING
              LINE-SIZE 130
              LINE-COUNT 65
              MESSAGE-ID zm.
    * The Data Declarations
    TABLES:    mara." General Material Data.
    * Type Declarations:
    TYPES : BEGIN OF ty_mara,
              cb(1),
              matnr LIKE mara-matnr,
              mtart LIKE mara-mtart,
              matkl LIKE mara-matkl,
             END OF ty_mara.
    * Internal Tables:
    * The following structure type must be defined in the data dictionary
    DATA :  i_output TYPE ty_mara OCCURS 0 WITH HEADER LINE.
    DATA: lines TYPE i, free TYPE i.
    * The Selection Screen Definition
    SELECTION-SCREEN BEGIN OF BLOCK b_main WITH FRAME TITLE text-b01.
    *SELECTION-SCREEN skip.
    SELECT-OPTIONS: s_matnr FOR  mara-matnr.                  "Material No
    *PARAMETERS:     P_XXXXX like XXXX-XXXXX.                   "Description
    *PARAMETERS:     CB_XXXX as checkbox.                       "Description
    *PARAMETERS:     RB_XXXY radiobutton group XXX default 'X'. "Description
    *PARAMETERS:     RB_XXXZ radiobutton group XXX.             "Description
    *SELECTION-SCREEN COMMENT fmt name.
    SELECTION-SCREEN END OF BLOCK b_main.
    *SELECTION-SCREEN ULINE.
    *eject
    * INITIALIZATION
    INITIALIZATION.
    * AT SELECTION-SCREEN
    AT SELECTION-SCREEN.
    *Validate material no details
    IF NOT s_matnr[] IS INITIAL.
    LOOP AT s_matnr.
    IF NOT s_matnr-low  IS INITIAL.
      SELECT SINGLE matnr INTO v_matnr
             FROM mara
             WHERE matnr = s_matnr-low.
      IF sy-subrc NE 0.
        MESSAGE i128.
        LEAVE LIST-PROCESSING.
      ENDIF.
      ENDIF.
    IF NOT s_matnr-high IS INITIAL.
      SELECT SINGLE matnr INTO v_matnr
             FROM mara
             WHERE matnr = s_matnr-high.
      IF sy-subrc NE 0.
        MESSAGE i128.
        LEAVE LIST-PROCESSING.
      ENDIF.
      ENDIF.
    ENDLOOP.
    ENDIF.
    * START-OF-SELECTION
    START-OF-SELECTION.
       REFRESH: i_output.
      CLEAR  : i_output.
      SELECT matnr
             mtart
             matkl
             INTO TABLE i_output
             FROM mara
             WHERE mara~matnr IN s_matnr.
      IF sy-subrc NE 0.
        MESSAGE i000 WITH text-002.
        " No records found for selected criteria
            leave list-processing.
      ENDIF.
      IF NOT i_output[] IS INITIAL.
        LOOP AT i_output INTO wa_output.
          WRITE:/001 wa_output-cb AS checkbox,
                 003 wa_output-matnr,
                 015 wa_output-mtart,
                 024 wa_output-matkl.
          CLEAR wa_output.
        ENDLOOP.
      ENDIF.
    * END-OF-SELECTION
    END-OF-SELECTION.
      lines = sy-linno - 1.
    SET PF-STATUS 'ZSTATUS'.
    AT USER-COMMAND.
          wa_output-cb = space.
          SET PF-STATUS 'ZSTATUS' EXCLUDING 'SAVE'.
          DO lines TIMES.
            READ LINE sy-index FIELD VALUE wa_output-cb.
              IF wa_output-cb = 'X'.
            MODIFY i_output  FROM wa_output INDEX sy-tabix TRANSPORTING cb.
            ENDIF.
          ENDDO.
    CASE sy-ucomm.
    WHEN 'SAVE'.
          DELETE i_output WHERE cb = 'X'.
    WHEN 'BACK'.
    LEAVE SCREEN.
    ENDCASE.
    * TOP-OF-PAGE.
    TOP-OF-PAGE.
      ULINE.
      FORMAT INTENSIFIED OFF.
      FORMAT COLOR COL_HEADING.
      WRITE:/001 'CB' ,
             003 'Material No',
             015 'Mat type',
             024 'Mat group'.
      FORMAT COLOR OFF.
      FORMAT INTENSIFIED ON.
      ULINE.

  • Power injector for 1300 bridge

    It is possible to use a AIR-PWRINJ-BLR1 power injector with a 1300 series bridge?  I know the BLR2 injector is the proper one but need to know if they are at all compatible.

    Hi,
    AIR-PWRINJ-BLR1 = ONLY for 1410 Bridges.. and should not be used with 1310 Bridges..
    lemme know if this answered your question..
    Regards
    Surendra
    ====
    Please dont forget to rate the posts which answered your question and mark it as answered or was helpfull

  • Is there an inexpensive APEX report printer for invoices/checks/statements?

    I am considering using APEX for a billing/payments type system for a small company. BI Publisher is not an option for them due to cost. Has anyone used a free or low-cost product to successfully print detailed reports such as invoices, statements, checks, etc. from APEX?

    Andreé,
    o no problem
    1)
    first make an invoice layout with field holders placed in between ##
    e.g. Dear Mr #CNAME# find here your latest invoce and so no
    just make it in wordpad, word or openoffice
    and save it in an RTF file
    I then copied the RTF in a CBLOB field using TOAD
    2)
    load this clob in clob variable in a pl/sql procedure
    mix your RTF with real data, f.i. #CNAME# will be replaced
    using pl/sql : replace('#CNAME# , rec.name); and so on for all fields
    the end result is the invoice as rtf
    the idea comes from this application from oracle called mailmerge
    found here : [http://htmldb.oracle.com/pls/otn/f?p=18326:44:3650339304424939::::P44_ID:1682]
    it's an apex app where I based my work on
    have a look at it and feel free to ak more questions:
    CREATE OR REPLACE PROCEDURE RIGHTSHOP.DOWNLOAD_INVOICE(p_id in number) AS
        Lob_loc     CLOB;
        i           integer := 0;
        v_length    integer;
        v_blob      BLOB;
        v_tot       FACTUUR.TOT%type;
        v_totexcl   FACTUUR.TOTEXCL%type;
        v_totbtw    FACTUUR.TOTBTW%type;
        v_docnr     FACTUUR.DOCNR%type;
        v_datum     FACTUUR.DATUM%type;
        v_klant_id  FACTUUR.KLANT_ID%type;
        v_mime      varchar2(48) := 'application/msword';
        v_file_name varchar2(2000);
        cursor  cur_artikels(p_factuur in FACTUUR_ARTIKELS.FACTUUR_ID%type) is
          select AANTAL, OMSCHRIJVING, BTW_CAT_ID, SERIENUMMER, NETTO_VERKOOPPRIJS
              , (aantal * NETTO_VERKOOPPRIJS) netto_bedrag
              , (select btw_waarde from btw_cats where id = btw_cat_id) btw        
            from factuur_artikels
           where factuur_id = p_factuur;
        rec_firma   firma%rowtype;
        str_gemeente varchar2(4000);
        v_knaam     KLANTEN.NAAM%type;
        v_kstraat   varchar2(4000);
        v_kbtw      KLANTEN.BTW_NUMMER%type;
    BEGIN
        begin
        select rtf
          into lob_loc
          from factuur_layouts
         where id = (select flayout_id from firma);
        exception
          when others then
            htp.p(' error during select '||sqlerrm);
        end;
    -- firma
        select NAAM1, NAAM2, ADRES1, ADRES2, POSTCODE_ID, EMAIL, WEBSITE, BTW_NUMMER, TEL1, FAX, GSM, REKENING       
          into rec_firma.NAAM1, rec_firma.NAAM2, rec_firma.ADRES1, rec_firma.ADRES2, rec_firma.POSTCODE_ID, rec_firma.EMAIL
             , rec_firma.WEBSITE, rec_firma.BTW_NUMMER, rec_firma.TEL1, rec_firma.FAX, rec_firma.GSM, rec_firma.REKENING
          from firma;
        select postcode || ' ' || gemeente
          into str_gemeente
          from postcodes
         where id = rec_firma.postcode_id;
        lob_loc := replace(lob_loc, '#FNAAM1#', rec_firma.naam1);
        lob_loc := replace(lob_loc, '#FNAAM2#', rec_firma.naam2);
        lob_loc := replace(lob_loc, '#FSTRAAT#', rec_firma.adres1 || ' ' ||  rec_firma.adres2);
        lob_loc := replace(lob_loc, '#FGEMEENTE#',str_gemeente);
        lob_loc := replace(lob_loc, '#FEMAIL#', rec_firma.email);
        lob_loc := replace(lob_loc, '#FWEBSITE#', rec_firma.website);               
        lob_loc := replace(lob_loc, '#FBTW#', rec_firma.btw_nummer);
        lob_loc := replace(lob_loc, '#FREKENING#', rec_firma.rekening);
    --factuur
        select tot, totexcl, totbtw, docnr, datum, klant_id
          into v_tot, v_totexcl, v_totbtw, v_docnr, v_datum, v_klant_id
          from factuur
         where id = p_id;
        lob_loc := replace(lob_loc, '#BB#', to_char(v_totexcl, 'FM999G999G999G999G990D00'));
        lob_loc := replace(lob_loc, '#TB#', to_char(v_totbtw, 'FM999G999G999G999G990D00'));
        lob_loc := replace(lob_loc, '#TO#', to_char(v_tot, 'FM999G999G999G999G990D00'));
        lob_loc := replace(lob_loc, '#FD#', to_char(v_datum, 'DD/MM/YYYY'));
        lob_loc := replace(lob_loc, '#FN#', to_char(v_docnr));
        lob_loc := replace(lob_loc, '#eenheid#', 'Aantal');
        v_file_name := 'factuur' || v_docnr;
    -- klant
        select naam, adres1 || ' ' || adres2 as straat
             , (select postcode || ' ' || gemeente from postcodes where id = klanten.postcode_id) as gemeents
             , btw_nummer
          into v_knaam, v_kstraat, str_gemeente, v_kbtw
          from klanten
         where id = v_klant_id;
        lob_loc := replace(lob_loc, '#KNAAM#', v_knaam);
        lob_loc := replace(lob_loc, '#KSTRAAT#', v_kstraat);
        lob_loc := replace(lob_loc, '#KGEMEENTE#',str_gemeente);
        lob_loc := replace(lob_loc, '#KBTW#', v_kbtw);
    -- factuur_artikels   
        for vc_curr in cur_artikels(p_id) loop
          i := i + 1;
          lob_loc := replace(lob_loc, '#AR' || to_char(i) || '#', rpad(vc_curr.omschrijving, 120, ' '));
          lob_loc := replace(lob_loc, '#AN' || to_char(i) || '#', to_char(vc_curr.aantal));
          lob_loc := replace(lob_loc, '#NE' || to_char(i) || '#', to_char(vc_curr.netto_verkoopprijs, 'FM999G999G999G999G990D00'));
          lob_loc := replace(lob_loc, '#BT' || to_char(i) || '#', to_char(vc_curr.btw) ||'%');
          lob_loc := replace(lob_loc, '#BE' || to_char(i) || '#', to_char(vc_curr.netto_bedrag, 'FM999G999G999G999G990D00'));
        end loop;   
        for j in i .. 9 loop
          lob_loc := replace(lob_loc, '#AN' || to_char(j) || '#', null);
          lob_loc := replace(lob_loc, '#AR' || to_char(j) || '#', lpad(' ', 120, ' '));
          lob_loc := replace(lob_loc, '#NE' || to_char(j) || '#', null);
          lob_loc := replace(lob_loc, '#BT' || to_char(j) || '#', null);
          lob_loc := replace(lob_loc, '#BE' || to_char(j) || '#', null);
        end loop;
        v_length := length(lob_loc);
        -- set up HTTP header
        -- use an NVL around the mime type and
        -- if it is a null set it to application/octect
        -- application/octect may launch a download window from windows
        v_mime := 'application/pdf';
        owa_util.mime_header( nvl(v_mime,'application/octet'), FALSE );
        -- set the size so the browser knows how much to download
        htp.p('Content-length: ' || v_length);   
        if v_mime != 'text/html' then
            -- the filename will be used by the browser if the users does a save as
            --htp.p('Content-Disposition: attachment; filename="' || v_file_name || '"');
            htp.p('Content-Disposition: filename="' || v_file_name || '"');
        end if;
        -- close the headers
        owa_util.http_header_close;
        -- download the BLOB
        v_blob := c2b(lob_loc);   
        --wpg_docload.download_file( Lob_loc );
        wpg_docload.download_file(v_blob);
        /*update factuur
           set printed = 1
         where id = p_id;
        APEX_UTIL.SET_SESSION_STATE('P9_PRINTED', '1');
    exception
      when others then
        htp.p('other error : ' || sqlerrm);
    END;
    /

Maybe you are looking for