Purchase order (MM)

Hello experts
I want some interactive reports on purchase orders. also if u can give for purchase order reqisition.
thanx in advanced

hi
see this sample report and use the tables
EKKO,EKPO,EKBE,EKET etc and prepare some other interactive reports
*& Report  ZMM_PO_REPORT
REPORT  ZMM_PO_REPORT message-Id yb
       NO STANDARD PAGE HEADING
       LINE-COUNT 60(1)
       LINE-SIZE 230.
       D A T A B A S E  T A B L E S   D E C L A R A T I O N
TABLES: lfa1,           " Vendor Master
        t161,           " PO Doc Types
        t024,           " Purchase Groups
        ekko.           " PO Header
               T Y P E S  D E C L A R A T I O N S
Purchase Orders Main Structure
TYPES: BEGIN OF s_po,
        ebeln TYPE ebeln,           " PO No.
        ebelp TYPE ebelp,           " PO Item
        bstyp TYPE bstyp,           " PO Category
        bukrs TYPE bukrs,           " Company Code
        bsart TYPE bbsrt,           " PO Type
        lifnr TYPE lifnr,           " Vendor No
        ekgrp TYPE bkgrp,           " Purchase Group
        waers TYPE waers,           " Currency
        bedat TYPE etbdt,           " PO Date
        txz01 TYPE txz01,           " Material Text
        werks TYPE ewerk,           " Plant
        lgort TYPE lgort_d,         " Storage Location
        matkl TYPE matkl,           " Material Group
        menge TYPE bamng,           " PR Quantity
        meins TYPE bamei,           " UOM
        bprme TYPE bbprm,           " Price Unit
        netpr TYPE netpr,           " Net price
        peinh TYPE peinh,           " Price Unit UOM
        pstyp TYPE pstyp,           " Item Category
        knttp TYPE knttp,           " Account Assignment Category
       END OF s_po.
Purchase Orders History Structure
TYPES: BEGIN OF s_account,
        ebeln TYPE ebeln,           " PO No.
        ebelp TYPE ebelp,           " PO Item
        gjahr TYPE mjahr,           " Fiscal Year
        belnr TYPE mblnr,           " PO Invoice No
        menge TYPE menge_d,         " PR Quantity
        wrbtr TYPE wrbtr,           " Price in Local Currency
        dmbtr TYPE dmbtr,           " Price in Foreign Currency
        waers TYPE waers,           " Currency
        shkzg TYPE shkzg,           " Dr/Cr Indicator
       END OF s_account.
Purchase Orders History Structure(Item Sum)
TYPES: BEGIN OF s_inv_sum,
        ebeln TYPE ebeln,           " PO No.
        ebelp TYPE ebelp,           " PO Item
        menge TYPE menge_d,         " PR Quantity
        wrbtr TYPE wrbtr,           " Price in Foreign Currency
        waers TYPE waers,           " Currency
       END OF s_inv_sum.
Purchase Orders Main Structure
TYPES: BEGIN OF s_rep,
        lifnr TYPE lifnr,           " Vendor No
        ebeln TYPE ebeln,           " PO No.
        ebelp TYPE ebelp,           " PO Item
        bstyp TYPE bstyp,           " PO Category
        bsart TYPE bbsrt,           " PO Type
        ekgrp TYPE bkgrp,           " Purchase Group
        waers TYPE waers,           " Currency
        bedat TYPE etbdt,           " PO Date
        txz01 TYPE txz01,           " Material Text
        werks TYPE ewerk,           " Plant
        lgort TYPE lgort_d,         " Storage Location
        matkl TYPE matkl,           " Material Group
        menge TYPE bamng,           " PR Quantity
        meins TYPE bamei,           " UOM
        bprme TYPE bbprm,           " Price Unit
        netpr TYPE netpr,           " Net price
        peinh TYPE peinh,           " Price Unit UOM
        pstyp TYPE pstyp,           " Item Category
        knttp TYPE knttp,           " Account Assignment Category
        name1 TYPE name1,           " Plant
        orewr TYPE netpr,           " To be Invoiced Price
        curr  TYPE waers,           " Inv Doc Currency
       END OF s_rep.
           D A T A  D E C L A R A T I O N S
DATA: gv_title1 TYPE sylisel,            " Report title
      gv_dial.                           " Color flag
            C O N S T A N T S  D E C L A R A T I O N S
CONSTANTS: c_x                VALUE 'X',   " Flag X
           c_h                VALUE 'H',   " Debit
           c_vgabe TYPE vgabe VALUE '2'.   " Transaction Type
     I N T E R N A L  T A B L E S  D E C L A R A T I O N S
DATA: i_po    TYPE STANDARD TABLE OF s_po WITH HEADER LINE,
                             " Purchase Order
      i_inv   TYPE STANDARD TABLE OF s_inv_sum WITH HEADER LINE,
                                     " PO Invoice Values
      i_rep   TYPE STANDARD TABLE OF s_rep WITH HEADER LINE,
                                 " PO Invoice Values
      i_ekbe  TYPE STANDARD TABLE OF s_account WITH HEADER LINE.
                           " PO Invoice Values
                 S E L E C T I O N  S C R E E N                      *
SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
SELECT-OPTIONS: s_lifnr FOR lfa1-lifnr MATCHCODE OBJECT kred,
                s_ebeln FOR ekko-ebeln MATCHCODE OBJECT mekk,
                s_bsart FOR t161-bsart,
                s_ekgrp FOR t024-ekgrp,
                s_bedat FOR ekko-bedat.
SELECTION-SCREEN END OF BLOCK b1.
                  I N I T I A L I Z A T I O N                        *
INITIALIZATION.
              A T  S E L E C T I O N - S C R E E N                   *
AT SELECTION-SCREEN.
Validate the screen fields
  PERFORM validate_screen.
               S T A R T - O F - S E L E C T I O N                   *
START-OF-SELECTION.
Fetch main data
  PERFORM fetch_data.
               T O P - O F - P A G E                                 *
TOP-OF-PAGE.
Header of the List
  PERFORM header.
               E N D - O F - P A G E                                 *
Footer
END-OF-PAGE.
  ULINE.
               E N D - O F - S E L E C T I O N                       *
END-OF-SELECTION.
Display the Report Output data
  PERFORM display_data.
At Line-Selection
AT LINE-SELECTION.
When double clicked on EBELN display the details of Purchase Doc
  PERFORM line_sel.
*&      Form  validate_screen
Validation of Selection Screen fields
FORM validate_screen .
Validation of Vendor Number
  CLEAR lfa1-lifnr.
  IF NOT s_lifnr[] IS INITIAL.
    SELECT lifnr UP TO 1 ROWS
        INTO lfa1-lifnr
        FROM lfa1
        WHERE lifnr IN s_lifnr.
    ENDSELECT.
    IF sy-subrc <> 0.
      MESSAGE e000 WITH 'Invalid Vendor'(002).
    ENDIF.
  ENDIF.
Validation of PO Number
  CLEAR ekko-ebeln.
  IF NOT s_ebeln[] IS INITIAL.
    SELECT ebeln UP TO 1 ROWS
        INTO ekko-ebeln
        FROM ekko
        WHERE ebeln IN s_ebeln.
    ENDSELECT.
    IF sy-subrc <> 0.
      MESSAGE e000 WITH 'Invalid Document Number'(003).
    ENDIF.
  ENDIF.
Validation of PO Document Type
  CLEAR t161-bsart.
  IF NOT s_bsart[] IS INITIAL.
    SELECT bsart UP TO 1 ROWS
        INTO t161-bsart
        FROM t161
        WHERE bsart IN s_bsart.
    ENDSELECT.
    IF sy-subrc <> 0.
      MESSAGE e000 WITH 'Invalid Purchase Document Type'(004).
    ENDIF.
  ENDIF.
Validation of Purchasing Group
  CLEAR t024-ekgrp.
  IF NOT s_ekgrp[] IS INITIAL.
    SELECT ekgrp UP TO 1 ROWS
        INTO t024-ekgrp
        FROM t024
        WHERE ekgrp IN s_ekgrp.
    ENDSELECT.
    IF sy-subrc <> 0.
      MESSAGE e000 WITH 'Invalid Purchasing Group'(005).
    ENDIF.
  ENDIF.
ENDFORM.                    " validate_screen
*&      Form  fetch_data
Fetching the PO related data from Database Tables
FORM fetch_data .
  CLEAR i_po.
  REFRESH i_po.
  SELECT a~ebeln            " PO No.
         b~ebelp            " PO Item
         a~bstyp            " PO Category
         a~bukrs            " Company Code
         a~bsart            " PO Type
         a~lifnr            " Vendor No
         a~ekgrp            " Purchase Group
         a~waers            " Currency
         a~bedat            " PO Date
         b~txz01            " Material Text
         b~werks            " Plant
         b~lgort            " Storage Location
         b~matkl            " Material Group
         b~menge            " PR Quantity
         b~meins            " UOM
         b~bprme            " Price Unit
         b~netpr            " Net price
         b~peinh            " Price Unit UOM
         b~pstyp            " Item Category
         b~knttp            " Account Assignment Category
    INTO TABLE i_po
    FROM ekko AS a JOIN ekpo AS b
    ON a~ebeln = b~ebeln
    WHERE a~ebeln IN s_ebeln AND
          a~lifnr IN s_lifnr AND
          a~ekgrp IN s_ekgrp AND
          a~bsart IN s_bsart AND
          a~bedat IN s_bedat.
  SORT i_po BY ebeln ebelp.
  break-point.
  IF NOT i_po[] IS INITIAL.
Fetch the PO History/Invoice Details from EKBE Table
    CLEAR i_ekbe.
    REFRESH i_ekbe.
    SELECT ebeln           " PO No.
           ebelp           " PO Item
           gjahr           " Fiscal Year
           belnr           " PO Invoice No
           menge           " PR Quantity
           wrbtr           " Price in Local Currency
           dmbtr           " Price in Foreign Currency
           waers           " Currency
           shkzg           " Dr/Cr Indicator
     INTO TABLE i_ekbe
     FROM ekbe
     FOR ALL ENTRIES IN i_po
     WHERE ebeln = i_po-ebeln AND
           ebelp = i_po-ebelp AND
           vgabe = c_vgabe.
    IF sy-subrc = 0.
      SORT i_ekbe BY ebeln ebelp.
      LOOP AT i_ekbe.
        IF i_ekbe-shkzg = c_h.
          i_ekbe-wrbtr = i_ekbe-wrbtr * -1.
        ENDIF.
        MODIFY i_ekbe.
      ENDLOOP.
  break-point.
Sum up the Item wise Invoice totals
      LOOP AT i_ekbe.
        AT END OF ebelp.
          READ TABLE i_ekbe INDEX sy-tabix.
          SUM.
          MOVE-CORRESPONDING i_ekbe TO i_inv.
          APPEND i_inv.
        ENDAT.
        CLEAR i_inv.
      ENDLOOP.
      SORT i_inv BY ebeln ebelp.
        break-point.
    ENDIF.
  ENDIF.
Move the Vendor Name and Invoice Values to I_rep Internal Table
  LOOP AT i_po.
    MOVE-CORRESPONDING i_po TO i_rep.
    CLEAR i_inv.
    READ TABLE i_inv WITH KEY ebeln = i_po-ebeln
                              ebelp = i_po-ebelp.
    IF sy-subrc = 0.
      i_rep-orewr = ( i_po-menge - i_inv-menge ) * i_po-netpr.
      i_rep-curr  = i_inv-waers.
    ELSE.
      i_rep-orewr = i_po-menge * i_po-netpr.
      i_rep-curr  = i_po-waers.
    ENDIF.
  break-point.
Get the Vendor Name
    CLEAR lfa1-name1.
    SELECT SINGLE name1 FROM lfa1 INTO lfa1-name1
      WHERE lifnr = i_po-lifnr.
    IF sy-subrc = 0.
      i_rep-name1  = lfa1-name1.
    ENDIF.
    APPEND i_rep.
    CLEAR  i_rep.
      break-point.
  ENDLOOP.
  SORT i_rep BY lifnr ebeln ebelp.
  DELETE i_rep WHERE orewr LE 0.
  break-point.
ENDFORM.                    " fetch_data
*&      Form  display_data
Display the Report Output data
FORM display_data .
  DATA: lv_flag,               " New Flag
        lv_rec TYPE i.         " No of Records
  CLEAR lv_rec.
  IF i_rep[] IS INITIAL.
    MESSAGE e000 WITH 'No Data found'(022).
  ELSE.
    LOOP AT i_rep.
Toggle Color
      PERFORM toggle_color.
      IF lv_flag <> space.
        NEW-LINE.
      ENDIF.
At New Purchase Document
      AT NEW ebeln.
        WRITE:/1 sy-vline, 2(10) i_rep-ebeln INTENSIFIED OFF.
        lv_flag = c_x.
        lv_rec = lv_rec + 1.
      ENDAT.
      WRITE: 1 sy-vline,
            12 sy-vline,13(4)   i_rep-bsart,
            17 sy-vline,18(10)  i_rep-lifnr,
            28 sy-vline,29(35)  i_rep-name1,
            64 sy-vline,65(4)   i_rep-ekgrp,
            69 sy-vline,70(10)  i_rep-bedat,
            80 sy-vline,81(5)   i_rep-ebelp,
            86 sy-vline,87(40)  i_rep-txz01,
           127 sy-vline,128(9)  i_rep-matkl,
           137 sy-vline,138(1)  i_rep-pstyp,
           139 sy-vline,140(1)  i_rep-knttp,
           141 sy-vline,142(4)  i_rep-werks,
           146 sy-vline,147(4)  i_rep-lgort,
           151 sy-vline,152(13) i_rep-menge UNIT i_rep-meins,
           165 sy-vline,166(3)  i_rep-meins,
           169 sy-vline,170(15) i_rep-netpr CURRENCY i_rep-waers,
           185 sy-vline,186(4)  i_rep-waers,
           190 sy-vline,191(5)  i_rep-peinh,
           196 sy-vline,197(4)  i_rep-bprme,
           201 sy-vline,202(15) i_rep-orewr CURRENCY i_rep-curr,
           217 sy-vline,218(4)  i_rep-curr,
           222 sy-vline,223(7)  i_rep-bstyp centered,
           230 sy-vline.
      NEW-LINE.
      hide: i_rep-ebeln.
    ENDLOOP.
    ULINE.
    FORMAT COLOR OFF.
    WRITE : /2 'Total Number of Purchasing Documents:'(025) COLOR 3,
                lv_rec COLOR 3.
  ENDIF.
ENDFORM.                    " display_data
*&      Form  header
Write the Report Header
FORM header .
  FORMAT RESET.
header
  WRITE:/1(230) 'LIST OF PURCHASE DOCUMENTS PER VENDOR'(006) CENTERED.
  SKIP.
  FORMAT COLOR COL_HEADING.
  ULINE.
  WRITE:/1 sy-vline,2(10)   'Pur.Doc.No'(006) CENTERED,
        12 sy-vline,13(4)   'Type'(007),
        17 sy-vline,18(10)  'Vendor'(008) CENTERED,
        28 sy-vline,29(35)  'Name'(009) CENTERED,
        64 sy-vline,65(4)   'PGrp'(010) CENTERED,
        69 sy-vline,70(10)  'Doc.Date'(012) CENTERED,
        80 sy-vline,81(5)   'Item'(011),
        86 sy-vline,87(40)  'Material Short Text'(024) CENTERED,
       127 sy-vline,128(9)  'Mat.Group'(013),
       137 sy-vline,138(1)  'I',
       139 sy-vline,140(1)  'A',
       141 sy-vline,142(4)  'Plnt'(014),
       146 sy-vline,147(4)  'SLoc'(015),
       151 sy-vline,152(13) 'Quantity'(016) CENTERED,
       165 sy-vline,166(3)  'UoM'(017),
       169 sy-vline,170(15) 'Net Value'(018) CENTERED,
       185 sy-vline,186(4)  'Curr'(019),
       190 sy-vline,191(5)  'Per'(020),
       196 sy-vline,197(4)  'Unit'(021),
       201 sy-vline,202(15) 'To be Invoiced'(023) CENTERED,
       217 sy-vline,218(4)  'Curr'(019),
       222 sy-vline,223(7)  'Doc.Cat'(026),
       230 sy-vline.
  ULINE.
ENDFORM.                    " header
*&      Form  toggle_color
This routine alters the color of the records in the list
FORM toggle_color.
  IF gv_dial = space.
    FORMAT COLOR COL_NORMAL INTENSIFIED OFF.
    gv_dial = c_x.
  ELSE.
    FORMAT COLOR 1 INTENSIFIED OFF.
    CLEAR gv_dial.
  ENDIF.
ENDFORM.                    " toggle_color
*&      Form  LINE_SEL
*When double clicked on EBELN field display the details of Purchase Doc
FORM line_sel.
  CASE sy-lsind.
    WHEN '1'.
      DATA: lv_field(20),
            lv_value(10),
            lv_bstyp like i_rep-bstyp.
      clear: lv_bstyp,lv_value, lv_field.
      GET CURSOR FIELD lv_field VALUE lv_value.
      IF lv_field = 'I_REP-EBELN'.
        IF NOT lv_value IS INITIAL.
          READ LINE sy-index FIELD VALUE i_rep-bstyp
                                   INTO  lv_bstyp.
         READ CURRENT LINE FIELD VALUE i_rep-bstyp INTO lv_bstyp.
          if lv_bstyp = 'F'.
            SET PARAMETER ID 'BES' FIELD lv_value.
            CALL TRANSACTION 'ME23N' AND SKIP FIRST SCREEN.
          elseif ( lv_bstyp = 'K' or lv_bstyp = 'L' ).
            SET PARAMETER ID 'VRT' FIELD lv_value.
            CALL TRANSACTION 'ME33' AND SKIP FIRST SCREEN.
          elseif lv_bstyp = 'A'.
            SET PARAMETER ID 'ANF' FIELD lv_value.
            CALL TRANSACTION 'ME43' AND SKIP FIRST SCREEN.
          endif.
        ENDIF.
      ENDIF.
  ENDCASE.
ENDFORM.                    " line_sel
Regards
Anji

Similar Messages

  • Payment by letter of Credit against Purchase order

    When we are purchasing from Foreign Vendors , we need to open a Letter
    of credit (LC) .
    Depending on the terms of Purchase order , Vendor will discount it /get
    payment from Bank on submitting LC and other necessary documents.
    Vendor's Bank, at appropriate Time will send the same to Customer's Bank
    How to mapped this scenario in SAP-MM and FI .
    Activities required to be updated against Purchase order :
    (1) Payment Terms : 100 % against LC on delivery
    (2) History should reflect LC opened - Date and Bank Name which
    Vendor has suggested, our company's Bank Name
    (3) LC discounted details
    (4) LC payment due date to our company Bank - as Procurement needs
    to inform to Finance for this.
    Any help will be highly appreciated.
    Thanks and Best Regards,

    When we are purchasing from Foreign Vendors , we need to open a Letter
    of credit (LC) .
    Depending on the terms of Purchase order , Vendor will discount it /get
    payment from Bank on submitting LC and other necessary documents.
    Vendor's Bank, at appropriate Time will send the same to Customer's Bank
    How to mapped this scenario in SAP-MM and FI .
    Activities required to be updated against Purchase order :
    (1) Payment Terms : 100 % against LC on delivery
    (2) History should reflect LC opened - Date and Bank Name which
    Vendor has suggested, our company's Bank Name
    (3) LC discounted details
    (4) LC payment due date to our company Bank - as Procurement needs
    to inform to Finance for this.
    Any help will be highly appreciated.
    Thanks and Best Regards,

  • Purchase order to payment

    my client requirement is status of the po till payment i want to generate a sap query any body pls guide me purchase order ->down payment ->goods reciept-> invoice verification -> vendor payment
    i want to generate this report vendor wise as well as the material and po
    pls give me indetails tables and fields
    advance thanks for kind reply

    hi,
    Seelct EKBE u2013 EBELN, LIFNR
    Where EKEB- BUKRS Eq (Company Code entered in the selection screen)
               EKBE u2013 BEDAT Eq (Purchasing Document Date entered in the selection screen)
    Select all EKBE u2013 EBELN  in to EKBE 
    Invoice and GRN Document Number: - 
             Select EKEB-BELNR, BUDAT, DMBTR, WRBTR, WAERS
                         Where  EKBE u2013 EBELN   Eq  EBELN Entered in the selection screen
                                     EKBE u2013 GJAHR Eq  GJAHR Entered in the selection screen
                                     EKBE u2013 BUDAT  Eq  BUDAT Entered in the selection screen
                           EKBE u2013 VGABE  Eq  1 (Goods Receipt) (in case of Invoice GRN)
                                     EKBE u2013 VGABE  Eq  2 (Invoice Receipt) (in case of Invoice MIRO)
             Eenter all EKBE u2013 BELNR into BKPF and select BKPF- BELENR, WAERS
                                    BKPF - BUKRS Eq  BUKRS Entered in the selection screen
                                    BKPF u2013 GJAHR Eq  EKBE - GJAHR
                                    BKPF u2013 BUDAT  Eq EKBE - BUDAT 
                                    BKPF u2013 AWKEY Eq  EKBE u2013 BELNR + GJAHR
             Eenter all BKPF u2013 BELNR into BSEG and select BSEG u2013 BELENR, DMBTR
                                   BSEG - BUKRS   Eq  BKPF - BUKRS 
                                   BSEG u2013 GJAHR  Eq  BKPF - GJAHR
                                   BSEG u2013 BUDAT  Eq  EKBE - BUDAT 
                                   BSEG- BELNR    Eq  BKPF u2013 BELNR
    For Payment Document  Select  BSEG u2013 AUGBL
                                     Where BSEG- BELNR    Eq  BKPF u2013 BELNR
                                                BSEG - BUKRS   Eq  BKPF - BUKRS 
                                                BSEG u2013 GJAHR  Eq  BKPF - GJAHR
                                                BSEG u2013 BUDAT  Eq  EKBE - BUDAT 
    Eenter all BSEG u2013 AUGBL into BSEG and select BSEG u2013 BELENR, DMBTR ,
    Where BSEG u2013 BELNR Eq BSEG - BSEG u2013 AUGBL
    For Advance Payment Document  Select  BKPF u2013 BELNR, WAERS and KURSF
                         Where BKPF - BUKRS Eq  BUKRS Entered in the selection screen
                                    BKPF u2013 GJAHR Eq  EKBE - GJAHR
                                    BKPF u2013 BUDAT Eq EKBE - BUDAT 
                                    BKPF u2013 TCODE Eq FBA7 and FBA6
    Enter all BKPF u2013 BELNR into BSEG and select BSEG u2013 BELENR, DMBTR ,
                                     Where BSEG- BELNR    Eq BKPF u2013 BELNR
                                                BSEG - BUKRS   Eq BKPF - BUKRS 
                                                BSEG u2013 GJAHR Eq  BKPF - GJAHR
    Reagrds,
    Rama Mohan

  • Purchase order and message details

    Hi gurus,
    We have a requirement of generating a report of how the purchase orders are being sent to vendor.
    Is there any table or tables that stores information of a purchase order number and how the message (output type) has been processed to vendor like through what medium it has been sent to vendor.
    Example Purchase order 3456 was sent to vendor through fax.
                   Purchase order 4563 was sent to vendor through paper.
                  Purchase order 7865 was sent to vendor through EDI.
    The transmission medium by which it has been sent to vendor need to be captured by purchasing document.
    So gurus, if anyone can advise me of table or relating tables that i can write a query or request abapers to write a custom report, that would be great.
    Thanks in advance,
    Kind regards,
    Gopio.

    Hi,
    All the CONDITION RECORD details like MESSAGE, DESPATCH TIME & LANGUAGE are available in NACH table
    Goto SE16  for NACH and enter the DOCUMENT CONDITION and get te details
    hope it is helpful
    thanks,
    santosh

  • Purchase Order Report

    When Iam trying to take Purchase Order report,
    Fields in PO Report are as follows:
    Posting date, Purchase Order number,Vendor Name, Item Name, Qty, Unit Price, Total Price, & Status.
    For eg:
    PO Num 100 contains 5 Items, Out of which Goods Receipt PO has been raised for 3 Items. and Goods Receipt PO for remaining 2 items have not been raised.
    In this case PO status is OPEN.
    When iam generating PO Report, It shows Status for all the Items are OPEN. bcoz status for the PO is OPEN.
    I want the report to show the status is Closed for the Items for which Goods Receipt PO has been raised. and similarly status must be OPEN for the items for which Goods Receipt PO has not raised. ( PO number is same ).
    Your answers will be very helpfull.
    Thankyou.

    Hi,
           I have created a Column in Purchase Order Screen and i have given two options by name Open/Close.
    I have Created new field by going into......................      Path: ToolsUserdefined FieldsManage User defined fieldsmarketing documentsrows.
    And i have selected check box  set valid values for fields  and i have given Open and Close Options.
    This is effecting in new Purchase Orders which iam creating from now. But it is not reflecting in Purchase docs which i have created earlier.
    So Please let me know what to be done inorder to reflect this change in all Purchase Order Doc's.
    Your Answers will be very much helpfull.
    Thankyou.

  • Open Purchase Order UPload Using the BAPI 's

    i need to upload the open Purchase Order using the BAPI function BAPI_PO_CREATE1., below is the given fileds blod are for Header, header will Repeat for the line items,can any one help me out  using the BAIP's for upload the PO, i need sample code for this ........
    Thanks & Regards
    Raghu
    <u>Field Name     Field Description                              Type     Length</u>
    <b>EBELN             Purchasing Document Number                         CHAR     010          X
    BUKRS             Company Code                                                     CHAR    004     MN10     C
    EKORG             Purchasing Organization                              CHAR     004     MN00     C
    EKGRP             Purchasing group                              CHAR     003          X
    BSART             Order type (Purchasing)                              CHAR     004          X
    LIFNR             Account Number of Vendor or Creditor                    CHAR     010          X
    BEDAT             Purchase Order Date                              DATS     010          X
    ZTERM             Terms of payment key                              CHAR     004          X
    WAERS             Currency Key                                   CUKY     005          X
    INCO1             Incoterms (part 1)                              CHAR     003          X
    INCO2             Incoterms (part 2)                              CHAR     028          X</b>
    EBELP             Item Number of Purchasing Document                    NUMC     005          X
    EMATN             Material number                                   CHAR     018          X
    WERKS             Plant                                        CHAR     004          X
    LGORT             Storage location                              CHAR     004          X
    EPSTP             Item category in purchasing document                    CHAR     001          X
    KNTTP             Account assignment category                         CHAR     001          X
    EINDT             Item delivery date                              DATS     010          X
    MENGE            "Purchase order quantity (direct input, transfer of POs)"     CHAR     013          X
    MEINS            Order unit                                   UNIT     003          X
    NETPR            "Net price: Document currency (direct input, transfer of"     CHAR     011          X
    PEINH            "Price unit (direct input, transfer of POs)"               CHAR     005          X
    BPRME            Order Price Unit (Purchasing)                         UNIT     003          X
    BPUMZ            Numerator: Conversion OPUn into OUn (direct input of POs          CHAR     005          X
    BPUMN            Denominator: Conversion OPUn into OUn (direct input of P          CHAR     005          X
    SAKTO            Cost element                                   CHAR     010          X
    KOSTL              Cost Center                                   CHAR     010          X
    VBELN          Sales and Distribution Document Number                    CHAR     010          X
    VBELP          Sales document item                              NUMC     006          X
    WEMPF          Goods recipient                                   CHAR     012          X
    WEBTH          "Amount in local currency (direct input, transfer of POs)"     CHAR     013          X
    WEBTF          "Amount in document currency (direct input, transfer of P"     CHAR     013          X
    WEREF          Flag for treatment of GR/IR (direct input of POs)          CHAR     001          X
    SPINF          Indicator: Update info record                         CHAR     001          X
    WEPOS          Goods Receipt Indicator                              CHAR     001          X
    REPOS          Invoice receipt indicator                         CHAR     001          X

    i need to upload the open Purchase Order using the BAPI function BAPI_PO_CREATE1., below is the given fileds blod are for Header, header will Repeat for the line items,can any one help me out  using the BAIP's for upload the PO, i need sample code for this ........
    Thanks & Regards
    Raghu
    <u>Field Name     Field Description                              Type     Length</u>
    <b>EBELN             Purchasing Document Number                         CHAR     010          X
    BUKRS             Company Code                                                     CHAR    004     MN10     C
    EKORG             Purchasing Organization                              CHAR     004     MN00     C
    EKGRP             Purchasing group                              CHAR     003          X
    BSART             Order type (Purchasing)                              CHAR     004          X
    LIFNR             Account Number of Vendor or Creditor                    CHAR     010          X
    BEDAT             Purchase Order Date                              DATS     010          X
    ZTERM             Terms of payment key                              CHAR     004          X
    WAERS             Currency Key                                   CUKY     005          X
    INCO1             Incoterms (part 1)                              CHAR     003          X
    INCO2             Incoterms (part 2)                              CHAR     028          X</b>
    EBELP             Item Number of Purchasing Document                    NUMC     005          X
    EMATN             Material number                                   CHAR     018          X
    WERKS             Plant                                        CHAR     004          X
    LGORT             Storage location                              CHAR     004          X
    EPSTP             Item category in purchasing document                    CHAR     001          X
    KNTTP             Account assignment category                         CHAR     001          X
    EINDT             Item delivery date                              DATS     010          X
    MENGE            "Purchase order quantity (direct input, transfer of POs)"     CHAR     013          X
    MEINS            Order unit                                   UNIT     003          X
    NETPR            "Net price: Document currency (direct input, transfer of"     CHAR     011          X
    PEINH            "Price unit (direct input, transfer of POs)"               CHAR     005          X
    BPRME            Order Price Unit (Purchasing)                         UNIT     003          X
    BPUMZ            Numerator: Conversion OPUn into OUn (direct input of POs          CHAR     005          X
    BPUMN            Denominator: Conversion OPUn into OUn (direct input of P          CHAR     005          X
    SAKTO            Cost element                                   CHAR     010          X
    KOSTL              Cost Center                                   CHAR     010          X
    VBELN          Sales and Distribution Document Number                    CHAR     010          X
    VBELP          Sales document item                              NUMC     006          X
    WEMPF          Goods recipient                                   CHAR     012          X
    WEBTH          "Amount in local currency (direct input, transfer of POs)"     CHAR     013          X
    WEBTF          "Amount in document currency (direct input, transfer of P"     CHAR     013          X
    WEREF          Flag for treatment of GR/IR (direct input of POs)          CHAR     001          X
    SPINF          Indicator: Update info record                         CHAR     001          X
    WEPOS          Goods Receipt Indicator                              CHAR     001          X
    REPOS          Invoice receipt indicator                         CHAR     001          X

  • OPEN PURCHASE ORDER

    DEAR ALL,
    WHETHER WE HAVE A STANDARD REPORT IN SAP TO GET QUANTITY AND VALUE DATA OF BACK DATED OPEN PURCHASE ORDER?
    PURCHASE ORDER HAS BEEN PREPARED IN JANUARY, DOWN PAYMENT IS MADE IN THE MONTH OF MARCH, MATERIAL IS RECEIVED (GRN MADE) IN AUGUST
    IN ABOVE CASE WHEN I GENERATE A OPEN PURCHASE ORDER REPORT AS ON 31.03.2008 IT IS NOT SHOWING ME THE QUANTITY & VALUE DETAILS OF OPEN PURCHASE ORDERS.
    PLEASE LET ME KNOW THE WORK AROUND.
    WAITING
    AMIT

    Dear,
    Enter ME2N, Select WE101 in selection parameter field.
    Then enter other required detail and click on execute button.
    So system give you list of open purchase order.
    Then click on change layout button.
    Transfer Still to be invoiced (qty) field Column Set to Display column set mode.
    And click on continua button.
    Duse to this field you can track for how many quantity good receipt is created of purchase order.
    Regards,
    Mahesh Wagh

  • Purchase order to payment cycle report

    Dear Sir/Madam
    We want to have a report on the purchase order to payment cycle.
    this includes the following points:
    1. Purchase Requisition is raised in the system
    2. PO is raised with various line items
    3. Advance payment is done against the PO
    4. GRN is made for goods delivered
    5. Invoice is processed against each GRN
    6. Retention is deducted to be paid in future
    7. Liquidated damages (LD) is deducted which is treated as miscellaneous income in companys books
    8. Payment is made to the vendor
    We require the report in such a way which will give the details of each payment against each GRN line item. tracking of the same should be possible.
    Do we have any standard report which will help in identifying the purchase order to payment cycle.
    Thanks and Regards
    Prashant P. Zinge

    Hi,
    It is always a requiremnet to have a report from PO, GR, IV to payment.
    But unfortunately, SAP do not have such a report, we develop one locally, the difficult is at payment side.
    Several invoices for one vendor has only one payment doc, how to display it need to discuss with end user.

  • Purchase order status open

    Hi Experts,
    Due to some other reasons we tried clear GR/IR clearing a/c. i will explain clearly.
    We have some purchase orders pertaining to 2006 year. we have not done MIGO and we did MIRO, So that we could not able to clear GR/IR A/C. SO, we have posted manual entry with fb50 same as MIGO posting then we cleared both documents with f-03 its done every thing was fine now But if we see purchase order report status showing OPEN
    How to change the status please some one let me know.this is high priority issue.
    Regards,
    JC

    Hi,
    First make sure that you will not receive goods against your PO..Then go to me22n and delete the item in your PO.
    This will resolve your issue.
    Thanks,
    Srinu

  • Report for Planned vs Purchase Order(Qty and rate)

    Hi
    I have the following issue. My client is raising Purchasing requisition and Purchase Orders in Me51N and ME21n respectively. The Project Structure is used only to plan the quantities and rates whereas no PR is released from it. But the components are attached. Now if i make use of the code CN52N, i am getting the planned quantity and unit rate for the planned value whereas no Purchase requisition number or purchase order number is updated in it.
    My requirement is that both planned quantity, rate along with Purchase order quantity and rate should be available in a report.
    1. Is there any setting that we can make so that the details are updated in cn52N (or)
    2. is there any other report with those details (or)
    3. Should that be achived only through ABAP.
    Please suggest.
    Raghav

    There are a few reports that you can use to display STO requisitions and orders, by supplying plant, material, or MD04 like was mentioned.
    The only thing that you don't have in a report is the link to the production order. In SAP in a MTS situation there's no fixed link (pegging) between the requirement (STO) and the supply (prod Ord).
    You can view the pegging dynamically, for example in MD04.
    Edited by: Mario Adler on Oct 27, 2011 12:13 PM

  • Open Qty and Received Qty for Open Purchase Order.

    How to Fetch the open qty and received Qty of every Open purchase orders in EKPO table where ELIKZ = SPACE OR LOEKZ = SPACE. What are the table and field used? Kindly help me.

    Hello Senthilramkumar,
    Use ME2L/ME2N/ME2M with selection parameter WE101.
    Hope this will help.

  • Distinguishing Open and Closed Purchase Orders

    We have a BI query which shows all Purchase Orders split by line item.
    We would like to be able to determine which of those Purchase Order line items is closed within the core SRM system and which are still open.
    Is anybody aware of an InfoObject that would allow us to do that?
    Any help would be much appreciated.
    Thanks,
    Positive Parrot

    You need to ask your functional team or business how they close Purchase Orders.  Most companies I have been at never close the orders or line items.
    At one company, I had an Open Order report requirement and it was messy.  I had to identify which line items still had an open quantity and then load those line items only into a cube.
    I wrote a ton of code to do this and had a few ODS objects to help out.  This wasn't an easy task.
    Hopefully for your sake, your company uses the 0COMPL_DEL (Delivery Completion) characteristic or 0FINAL_INV (Final Invoice Recieved indicator) characteristic and you can base your decision on the values in those fields. 
    I am assuming you are looking at the 2LIS_02_SCL extractor for Purchasing Schedule Lines....
    Good luck,
    Brian

  • Report with open Purchase orders and open Goods Receipt (without invoices)

    Dear All,
    We require a report in purchasing which will show:
    1. open purchase orders
    2. open goods receipts
    We do not want POs and GRs that have been created into invoices to be included in the report.
    At the moment we tried ME2N with RECHNUNG in selection parameters but it includes invoices. We have tried other selection parameters and reports but the results are not helpful.
    I have also checked SDN but there is no correct answer. Most of them specify the ME2N with RECHNUNG as a solution but this does not work for us.
    Any help would be appreciated.
    G.

    Hi,
    Try ME2N, Select WE101....Also Select ALV
    go to next screen....Go to change layout
    Select to be deliverd(Qty) and Value, also to be invoice(Qty) & Value.
    Hope Help U!
    Regards,
    Pardeep Malik

  • Report including open purchase order quantity for one storage location

    Hello gurus,
    I am looking for a report giving me the total/available stock and the open purchase order quantity for all materials stored in a certain storage location.
    I.e. like this:
    Plant 0001, storage loc. 01
    Material        stock        open purchase order quantity
    100000        200 pcs.   50pcs.
    Is there such a report in SAP standard?
    Thanks
    Alicia

    hI
    U want the report like this ,
    MAterial stock availablein storage location and with Open PO quantity for the same material.???
    This report u can get in 2 different transaction . the n u can combine and create one custom transaction .
    One is for materil stock in storage location is MB52 or MB5B
    THen ME2N for open PO quantity for that material.

  • Report for open purchase order quantity

    Dear experts,
    Is there any report for showing open purchase order quantity for which goods are not yet received?
    Regards
    babu

    Hi
    ref the blw link which will have the complete sap std reports
    https://www.sdn.sap.com/irj/scn/wiki?path=/display/erplo/sapStandardReports

  • Open Purchase Order report

    Hello All,
    Anyone know how I can get the list of Open Purchase orders?
    Currently we are pulling all those POs with the following characteristics:
    PO item where
            all schedules have received qty zero.
    Open Schedules (EKET) - Don’t want fully or partially received
         Received Quantity (wemng) = zero
    The performance is not the greatest.
    Just curious to know how others are arriving at the list of Open Purchase Orders.
    Ideas / Thoughts???
    Thanks for any input.

    Why not checking for Final Invoice indicator EKPO-EREKZ = 'X'
    or/and Delivery Completed Indicator EKPO-ELIKZ = 'X'.
    select *
    from ekpo
    into table it_ekpo
    where delkz ne space and (erekz = 'X'
       or elikz = 'X').
    Regards,
    ravi

Maybe you are looking for

  • Database operations in JSP

    I am a java programmer but new to JSP and web site design. now am , designing a website for a bank in which I need to have database operations.from tutorials i see we can use beans or tag lib. which is the best in these 2? which is the simplest in th

  • Suggest me the name of the Standard table name.

    Dear All,             I need to have the Standard SAP table name which stores the details of all the Programs/Reports developed in ABAP.  Pls reply to me asap. Many thanks in Advance. Regards, Sirisha.

  • Can't login to server while trying to add a new member to group.

    While trying to login to add another user to the enterprise group, "unexpected error" comes up hence can't login to create a new user, although sending the new user an invitation. Can someone please solve this asap?

  • There is not sound can't use f key to turn on of off by mute keyoff

    I have no sound my my computer . I can't turn the on and off key and mute buy my key board , yes I am writting with it and offer keys work

  • Simple question that is causing vexiation!

    Hi all, This program should work from what I can tell. I get an error for the subtraction that occures. Would someone please solve this (i'm sure) total simple problem. Oh, btw, all it does is calculate if you've gone over your credit limit by subtra