Release purchase requsition

Dear All,
Company activated release procedure for purchase requisitions but release procedure is not working when we add one more line item in a released purchase requisition # .
Release Indicator details field changes after release process set as "4".
please advise me to solve this issue.
tks/rajesh.

hi,
please see below indicators are used for release statuses in release strategy.
Release ID          Description                  
1                   Request for quotation        
2                   RFQ/purchase order           
3                   RFQ/PO no change of date     
4                   RFQ/PO no changes            
A                   Fixed RFQ                    
B                   Fixed RFQ/purchase order     
X                   Blocked                                                                               
please confirm which one i have to choose as such threy are used below indicators
R1 R2 R3                Release indicator
                         X Blocked        
                         2 RFQ/purchase ord
                         X Blocked        
                         2 RFQ/purchase ord
tks/rajesh

Similar Messages

  • Urgent:regarding purchase requsitions

    HI,
    i am making purchase requsition report in which i have to display that these are the person who released the purchase requsition at dese dates.
    plzzzz help me out as i am able to display only release requsitions but not the person who had released it. i am using table eban.
    IF ANYBODY HELP ME OUT HE OR SHE WILL BE DEFINATELY REWARDED.
    Regards,
    ric.s

    Hi,
    Go through this program, you have answer
    It is possible to generate a complete list of purchase document releases with the purchase document number (requisitions and orders), releaser, release date and release time. * First, create an Infoset using transaction SQ02 directly reading from table CDPOS and create an additional table: CDHDR. If you are releasing purchase requsitions at the item level, it is convenient to create an additional field (PURPS LIKE EBAN-BNFPO) to capture the item number.
    GO THROUGH THIS CODE
    Mass Display of Purchase Orders
    Submitted by webmaster at www.sap-img.com
    Mass display or print Purchase Order History
    You can request report by :
    1. Change date
    2. User Name
    3. Purchase Order Number
    4. Vendor Code
    Written by : SAP Basis, ABAP Programming and Other IMG Stuff
    www.sap-img.com
    REPORT ZPOCHANGE LINE-SIZE 132 NO STANDARD PAGE HEADING
    LINE-COUNT 065(001)
    MESSAGE-ID VR.
    TABLES: DD04T,
    CDHDR,
    CDPOS,
    DD03L,
    DD41V,
    T685T,
    VBPA,
    TPART,
    KONVC,
    EKKO.
    SELECT-OPTIONS: XUDATE FOR CDHDR-UDATE,
    XNAME FOR CDHDR-USERNAME,
    XEBELN FOR EKKO-EBELN,
    XLIFNR FOR EKKO-LIFNR.
    SELECTION-SCREEN SKIP.
    TEXT-001 - Sorting Sequence
    SELECTION-SCREEN BEGIN OF BLOCK BLK1 WITH FRAME TITLE TEXT-001.
    PARAMETERS: SUDATE RADIOBUTTON GROUP R1,
    SNAME RADIOBUTTON GROUP R1,
    SOBID RADIOBUTTON GROUP R1.
    SELECTION-SCREEN END OF BLOCK BLK1.
    DATA: WFLAG,
    WCHANGENR LIKE CDHDR-CHANGENR.
    DATA: INDTEXT(60) TYPE C.
    DATA: BEGIN OF ICDHDR OCCURS 50.
    INCLUDE STRUCTURE CDHDR.
    DATA: END OF ICDHDR.
    DATA: BEGIN OF ICDSHW OCCURS 50.
    INCLUDE STRUCTURE CDSHW.
    DATA: END OF ICDSHW.
    DATA: BEGIN OF EKKEY,
    EBELN LIKE EKET-EBELN,
    EBELP LIKE EKET-EBELP,
    ETENR LIKE EKET-ETENR,
    END OF EKKEY.
    DATA: BEGIN OF ITAB OCCURS 50,
    BEGIN OF EKKEY,
    EBELN LIKE EKET-EBELN,
    EBELP LIKE EKET-EBELP,
    ETENR LIKE EKET-ETENR,
    END OF EKKEY,
    CHANGENR LIKE CDHDR-CHANGENR,
    UDATE LIKE CDHDR-UDATE,
    UTIME LIKE CDHDR-UTIME,
    USERNAME LIKE CDHDR-USERNAME,
    CHNGIND LIKE CDSHW-CHNGIND,
    FTEXT LIKE CDSHW-FTEXT,
    OUTLEN LIKE CDSHW-OUTLEN,
    F_OLD LIKE CDSHW-F_OLD,
    F_NEW LIKE CDSHW-F_NEW,
    END OF ITAB.
    DATA: OLD_OBJECTID LIKE CDHDR-OBJECTID.
    FIELD-SYMBOLS: <F_OLD>, <F_NEW>.
    SELECT * FROM EKKO WHERE EBELN IN XEBELN AND
    LIFNR IN XLIFNR.
    CLEAR CDHDR.
    CLEAR CDPOS.
    CDHDR-OBJECTCLAS = 'EINKBELEG'.
    CDHDR-OBJECTID = EKKO-EBELN.
    PERFORM GETCHGDOCS.
    ENDSELECT.
    IF SUDATE = 'X'.
    SORT ITAB BY UDATE EKKEY-EBELN CHANGENR EKKEY-EBELP
    EKKEY-ETENR.
    ELSEIF SNAME = 'X'.
    SORT ITAB BY USERNAME EKKEY-EBELN CHANGENR EKKEY-EBELP
    EKKEY-ETENR.
    ELSE.
    SORT ITAB BY EKKEY-EBELN CHANGENR EKKEY-EBELP EKKEY-ETENR.
    ENDIF.
    LOOP AT ITAB.
    CLEAR: INDTEXT, EKKEY.
    CASE ITAB-CHNGIND.
    WHEN 'U'.
    INDTEXT(50) = ITAB-FTEXT.
    INDTEXT+51 = TEXT-020.
    CONDENSE INDTEXT.
    WHEN 'D'.
    INDTEXT = TEXT-021.
    WHEN 'E'.
    INDTEXT(5) = ITAB-FTEXT.
    INDTEXT+51 = TEXT-021.
    CONDENSE INDTEXT.
    WHEN 'I'.
    INDTEXT = TEXT-022.
    ENDCASE.
    RESERVE 4 LINES.
    IF WCHANGENR NE ITAB-CHANGENR.
    WCHANGENR = ITAB-CHANGENR.
    EKKEY = ITAB-EKKEY.
    WRITE:/ ITAB-UDATE UNDER 'Change Date',
    ITAB-UTIME UNDER 'Time',
    ITAB-USERNAME UNDER 'User Name',
    ITAB-EKKEY-EBELN UNDER 'PO No',
    ITAB-EKKEY-EBELP UNDER 'Item',
    ITAB-EKKEY-ETENR UNDER 'Sch No',
    INDTEXT UNDER 'Changes'.
    ELSEIF ITAB-EKKEY NE EKKEY.
    WRITE:/ ITAB-EKKEY-EBELP UNDER 'Item',
    ITAB-EKKEY-ETENR UNDER 'Sch No',
    INDTEXT UNDER 'Changes'.
    ENDIF.
    CASE ITAB-CHNGIND.
    WHEN 'U'.
    ASSIGN ITAB-F_OLD(ITAB-OUTLEN) TO <F_OLD>.
    ASSIGN ITAB-F_NEW(ITAB-OUTLEN) TO <F_NEW>.
    WRITE: / TEXT-023 UNDER 'Changes',
    <F_OLD>.
    WRITE: / TEXT-024 UNDER 'Changes',
    <F_NEW>.
    WHEN 'E'.
    ASSIGN ITAB-F_OLD(ITAB-OUTLEN) TO <F_OLD>.
    WRITE: TEXT-023 UNDER 'Changes',
    <F_OLD>.
    ENDCASE.
    SKIP.
    ENDLOOP.
    TOP-OF-PAGE.
    WRITE:/ SY-DATUM,SY-UZEIT,
    50 'P U R C H A S E O R D E R H I S T O R Y',
    120 'Page', SY-PAGNO.
    WRITE: / SY-REPID,
    60 'Purchase Orders Changes'.
    SKIP.
    ULINE.
    IF SUDATE = 'X'.
    WRITE:/001 'Change Date',
    014 'Time',
    024 'User Name',
    038 'PO No',
    050 'Item',
    057 'Sch No',
    065 'Changes'.
    ELSEIF SOBID = 'X'.
    WRITE:/001 'PO No',
    013 'Item',
    020 'Sch No',
    028 'Change Date',
    041 'Time',
    051 'User Name',
    065 'Changes'.
    ELSE.
    WRITE:/001 'User Name',
    015 'Change Date',
    028 'Time',
    038 'PO No',
    050 'Item',
    057 'Sch No',
    065 'Changes'.
    ENDIF.
    ULINE.
    FORM GETCHGDOCS.
    CALL FUNCTION 'CHANGEDOCUMENT_READ_HEADERS'
    EXPORTING
    DATE_OF_CHANGE = CDHDR-UDATE
    OBJECTCLASS = CDHDR-OBJECTCLAS
    OBJECTID = CDHDR-OBJECTID
    TIME_OF_CHANGE = CDHDR-UTIME
    USERNAME = CDHDR-USERNAME
    TABLES
    I_CDHDR = ICDHDR
    EXCEPTIONS
    NO_POSITION_FOUND = 1
    OTHERS = 2.
    CHECK SY-SUBRC EQ 0.
    DELETE ICDHDR WHERE CHANGE_IND EQ 'I'.
    CHECK NOT ICDHDR[] IS INITIAL.
    LOOP AT ICDHDR.
    CHECK ICDHDR-UDATE IN XUDATE.
    CHECK ICDHDR-USERNAME IN XNAME.
    CALL FUNCTION 'CHANGEDOCUMENT_READ_POSITIONS'
    EXPORTING CHANGENUMBER = ICDHDR-CHANGENR
    IMPORTING HEADER = CDHDR
    TABLES EDITPOS = ICDSHW
    EXCEPTIONS NO_POSITION_FOUND = 1
    OTHERS = 2.
    CHECK SY-SUBRC EQ 0.
    LOOP AT ICDSHW.
    CHECK ICDSHW-TEXT_CASE EQ SPACE.
    MOVE-CORRESPONDING ICDSHW TO ITAB.
    MOVE-CORRESPONDING ICDHDR TO ITAB.
    MOVE ICDSHW-TABKEY+3 TO ITAB-EKKEY.
    APPEND ITAB.
    ENDLOOP.
    ENDLOOP.
    ENDFORM.
    END OF PROGRAM
    Regards,
    Satish

  • Purchase requsitions into table EPRTRANS when using release strategy

    Hi,
    We are working with release strategy.
    It is not passible to insert purchase requsitions into the table EPRTRANS when I choose e.g.a material group which
    has been declared as a relevant criteria for release strategy. How can this problem be achived ?
    Regards
    Alexander
    Edited by: AlexanderZiegler on Sep 23, 2009 11:25 AM

    pls. comment out this perform
         PERFORM bbp_release_check USING l_xeban
                                         l_yeban
                                CHANGING no_update
                                         now_released.
         IF no_update = 'X'.                   " preq not yet released
           CONTINUE.
         ENDIF.

  • Purchase requsition and Purchase order Price Changes

    Hi All,
    When purchase requsition(XXXXXXXX) is converted in to a purchase order through ME 59N(YYYYYYYYYY),after converting in to a purchase order i will change the purchase order price to a new value.
    How can i track the price changes for a purchase order that is converted from a purchase requsition.(i know i can see the changes to a PO,under item changes for PO)
    Is this data is stored in any table?
    with regards,
    Amogh

    Hi,
    this change is not captured, because the price is being changed at the point of the PO creation and so there will be no record in the header or item changes option (the system does not see anything as being changed because this is a creation of a new PO).
    The price from the requisition is merely a suggestion and it is not meant to be a purchase price anyway (it is designed to be used to value the requisition for the  release strategy).
    I know that you can configure the system to pass this req "price" to the PO, but it is not the same price and so you will not find the type of controls that you would expect.
    In many cases a simple ABAP is written that reads POs that have a reference requisition and the ABAP compares the prices and reports on those that exceed a tolerance (either hard coded in the program or held on a new table in SAP).
    None of this is standard SAP but it is something that many people create to handle the situation where the user enters the requisition at a deliberately low value to get it through the release strategy.
    Steve B

  • URGETNT: REGARDING Purchase Requsition Approval tables

    hi,
    I am making a report on purchase requsition and i have to display the details of which person has approved it and its date of approval. can anybody tell me which are the tables used in it to display it,example :-
    1st Approval - Name of d person      Date of Approval
    2nd Approval - Name of d person     Date of Approval
    3rd  Approval - Name of d person     Date of Approval
    Final Approval - Name of d person    Date of Approval
    this type of details i want to display in my report. if anybody gives me tables and details about it to make d <b><b>report ,he or she will be definately REWARDED...
    Currently i am using table <b>EBAN,EBKN</b> ..
    Regards,
    Ric.s

    Use these table to see who released and description
    T16FC  -  Release code for particular release group
    T16FD  -  Description for Release code
    T16FG  -  Release Groups
    T16FH  -  Descriptions of Release Groups
    T16FK  -  Release Statuses
    use BAPI to get release information for PR .
    BAPI_REQUISITION_GETRELINFO.
    reward points if useful.
    Regards,
    Vimal
    Message was edited by:
            Vimal Kumar

  • Regarding Purchase Requsition Report

    hi,
    i am making report on Purchase Requsition in which i have to display that these are the persons who had approved at this date.
    i am currently using tables: EBAN,T16FG but it is not giving the desierd result ,can anybody help me out in making thisreport ,HE OR SHE will be definately rewarded.
    Reply as fast as possible.
    regards,
    ric.s

    Hi
    Check/Use the Tables
    <b>T161E and T161F</b> for the PR Release info
    by taking the related fields from EBAN
    also check the Pur requisition Business Object BUS2105 Program for the other release info in SWO1 Tcode, you will find it
    Regards
    Anji

  • Purchase Requsition Data Source

    Dear Consultants,
    I want to extract Purchase Requsition Data from R/3 System.
    But I couldn't find any data source in the R/3 system.
    Is there a standart data source for this?
    Best Regards
    Mehmet

    There is no standard datasource; go in LBWE and include in your transfer structure (of 2LIS_02_SCL)
    MCEKET-BANFN (Purch.req.) and
    MCEKET-BNFPO (Requisn.item).
    These two fields allow to access on the key of EBAN table...here you can find FRGDT field that is release date...
    In the same datasource you can also already find as available the field MCEKKO-EKGRP (Purch. group from T024).
    Hope it helps.
    Regards

  • Purchase requsition date

    Hi All,
    in the purchase requsition, the delivery date and release date shows like 25.03,2009 and 23.03.2009 instead of 2008.
    it should be 2008. kinly give me the valid input on this issue.
    Thanks & Regards
    kannan

    Hi,
    Your basis person needs to change the date in the system.
    Regards,
    Piyush

  • BAPI to approve/reject Purchase Requsition

    Hello all - I need some help from SAP gurus.
    I am looking for two BAPIs - one to approve and one to reject Purchase Requsition item. I am using BAPI_REQUISITION_GETDETAIL and need to approve and reject the purchase requsition that I bring up using said BAPI. Does anyone know if such BAPIs exist? If not, how do you approve or cancel purchase requisition?
    I'd greatly apprecaite your help.
    Thank you
    Halston

    Hi
    I am not sure of the your complete requirement, but you can try this
    BAPI_REQUISITION_RELEASE       Release Purchase Requisition Item by Item
    BAPI_REQUISITION_RELEASE_GEN        Release Entire Purchase Requisition
    BAPI_REQUISITION_RESET_RELEASE       Cancel Release of Purchase Requisition Items
    BAPI_REQUISITION_RESET_REL_GEN        Cancel Overall Release of Purchase Requisitions
    Thanks !
    E.Avudaiappan

  • Project systems module-Budget/Purchase requsition

    Hi,
    Amount from budget is getting reduced when a purchase requsition is
    intended/released.I want this amount to be reduced from budget only when
    purchase order  is released.What should i do for this .

    Hi..
    As per your questions it is not possible to reduced but it is link to your budget and if budget is not available it is give error
    Regards,
    Rajesh

  • 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

  • Returns and Free Item indicator in Purchase Requsition

    Can we get the FREE Item and Returns Item indicator (as available in PO) in Purchase requsition.
    Can we create returns PR or free item PR.
    Thanks,

    PR is an internal document. You do not need a FREE indicater at that level

  • Auto trigger of Purchase requsitions in Sales Order in case of Third party

    Hi,
    In a third party sales scenario, where do we set the automatic creation of Purchase requsitions when we create a third party sales order. I checked the Item category configuartion but couldn't figure it out anywhere.

    Hi Ronaldo,
    In Scheldule Line Category, for the Purchase Order Type,Please select the Options Related to Purchase Requestion.So that we you create the Order automatically the Purchase Requisation Number will get generated.
    Please Reward If Really Helpful,
    Thanks and Regards,
    Sateesh.Kandula

  • 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.

Maybe you are looking for

  • CS6 adobe bridge stuck on building criteria!!

    can anyone tell me why bridge is permanently stuck on building criteria on my CS6 Adobe bridge - on my Mac I never had this problem on my CS5 version. I never ever changed any of the default settings so something is seriously wrong with the default s

  • IMac G4 says it's not connected to Internet but shows it is...

    Hi, I'm not even sure I'm in the right place, but I have a few questions. At first when I connected my iMac G4 to the Internet it kept giving me "there is an error connecting to "XXXXX" network" type thing. Now, since I pressed Cmd, Option, O & F and

  • In iMovie 10.0.2 Why can't I find iMovie projects or events to transfer to external harddrive?

    I am trying to backup my iMovie Projects and all of the media for a number of events. I have been having trouble with iMovie 10.0.2, but it could also be my computer. I am running a Mid 2010 MacBook Pro with Maverick. I have a MacMini that I would li

  • Purchasing module

    Hi, Our proposal customer has a requiest for us. He wants to see somewhere in the A/P invoice the picture of his incoming invoice. It means that the paper based invoice would be scanned,and we have to attach to the A/P invoice. It is possible, with S

  • Backup method in OLTP environment

    Which one of backup strategy would be best for 24/7 OLTP 9i/10g databases with no standby servers on unix clustered machines? Suggestions/comments?