Need Message On change of Released Purchase order

Hi
I need to display message On Edit of released purchase order through ME22N or on click of edit in ME23N
Kindly suggest exits for the same.

Hi Arun,
Create implementation for BADI: ME_PROCESS_PO_CUST. In this get the release status of PO and raise a message.
Regards,
Vijay

Similar Messages

  • Need to get the Last Changed date in Purchase Order.

    Dear Experts,
    I need to get a table which stores the last/ latest change for a Purchase Order.
    For a Purcahse Order, last date  Changes need to be captured , where there was some sort of activity associated with that order. That activity could be a goods receipt, an invoice payment or a change to the Purchase order.
    Thanks in advance.

    Hi,
    You can use EKPO-AEDAT.
    Tables CDHDR and CDPOS contain what chnages you have made.
    Thanks,
    Ramakrishna
    Message was edited by: Ramakrishna Prasad Ramisetti

  • Reset Release Strategy for any change in the Purchase Order

    Hi,
    Is it possible in SAP standards to reset release strategy for even minor changes in the Purchase Order irrespective of whether it is value change or any change in the text or Purchasing group change or whatever it is?
    If so, where do we need to make the configurations.
    I have seen in some thread about resetting the release strategy for decrease in Purchase Order value.Even that was possible through some BAPI.
    Thanks in Advance.
    S.Raghavan

    hi sandesh,
    sorry, i know it's too late.
    i tried your suggestion, it works blocking the purchase order after release strategies are setted.
    sandesh, raghavan:
    i need to reset the strategies after to make any change in the po. i'll appreciate your help if you can give it.
    regards
    f

  • Z Report of Transaction ME28.(Release Purchase Order)

    Dear all,
                   I want to make Z Report for the Transaction ME28 (Release Purchase Order).
    I am facing problem of GUI status in my Z Report. Actually Report is not displaying like ME28.
    and all the menu and function keys are also not coming properly.
    So, pls suggest me good solution.
    Thanks & Regards,
    Sandip Sonar.

    I am attaching a copy of ME28. Please give it to your ABAP consultant.
    He should be able to do the needful:
    REPORT RM06EF00 NO STANDARD PAGE HEADING MESSAGE-ID ME.
           Anzeigen Einkaufsbelege zur Belegnummer                       *
    Tabellen                                                            *
    INCLUDE FM06LTO1.
    INCLUDE FM06LCFR.
    **table added t16fc  - SAPBY     6 Feb 98
    TABLES: T16FG, T16FS, T16FV, T16FE, RM06B, T160B, T16FC.
    DATA: BEGIN OF XEKPO OCCURS 100.
            INCLUDE STRUCTURE EKPO.
    DATA: END OF XEKPO.
    *- Interne Tabelle der Zustände -
    DATA: BEGIN OF ZUS OCCURS 10.
            INCLUDE STRUCTURE T16FV.
    DATA: END OF ZUS.
    DATA: BEGIN OF ZUSKEY,
             MANDT LIKE EKKO-MANDT,
             FRGGR LIKE EKKO-FRGGR,
             FRGSX LIKE EKKO-FRGSX,
          END OF ZUSKEY.
    Parameter und Select-Options                                        *
    PARAMETERS:     P_FRGCO LIKE T16FC-FRGCO OBLIGATORY.
    SELECT-OPTIONS: S_FRGGR FOR EKKO-FRGGR.
    PARAMETERS:     P_FRGSE LIKE RM06A-P_FRGSE DEFAULT 'X',
                    P_FRGRS LIKE RM06A-P_FRGRS,
                    P_FRGVO LIKE RM06A-P_FRGVO DEFAULT 'X',
    set default to 'X' to show items as well - SAPBY
                    P_MITPOS AS CHECKBOX DEFAULT 'X',
    set default to 'DEFAULT'  - SAPBY
                    LISTU LIKE T160O-LISTU DEFAULT 'DEFAULT'.
    SELECT-OPTIONS: S_BSTYP FOR EKKO-BSTYP,
                    S_EKORG FOR EKKO-EKORG,
                    S_EBELN FOR EKKO-EBELN MATCHCODE OBJECT MEKK
                                           MEMORY ID BES,
                    S_BSART FOR EKKO-BSART,
                    S_EKGRP FOR EKKO-EKGRP,
                    S_LIFNR FOR EKKO-LIFNR MATCHCODE OBJECT KRED,
                    S_RESWK FOR EKKO-RESWK,
                    S_BEDAT FOR EKKO-BEDAT.
    Hilfsfelder                                                         *
    INCLUDE FM06LCEK.
    DATA: XFRG1 LIKE EKKO-FRGZU,
          XFRG2 LIKE EKKO-FRGZU.
    DATA: XSELKB LIKE EKKO-BSTYP,
          XSELKK LIKE EKKO-BSTYP,
          XSELKL LIKE EKKO-BSTYP,
          XSELKA LIKE EKKO-BSTYP.
    FIELD-SYMBOLS: .
    DATA: HFDPOS LIKE SY-FDPOS.
    **workflow line added for workflow
    DATA : LAST_USER_COMMAND  LIKE SY-UCOMM.
    Intitialisierung                                                    *
    INITIALIZATION.
      PERFORM ANFORDERUNGSBILD(SAPFM06L) USING XSELKB XSELKK
                                               XSELKL XSELKA.
    lines 67, 70 and 73 commented out -SAPBY
    **listu = t160b-listu.
      S_BSTYP-SIGN = 'I'.
      S_BSTYP-OPTION = 'EQ'.
    **if xselkb ne space.
      S_BSTYP-LOW = 'F'.
      APPEND S_BSTYP.
    **endif.
      IF XSELKK NE SPACE.
        S_BSTYP-LOW = 'K'.
        APPEND S_BSTYP.
      ENDIF.
      IF XSELKL NE SPACE.
        S_BSTYP-LOW = 'L'.
        APPEND S_BSTYP.
      ENDIF.
      IF XSELKA NE SPACE.
        S_BSTYP-LOW = 'A'.
        APPEND S_BSTYP.
      ENDIF.
    next two lines added to default the release code
      IMPORT T16FC-FRGCO FROM MEMORY.
    get parameter id 'ZRC' field t16fc-frgco.
      P_FRGCO = T16FC-FRGCO.
    Seketionsbild                                                       *
    AT SELECTION-SCREEN ON LISTU.
      PERFORM LISTUMFANG(SAPFM06L) USING LISTU.
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR P_FRGCO.
      CALL FUNCTION 'HELP_VALUES_FRGAB'
           EXPORTING
                I_FRGOT = '2'
           IMPORTING
                E_FRGAB = P_FRGCO
           EXCEPTIONS
                OTHERS  = 1.
    AT SELECTION-SCREEN.
      CALL FUNCTION 'ME_REL_CHECK_MANY'
           EXPORTING
                I_FRGOT = '2'
                I_FRGCO = P_FRGCO
           TABLES
                T_FRGGR = S_FRGGR
                T_T16FV = ZUS.
    Beginn der Selektion                                                *
    START-OF-SELECTION.
      NOT_FOUND = 'X'.
      SET PF-STATUS 'FREI'.
      SET TITLEBAR '001' WITH P_FRGCO.
      PERFORM FRG_INIT(SAPFM06L) USING P_FRGCO P_MITPOS.
    *- Lesen Belegköpfe -
      SELECT * FROM EKKO APPENDING TABLE XEKKO
                         FOR ALL ENTRIES IN ZUS
                         WHERE FRGRL EQ 'X'
                           AND FRGGR EQ ZUS-FRGGR
                           AND FRGSX EQ ZUS-FRGSX
                           AND EBELN IN S_EBELN
                           AND BSTYP IN S_BSTYP
                           AND EKORG IN S_EKORG
                           AND LIFNR IN S_LIFNR
                           AND RESWK IN S_RESWK
                           AND BEDAT IN S_BEDAT
                           AND BSART IN S_BSART
                           AND EKGRP IN S_EKGRP
                           AND LOEKZ EQ SPACE.
      IF P_FRGRS NE SPACE.
        SELECT * FROM EKKO APPENDING TABLE XEKKO
                           FOR ALL ENTRIES IN ZUS
                           WHERE FRGRL EQ SPACE
                             AND FRGGR EQ ZUS-FRGGR
                             AND FRGSX EQ ZUS-FRGSX
                             AND EBELN IN S_EBELN
                             AND BSTYP IN S_BSTYP
                             AND EKORG IN S_EKORG
                             AND LIFNR IN S_LIFNR
                             AND RESWK IN S_RESWK
                             AND BEDAT IN S_BEDAT
                             AND BSART IN S_BSART
                             AND EKGRP IN S_EKGRP
                             AND LOEKZ EQ SPACE.
      ENDIF.
      SORT XEKKO.
    *- Prüfen Freigabevoraussetzungen -
      LOOP AT XEKKO.
        MOVE-CORRESPONDING XEKKO TO ZUSKEY.
        READ TABLE ZUS WITH KEY ZUSKEY BINARY SEARCH.
        CHECK SY-SUBRC EQ 0.
        XFRG1 = ZUS+9(8).
        XFRG2 = XEKKO-FRGZU.
        TRANSLATE XFRG2 USING 'X  +'.
        OVERLAY XFRG1 WITH XFRG2 ONLY '+'.
        SEARCH XFRG1 FOR 'X'.
    *---- Keine Freigabezuständigkeit -
        IF SY-SUBRC NE 0.
          DELETE XEKKO.
        ELSE.
    *---- Freigabestelle merken -
          HFDPOS = SY-FDPOS.
          ASSIGN XFRG2+SY-FDPOS(1) TO .
    *---- Freigabe bereits erfolgt -
          IF P_FRGRS EQ SPACE AND
              EQ SPACE.
            DELETE XEKKO.
          ELSE.
    *---- Freigabe noch nicht erfolgt -
            IF P_FRGSE EQ SPACE AND
                NE SPACE.
              DELETE XEKKO.
            ELSE.
    *---- Freigabevoraussetzung fehlt -
              IF XFRG1 CA '+' AND
                 P_FRGVO NE SPACE.
                DELETE XEKKO.
              ELSE.
                EKKO = XEKKO.
                PERFORM FRG_FEKKO_AUFBAUEN(SAPFM06L) USING HFDPOS.
              ENDIF.
            ENDIF.
          ENDIF.
        ENDIF.
      ENDLOOP.
      SORT XEKKO.
    *- Lesen Belegpositionen -
      IF P_MITPOS NE SPACE.
        SELECT * FROM EKPO APPENDING TABLE XEKPO
                           FOR ALL ENTRIES IN XEKKO
                           WHERE EBELN EQ XEKKO-EBELN.
      ENDIF.
    *- Ausgabe -
      LOOP AT XEKKO.
        EKKO = XEKKO.
        PERFORM EKKO_ANSCHRIFT(SAPFM06L).
        PERFORM EKKO_AUSGABE(SAPFM06L).
        IF P_MITPOS NE SPACE.
          LOOP AT XEKPO WHERE EBELN EQ EKKO-EBELN.
            EKPO = XEKPO.
            PERFORM FC_ME_READ_HISTORY(SAPFM06L).
            PERFORM EKPO_AUSGABE(SAPFM06L).
          ENDLOOP.
        ENDIF.
      ENDLOOP.
    Ende der Selektion                                                  *
    END-OF-SELECTION.
      IF NOT_FOUND NE SPACE.
        MESSAGE S260.
        IF SY-CALLD NE SPACE.
          LEAVE.
        ELSE.
          LEAVE TO TRANSACTION SY-TCODE.
        ENDIF.
      ENDIF.
      WRITE: /(81) SY-ULINE.
    OK-Code-Eingabe                                                     *
    AT USER-COMMAND.
    **workflow inserted 6 Feb 98 by SAPBY
        PERFORM WORKFLOW_AT_USER_COMMAND.
    INS GSB 18/02/2004 - check user approving is not user that create
    PO
    if sy-ucomm = 'FRGU' or sy-ucomm = 'FRGS'.
    loop at xekko.
      if xekko-ERNAM = sy-uname.
         CALL FUNCTION 'POPUP_TO_DISPLAY_TEXT'
           EXPORTING
             TITEL              = 'Error'
    TEXTLINE1 = 'As the creator of this pruchase order you cannot approve it
    as well !'
        leave program.
      endif.
    endloop.
    endif.
      PERFORM USER_COMMAND(SAPFM06L).
    Seitenueberschrift                                                  *
    TOP-OF-PAGE.
      PERFORM TOP(SAPFM06L).
    TOP-OF-PAGE DURING LINE-SELECTION.
      PERFORM TOP(SAPFM06L).
    **& form workflow_at_user_command
    TEXT
    ---> p1  text
    <--  p2  text
    FORM WORKFLOW_AT_USER_COMMAND.
      IF LAST_USER_COMMAND IS INITIAL.
        LAST_USER_COMMAND = SY-UCOMM.
      ENDIF.
      IF SY-UCOMM EQ 'ZURU'.
         PERFORM TRIGGER_WORKFLOW.
      ENDIF.
      CASE SY-UCOMM.
        WHEN 'BU'.
          IF P_MITPOS EQ 'X'.
            CHECK LAST_USER_COMMAND <> 'FRGR'.
            PERFORM TRIGGER_WORKFLOW.
          ELSE.
            CHECK LAST_USER_COMMAND = 'FRGS'.
            PERFORM TRIGGER_WORKFLOW.
          ENDIF.
        WHEN 'FRGU'.
          PERFORM TRIGGER_WORKFLOW.
      ENDCASE.
      LAST_USER_COMMAND = SY-UCOMM.
    ENDFORM.
    **& form TRIGGER_WORKFLOW.
    TEXT
    ---> p1  text
    <--  p2  text
    FORM TRIGGER_WORKFLOW.
    DATA : BEGIN OF ZEKKO OCCURS 20.
              INCLUDE STRUCTURE ZEKKO.
    DATA : END OF ZEKKO.
    DATA : BEGIN OF YEKKO OCCURS 20.
              INCLUDE STRUCTURE ZEKKO.
    DATA : END OF YEKKO.
    DATA : WFBAN LIKE EKKO-EBELN,
           WFERN LIKE EKKO-ERNAM.
    CLEAR : WFBAN, WFERN.
    MOVE-CORRESPONDING XEKKO TO YEKKO.
    CONCATENATE YEKKO-FRGZU 'X' INTO YEKKO-FRGZU.
    APPEND YEKKO.
    MOVE-CORRESPONDING XEKKO TO ZEKKO.
    *XEKKO-KZ = 'F'.
    APPEND ZEKKO.
    SELECT SINGLE KOKRS KOSTL
         INTO (EKKN-KOKRS, EKKN-KOSTL)
         FROM EKKN
         WHERE EBELN = XEKKO-EBELN
         AND EBELP   = '00010'.
    if sy-subrc <> 0.                  " Cost centres not mandatory at XXX
      exit.
    endif.
    CALL FUNCTION 'Z_ME_REL_EVENT_EKKO'
         EXPORTING
              I_CALL_UPDKZ = 'F'
              I_WFBAN      = EKKO-EBELN
              I_FRGCO      = T16FC-FRGCO
              I_ERNAM      = SY-UNAME
              I_UCOMM      = SY-UCOMM
         TABLES
              I_EKKO_NEW   =  YEKKO
              I_EKKO_OLD   =  ZEKKO.
    ENDFORM.

  • I Need interactive report to list the purchase orders details for a vendor

    I Need interactive report to list the purchase orders details for a vendor that has    interactive drill down options to give the detail of vendor from vendor master.

    Hi
    see this sample report
    this is Customer wise sales orders
    just make similar report just using LFA1, EKKO and EKPO tables instead of KNA1,VBAK,VBAP
    REPORT ZTEJ_INTAB1 LINE-SIZE 103 LINE-COUNT 35(5) NO STANDARD PAGE
    HEADING.
    *TABLES DECLARATION
    TABLES : KNA1, VBAK, VBAP.
    *SELECT OPTIONS
    SELECT-OPTIONS: CUST_NO FOR KNA1-KUNNR.
    *INITIALIZATION
    INITIALIZATION.
    CUST_NO-LOW = '01'.
    CUST_NO-HIGH = '5000'.
    CUST_NO-SIGN = 'I'.
    CUST_NO-OPTION = 'BT'.
    APPEND CUST_NO.
    *SELECTION SCREEN VALIDATION
    AT SELECTION-SCREEN ON CUST_NO.
    LOOP AT SCREEN.
    IF CUST_NO-LOW < 1 OR CUST_NO-HIGH > 5000.
    MESSAGE E001(ZTJ1).
    ENDIF.
    ENDLOOP.
    *BASIC LIST SELECTION
    START-OF-SELECTION.
    SELECT KUNNR NAME1 ORT01 LAND1 INTO
    (KNA1-KUNNR, KNA1-NAME1,KNA1-ORT01,KNA1-LAND1)
    FROM KNA1
    WHERE KUNNR IN CUST_NO.
    WRITE:/1 SY-VLINE,
    KNA1-KUNNR UNDER 'CUSTOMER NO.' HOTSPOT ON,
    16 SY-VLINE,
    KNA1-NAME1 UNDER 'NAME',
    61 SY-VLINE,
    KNA1-ORT01 UNDER 'CITY',
    86 SY-VLINE,
    KNA1-LAND1 UNDER 'COUNTRY',
    103 SY-VLINE.
    HIDE: KNA1-KUNNR.
    ENDSELECT.
    ULINE.
    *SECONDARY LIST ACCESS
    AT user-command.
    IF SY-UCOMM = 'IONE'.
    PERFORM SALES_ORD.
    ENDIF.
    IF SY-UCOMM = 'ITWO'.
    PERFORM ITEM_DET.
    ENDIF.
    *TOP OF PAGE
    TOP-OF-PAGE.
    FORMAT COLOR 1.
    WRITE : 'CUSTOMER DETAILS'.
    FORMAT COLOR 1 OFF.
    ULINE.
    FORMAT COLOR 3.
    WRITE : 1 SY-VLINE,
    3 'CUSTOMER NO.',
    16 SY-VLINE,
    18 'NAME',
    61 SY-VLINE,
    63 'CITY',
    86 SY-VLINE,
    88 'COUNTRY',
    103 SY-VLINE.
    ULINE.
    FORMAT COLOR 3 OFF.
    *TOP OF PAGE FOR SECONDARY LISTS
    TOP-OF-PAGE DURING LINE-SELECTION.
    *TOP OF PAGE FOR 1ST SECONDARY LIST
    IF SY-UCOMM = 'IONE'.
    ULINE.
    FORMAT COLOR 1.
    WRITE : 'SALES ORDER DETAILS'.
    ULINE.
    FORMAT COLOR 1 OFF.
    FORMAT COLOR 3.
    WRITE : 1 SY-VLINE,
    3 'CUSTOMER NO.',
    16 SY-VLINE,
    18 'SALES ORDER NO.',
    40 SY-VLINE,
    42 'DATE',
    60 SY-VLINE,
    62 'CREATOR',
    85 SY-VLINE,
    87 'DOC DATE',
    103 SY-VLINE.
    ULINE.
    ENDIF.
    FORMAT COLOR 3 OFF.
    *TOP OF PAGE FOR 2ND SECONDARY LIST
    IF SY-UCOMM = 'ITWO'.
    ULINE.
    FORMAT COLOR 1.
    WRITE : 'ITEM DETAILS'.
    ULINE.
    FORMAT COLOR 1 OFF.
    FORMAT COLOR 3.
    WRITE : 1 SY-VLINE,
    3 'SALES ORDER NO.',
    40 SY-VLINE,
    42 'SALES ITEM NO.',
    60 SY-VLINE,
    62 'ORDER QUANTITY',
    103 SY-VLINE.
    ULINE.
    ENDIF.
    FORMAT COLOR 3 OFF.
    *END OF PAGE
    END-OF-PAGE.
    ULINE.
    WRITE :'USER :',SY-UNAME,/,'DATE :', SY-DATUM, 85 'END OF PAGE:',
    SY-PAGNO.
    SKIP.
    *& Form SALES_ORD
    *& FIRST SECONDARY LIST FORM
    FORM SALES_ORD .
    SELECT KUNNR VBELN ERDAT ERNAM AUDAT INTO
    (VBAK-KUNNR, VBAK-VBELN, VBAK-ERDAT, VBAK-ERNAM, VBAK-AUDAT)
    FROM VBAK
    WHERE KUNNR = KNA1-KUNNR.
    WRITE:/1 SY-VLINE,
    VBAK-KUNNR UNDER 'CUSTOMER NO.' HOTSPOT ON,
    16 SY-VLINE,
    VBAK-VBELN UNDER 'SALES ORDER NO.' HOTSPOT ON,
    40 SY-VLINE,
    VBAK-ERDAT UNDER 'DATE',
    60 SY-VLINE,
    VBAK-ERNAM UNDER 'CREATOR',
    85 SY-VLINE,
    VBAK-AUDAT UNDER 'DOC DATE',
    103 SY-VLINE.
    HIDE : VBAK-VBELN.
    ENDSELECT.
    ULINE.
    ENDFORM. " SALES_ORD
    *& Form ITEM_DET
    *& SECOND SECONDARY LIST FORM
    FORM ITEM_DET .
    SELECT VBELN POSNR KWMENG INTO
    (VBAP-VBELN, VBAP-POSNR, VBAP-KWMENG)
    FROM VBAP
    WHERE VBELN = VBAK-VBELN.
    WRITE : /1 SY-VLINE,
    VBAP-VBELN UNDER 'SALES ORDER NO.',
    40 SY-VLINE,
    VBAP-POSNR UNDER 'SALES ITEM NO.',
    60 SY-VLINE,
    VBAP-KWMENG UNDER 'ORDER QUANTITY',
    103 SY-VLINE.
    ENDSELECT.
    ULINE.
    ENDFORM. " ITEM_DET
    REPORT demo_list_at_pf.
    START-OF-SELECTION.
    WRITE 'Basic List, Press PF5, PF6, PF7, or PF8'.
    AT pf5.
    PERFORM out.
    AT pf6.
    PERFORM out.
    AT pf7.
    PERFORM out.
    AT pf8.
    PERFORM out.
    FORM out.
    WRITE: 'Secondary List by PF-Key Selection',
    / 'SY-LSIND =', sy-lsind,
    / 'SY-UCOMM =', sy-ucomm.
    ENDFORM.
    After executing the program, the system displays the basic list. The user can press the function keys F5 , F6 , F7 , and F8 to create secondary lists. If, for example, the 14th key the user presses is F6 , the output on the displayed secondary list looks as follows:
    Secondary List by PF-Key Selection
    SY-LSIND = 14
    SY-UCOMM = PF06
    Example for AT USER-COMMAND.
    REPORT demo_list_at_user_command NO STANDARD PAGE HEADING.
    START-OF-SELECTION.
    WRITE: 'Basic List',
    / 'SY-LSIND:', sy-lsind.
    TOP-OF-PAGE.
    WRITE 'Top-of-Page'.
    ULINE.
    TOP-OF-PAGE DURING LINE-SELECTION.
    CASE sy-pfkey.
    WHEN 'TEST'.
    WRITE 'Self-defined GUI for Function Codes'.
    ULINE.
    ENDCASE.
    AT LINE-SELECTION.
    SET PF-STATUS 'TEST' EXCLUDING 'PICK'.
    PERFORM out.
    sy-lsind = sy-lsind - 1.
    AT USER-COMMAND.
    CASE sy-ucomm.
    WHEN 'FC1'.
    PERFORM out.
    WRITE / 'Button FUN 1 was pressed'.
    WHEN 'FC2'.
    PERFORM out.
    WRITE / 'Button FUN 2 was pressed'.
    WHEN 'FC3'.
    PERFORM out.
    WRITE / 'Button FUN 3 was pressed'.
    WHEN 'FC4'.
    PERFORM out.
    WRITE / 'Button FUN 4 was pressed'.
    WHEN 'FC5'.
    PERFORM out.
    WRITE / 'Button FUN 5 was pressed'.
    ENDCASE.
    sy-lsind = sy-lsind - 1.
    FORM out.
    WRITE: 'Secondary List',
    / 'SY-LSIND:', sy-lsind,
    / 'SY-PFKEY:', sy-pfkey.
    ENDFORM.
    When you run the program, the system displays the following basic list with a the page header defined in the program:
    You can trigger the AT LINE-SELECTION event by double-clicking a line. The system sets the status TEST and deactivates the function code PICK. The status TEST contains function codes FC1 to FC5. These are assigned to pushbuttons in the application toolbar. The page header of the detail list depends on the status.
    Here, double-clicking a line no longer triggers an event. However, there is now an application toolbar containing five user-defined pushbuttons. You can use these to trigger the AT USER-COMMAND event. The CASE statement contains a different reaction for each pushbutton.
    For each interactive event, the system decreases the SY-LSIND system field by one, thus canceling out the automatic increase. All detail lists now have the same level as the basic list and thus overwrite it. While the detail list is being created, SY-LSIND still has the value 1.
    Regards
    Anji

  • Blocking Changes in Released Process Orders

    Hi Experts,
    I need to block manual changes in Released Process Orders ( both in quantity and date) in APO. So, I need some userexit/BADI/FM which can help me to stop this change.
    Can anybody suggest something for this ?

    Hi Ulrich,
    Can you please explain a bit further --when this BAdI comes into picture ? When you save the Product view ?
    Is there something similar for Detailed Scheduling Planning Board also ?

  • Report for released purchase order

    Hai guru's
    this is second time but i did't get any good replay please consider this, i want any standard report for released purchase order,means(i released two backdated po today next day i verify the report ME2n,those po are not display, the system take only document date not released date, now i am using CDHDR through this i got the report. but it is big process, so once check this and send your valuable solution.
    Prasad

    Hi Krishna,
    You could use Me2N with the dynamic selection coupled with normal selection screen.
    In Dynamic selection(3rd icon in screen).....you can select for which company code, release indicator as released....and save it as default variant.
    hope this should solve your query
    Sk.

  • Error release purchase order using transaction code me29n

    i have warning error this purchasing document number cannot be released.
    while i enter me29n t code.why?
    then how to release purchase order using me29n t code?
    can anyone answer this two questions.

    hi
    i have warning error this purchasing document number cannot be released. while i enter me29n t code.why?
    is the release strategy is triggred for the po ?? check thisin  P order in me23n ,in header level check release strategy tab ,
    then how to release purchase order using me29n t code? can anyone answer this two questions.
    just go to me29n >release strategy tab here just click on the release button in front of the release code

  • BAdI or USEREXIT for changing data of purchase order header - ME21N

    hello all,
    I would like to ask you any way to change the field "reason for change" of the Purchase Order  header.
    I tried implementing the method PROCESS_HEADER of IF_EX_ME_PROCESS_PO_CUST
    or changing reason_code of structure ekko in user exits EXIT_SAPMM06E_006 and EXIT_SAPMM06E_006
    but it seems not to work.
    How can i do?..
    sap. v. ecc 6.0

    >
    Shiva Kumar wrote:
    > Use the user exit : EXIT_SAPMM06E_012: This is triggered on saving of a PO...and user can add validations etc in the exit...
    > Cheers
    It doesn't work...
    >
    Martin Voros wrote:
    > you get reference to object IM_HEADER in method PROCESS_HEADER of BADI ME_PROCESS_PO_CUST. On this object you can call two methods - GET_DATA and SET_DATA. GET_DATA returns structure with type MEPOHEADER. You can change your field here and then call method SET_DATA with your modified structure. This should work.
    > Cheers
    ..same thing for this solution...
    the field that i want to change is RSCOD inside structure EREVGRID...it seems to have also get_data and set_data methods ( IF_REVISION_ITEM_DCM ),
    but I don't know which BAdI to implement that has a object type ref to EREVGRID...
    Edited by: E_M on May 13, 2008 11:08 AM

  • Change Document - for purchase order

    Hi all,
    when i make some changes in the purchase order(ME22N) it is stored in the table CDPOS but when i change the delivery address field this alone is not stored. what may be the reason? and how to do it?
    can anyone help me in this?
    helpfull answers will be rewarded with points..
    Thanks,
    Murali.

    Saquib,
    No, this is not directly linked to the customer or vendor master. What happens is, during PO creation the delivery address is picked up from the address of the plant, but that can be updated via both BAPI and transaction.Each time this address gets changed, SAP generates a new ADRNR and store that address in ADRC.
    This might help you in future in case you face such situation. I faced this only a few months and that's why I remeber this so clearly.
    Murali,
    Please award points and close the thread if it helped you.

  • Report or FM to change Plant of Purchase Order

    Hi,
    Can anybody suggest me a way to change Plant of Purchase order Item?
    When i am chacking in me22 Plant is in Disable mode even to change manually. Is there a way to change from a function module or standard report?
    Thanks in Advance,
    Sanjeeva

    Hi Sanjeeva,
    If it's one order only try to use ME22n and check out below condition... also consult functional consultant there..
    Check out whether Tr./Ev. Goods receipt and/or Tr./Ev. Invoice receipt happened for the purchase order which you are trying to change...
    If so and all the quantity received then as per configuration it won't allow you to change the plant..
    try to use T-Code ME22n (SAP Enjoy Transaction)
    If it's for mass change then user BAPI_PO_CHANGE for it...
    Hope it will solve your problem..
    Thanks & Regards
    ilesh 24x7
    ilesh Nandaniya

  • Unprinted released purchase orders

    Hello forum,
    Is there any way from standard SAP (report) to watch, which purchase orders are released but they are NOT printed ?
    Thanks in advance.

    Hi Stratos,
    You can achieve this through Standard SAP. I am assuming that you have the print output, not set, as "send immediately when saving the application"
    Please provide the list of P.O's which you are investigating in ME9F, provide the application as EF and Processing Status as 0 (Not processed)
    This way, you will get the whole list of P.O's which have not been printed out, please note that outputs can only be processed on successfully released Purchase Orders.
    Regards
    Shailesh

  • Change message status after release purchase order

    Hi,
    I'm a newbie in MM...
    When a purchase order is created, the message status is not processed (yellow light) until the purchase order is released. Then the message is printed and the status changes to green light.
    As far as I see, I can't find in the spro where is this customizing set or if there is a user-exit or badi for changing the message status depending on the release indicator.
    Thanks in advance!
    Jen

    Hi Jen,
    Complete the condition record, for example, like this:
    - Transaction: MN04
    - Output Type: NEU
    - Choose third option: Purchasing Output Determination Document Type
    - Document Type: NB
    - Function: VN (Vendor)
    - Medium: 1 (Print output)
    - Date/Time: 4 (Send immediately (when saving the application))
    Select the line and press button "Communication". Complete the output device and mark the option "Print immediately"
    So, when the PO is created the system generates the message with yellow status. Then, when the PO is released, the message status will be green
    Regards,
    Fernando

  • Incorrect message type in IDOC for Purchase order change

    Hi Gurus.
    Please advise on below.
    We have several purchase orders that are configured to trigger IDOC upon change. But accidentally, someone has deactiveted the automatic proposal of EDI message type for these Purchase orders which resulted to not transmitting purchase order change documents automatically.
    As a workaround, we have proposed to create EDI message manually during Purchase order change. But upon checking in tcode WE09, message type is ORDERS which is PO create instead if ORDCHG for purchase order change.
    Please kindly advice on why it is behaving like this for purchase orders with EDI message previously deactivated.
    Thanks in advance.
    Acel.
    To simulate.
    Create PO. go to messages, select EDI message then deactivate permanently. Save PO. Release PO if needed. Change PO. go to messages, EDI is not automatically proposed. create EDI message mamanually. Save PO. Release PO id needed. check tcode WE09, for PO create, no IDOC since it was deactivated permanently. For PO change, IDOC was triggered but with incorrect message type ORDERS instead of ORDCHG.

    Hi Acel,
    You will need to check the settings in transaction WE20 - You will be using a Partner Profile to determine the outbound message, either for each vendor or a generic one.
    on the outbound parameters, you will need to ensure that ORDCHG is set up as a message type. If not, add it, ensuring that you use the message ORDCHG, the basic type (or extension) that you are using, usually ORDERS05 and make sure that in message control, you have process code ME02 set up. This should enable the correct message type to be determined.
    Regards,
    Rob

  • Need to add two activities in Purchase order workflow template

    Hello,
    I got a requirement for purchase order at workflow template level need to add two activities like below
    a) p.o changed
    b) p.o cancelled.
    once p.o changed based on agent determination agent will receive the mail in his inbox same functionality for p.o cancelled. 
    also at work item level need to add attributes .
    but currently standard workflow for PO release it WS200000075  have only release activity   .
    how to add activity types to be available workflow template also please let me how to do binding for above activities once created?

    Hi vinoth,
    yes this p.o workflow based on release strategy. i was copied the standard workflow template added activities
    one is for changed and another is rejection.
    once functional guy rejected the purchase order rejection  activity  not working properly
    also same problem faced for changed step also while change the p.o value at item level.
    i am using business object BUS2012 adding attributes for work item.
    please guide me how to achieve above functionality also how to do binding for changing and rejection activities?

Maybe you are looking for