KUKEY in table FEBKO & FEBEP

Hi,
What is Short key in FEBEP table? How is that populated?
This value is also populated in my FI document in the document header text field. I am new to electronic bank Statement. can anyone throw some light on this please?
Regards,

Hi,
Since bank statement numbers can be repeated, SAP assigns an internal number for every bank statement that is uploaded. This is assigned in FEBKO (which is the header table for the bank statement) and links it to the FEBEP (which is the line item table for the bank statement.
Hope this helps.
Thanks and Regards,
Anit

Similar Messages

  • KUKEY Field in FEBKO table

    Hi Team,
    I would like to know how the FEBKO table gets filled as I need  to find out how the field KUKEY in the table FEBKO gets filled.
    Please help me. This field is displayed in FEBAN transaction.

    Why dont you have a look at the Standard program
    RFEBKA03
    Regards,
    Tanmoy

  • Authorization at Company Code Level for table FEBKO

    Hello Experts,
    I need to add authorization check on my report program that accesses and displays data from table FEBKO. However the user should only be able to access the data of table FEBKO particular only for their company code. How can I apply this? Thanks in advance for all your responses!
    Best Regards,
    Kurtt

    Hi,
    if it is in your own report, you can define your own authorization object with field for company code. Check transaction SU21 or ask your security guy. Then you will check if an user have authorization for this object.
    Cheers

  • FINSTA inbound idocs - "Error during insert in table FEBKO"

    Can anyone tell me , y this error comes?
    I am using File to IDOC scenario.
    I need to update bank statement. It can be given in multiple pages. I need to update depending upon the date as well as its page number.
    Sometimes I get this error. Can anyone tell me , because of what reason I get this error?

    One reason is when multiple statement  files are being processed parallelly, table may get locked and gives this error.

  • Issue with electronic bank statement upload

    Hi All,
              Presently I face an inssue in posting electronic bank statement upload (Tcode - ff_5).
    The scenario goes like this.
             First we do payment to vendor using 'f110' transaction.Here the document currency is different from local currency.Let us say we paid 100 EBP i.e, approximately 177 USD.
    After the payment we get statement from Bank (in this case BAI format).In the bank statement due to exchange rate difference the amount will not be exactly 177 USD but slightly different like 185 USD or may be 170 USD.
           At this point we have to upload this statement using transaction 'FF_5' to system.Here obviously the differential amount goes to the system ( 185 USD or 170 USD).
    Now the issue is we have to post this difference amount like USD 8 or USD 7 to a specific GL account ( 11800 or any other GL acc number ).
    The 'FF_5' transaction updates the tables 'FEBKO,FEBEP' by using the programs 'RFEBBU00',
    'RFEBBU10'.There is an exit also like 'FEB00001'. We can put this difference amount in one of the fields of FEBEP table by using this exit.
       But the point I don't know is how to post this difeerence amount 8 or 7 USD to a specific G/l account ? I could not locate in the above program 'RFEBBU00' where the posting happens ?
    Thanks for any help.
    Vinod.

    Hi Sharaad & Naga,
                         Thanks for the replies.One more doubt, Will I have to use these function modules inside the exit or do I need to change the sap standard program to incorporate these FM calls ?
    Thanks
    Vinod.

  • Tables for Manual Bank Statement

    Hello,
    Can anyone tell me the tables for Manual Bank Statement?
    Regards,
    SDN_Creature

    Hi,
    The tables are FEBEP, FEBKO,U_12398 where the data are stored after the execution of manual bank statement.
    With Regards,
    Sudipto

  • What are the Manual check Deposit Tables and  Fields(FF68)

    Hi Gurus,
    I have reqirement to get get Details about  SlipNO,Cheque NO,Cheque Date,Posting Date,
    Party code,Bank key,Currency ,Amount,Bank Account,Value Date,Entry Date,Banker's name.
    could u help me
    Thanks in Advance
    Sivakumar.

    Hi,
    Yes it doesn't.  Where do you store this information when you are posting in FF68, can you tell me the field names or where exactly do you see these fields.
    For check deposit, you can design your own layout and field text in the layout will not be exactly what you will see in the table.  I think that must be the case in your scenario. 
    Suggest look at the layout configuration from Transaction code OT45, open the variant you use (you can find that from the FF68 screen, menu option Settings --> specifications).
    Also, pick one already posted check deposit in FF68 and look for the values you are interested in for that statement in tables FEBKO and FEBEP.
    There are other tables in Banking but I do not think they would be of much use like FEBCL, FEBRE and FEBVW.  FEBVW will give you the bank name where you are depositing the slip.
    Cheers.

  • What Table for FLB1 Data?

    What table can I use in SE16N to find the lockbox totals such as checks applied, partially applied, etc?

    Hi, Jimmy.
    There is a report for lockbox totals in standard, it is called RFEBLBR1. These are tables that are related to this report: FEBKO, FEBEP, BHDGD and SSCRFIELDS. Check these tables for the fields you are looking for.
    M Trein

  • Bank statement

    when i run my program for electronic bank statement i am getting an error when posting. the error requires me to populate the business area field and i have no idea on were i can populate the business area field. please help.
    below is the source code of bank statement program
      Report zum Einlesen und Verarbeiten des Elektronischen             *
      Kontoauszugs                                                       *
      Erzeugung von Testdateien mit RFEBKAt0 und RFEBKAt1                *
    051198ak reorganized export of print / archive parameters to         *
             insure correct setup for all modes (online/batch/print&exec)*
             changed variable names in EXPORT statement to insure correct*
             functioning of IMPORT statement                             *
    mo271101 included changes for Web GUI compatibility (section 508)    *
    mo260105 included MT942 handling (setting dunning blocks             *
    REPORT RFEBKA00 MESSAGE-ID FB
                    LINE-SIZE 132
                    NO STANDARD PAGE HEADING.
    Include Common Data                                          *
    INCLUDE ZFEBKA03.
    *INCLUDE RFEBKA03.
    INCLUDE ZFEBFR03.
    *INCLUDE RFEBFR03.                      " Data France
    TABLES: RFSDO,
            SSCRFIELDS.
    data: lt_statements type standard table of fieb_kukey,
          l_statement type fieb_kukey.
    *Daten fu00FCr die Mahnsperre                                  "mo260105
    TYPES: BEGIN OF S_KUKEY_MANSP,
            SIGN(1),
            OPTION(2),
            LOW TYPE KUKEY_EB,
            HIGH TYPE KUKEY_EB,
            MANSP TYPE MANSP,
            ANZTG TYPE ANZTG,
            BUKRS TYPE BUKRS,
          END OF S_KUKEY_MANSP.
    DATA: LT_KUKEY TYPE STANDARD TABLE OF S_KUKEY_MANSP,
          L_KUKEY LIKE LINE OF LT_KUKEY,
          L_GJAHR TYPE GJAHR,
          L_MANSP TYPE MANSP,
          L_KUNNR TYPE KUNNR,
          L_LIFNR TYPE LIFNR.
    FIELD-SYMBOLS: <MANSP> LIKE LINE OF GT_MANSP.
    *Ende der Daten fu00FCr die Mahnsperre                         "mo260105
    C5053392 Code Begins
    Parameters                                                   *
    *------- Dateiangaben -
    SELECTION-SCREEN  BEGIN OF BLOCK 1 WITH FRAME TITLE TEXT-165.
    PARAMETERS: EINLESEN  LIKE RFPDO1-FEBEINLES,
                FORMAT       LIKE RFPDO1-FEBFORMAT DEFAULT 'M',
                FILE LIKE RFPDO1-FEBAUSZF default
                   'c:\TESTEBS2.txt',
                STMTNO(5),
                AUSZFILE     LIKE RFPDO1-FEBAUSZF default
                   'c:\bank\auszug.txt',
                UMSFILE      LIKE RFPDO1-FEBUMSF default
                   'c:\bank\umsatz.txt',
               UMSFILE      LIKE RFPDO1-FEBUMSF,
                PCUPLOAD     LIKE RFPDO1-FEBPCUPLD DEFAULT 'X'.
    data : file1 type string.
    *PARAMETERS: INTRADAY     TYPE C DEFAULT SPACE NO-DISPLAY.
    *PARAMETERS: INTRADAY     TYPE C AS CHECKBOX DEFAULT SPACE.
    SELECTION-SCREEN  END OF BLOCK 1.
    *------- Buchungsparameter -
    SELECTION-SCREEN  BEGIN OF BLOCK 2 WITH FRAME TITLE TEXT-160.
    SELECTION-SCREEN  BEGIN OF LINE.
    PARAMETERS: PA_XCALL LIKE FEBPDO-XCALL    RADIOBUTTON GROUP 1.
    SELECTION-SCREEN
      COMMENT 03(29) TEXT-161 FOR FIELD PA_XCALL.
    PARAMETERS: PA_XBKBU LIKE FEBPDO-XBKBU.
    SELECTION-SCREEN
      COMMENT 35(16) TEXT-171 FOR FIELD PA_XBKBU.
    PARAMETERS: PA_MODE  LIKE RFPDO-ALLGAZMD NO-DISPLAY.
    SELECTION-SCREEN: END OF LINE.
    SELECTION-SCREEN  BEGIN OF LINE.
    PARAMETERS: PA_XBDC  LIKE FEBPDO-XBINPT   RADIOBUTTON GROUP 1.
    SELECTION-SCREEN
      COMMENT 03(29) TEXT-163 FOR FIELD PA_XBDC.
    SELECTION-SCREEN
      COMMENT 35(15) TEXT-164 FOR FIELD MREGEL.
    PARAMETERS: MREGEL   LIKE RFPDO1-FEBMREGEL DEFAULT '1'.
    SELECTION-SCREEN: END OF LINE.
    SELECTION-SCREEN: BEGIN OF LINE.
    PARAMETERS: PA_TEST LIKE RFPDO1-FEBTESTL RADIOBUTTON GROUP 1.
    SELECTION-SCREEN
      COMMENT 03(29) TEXT-168 FOR FIELD PA_TEST.
    SELECTION-SCREEN: END OF LINE.
    PARAMETERS: VALUT_ON     LIKE RFPDO2-FEBVALUT DEFAULT 'X'.
    SELECTION-SCREEN  END OF BLOCK 2.
    *------- Finanzdisposition -
    SELECTION-SCREEN  BEGIN OF BLOCK 5 WITH FRAME TITLE TEXT-172.
    SELECTION-SCREEN: BEGIN OF LINE.
    PARAMETERS: PA_XDISP LIKE FEBPDO-XDISP.
    SELECTION-SCREEN
      COMMENT 03(29) TEXT-170 FOR FIELD PA_XDISP.
    PARAMETERS: PA_VERD  LIKE RFFFPDO1-FFDISXVERD.
    SELECTION-SCREEN
      COMMENT 34(15) TEXT-174 FOR FIELD PA_VERD.
    SELECTION-SCREEN
      COMMENT 55(15) TEXT-173 FOR FIELD PA_DSART.
    PARAMETERS: PA_DSART LIKE FDES-DSART.
    SELECTION-SCREEN: END OF LINE.
    PARAMETERS: INTRADAY     LIKE RFPDO1_EN-AKINTRADAY AS CHECKBOX.
    SELECTION-SCREEN  END OF BLOCK 5.
    *------- Interpretationsparameter -
    SELECTION-SCREEN  BEGIN OF BLOCK 3 WITH FRAME TITLE TEXT-166.
    DATA: NUM10(10) TYPE N.
    DATA: CHR16(16) TYPE C.
    SELECT-OPTIONS: S_FILTER FOR  FEBPDO-FEBFILTER1.
    SELECT-OPTIONS: T_FILTER FOR  FEBPDO-FEBFILTER2.
    SELECTION-SCREEN: BEGIN OF LINE.
    SELECTION-SCREEN
       COMMENT 01(31) TEXT-176 FOR FIELD PA_BDART.
    PARAMETERS: PA_BDART     LIKE FEBPDO-BDART.
    SELECTION-SCREEN
       COMMENT 36(21) TEXT-177 FOR FIELD PA_BDANZ.
    PARAMETERS: PA_BDANZ     LIKE FEBPDO-BDANZ.
    data : bankfile1 type string,
           umsfile1 type string,
           ausfile1 type string.
    SELECTION-SCREEN: END OF LINE.
    SELECTION-SCREEN  END OF BLOCK 3.
    *------- Ausgabeparameter -
    SELECTION-SCREEN  BEGIN OF BLOCK 4 WITH FRAME TITLE TEXT-167.
    PARAMETERS: BATCH        LIKE RFPDO2-FEBBATCH,
                P_KOAUSZ     LIKE RFPDO1-FEBPAUSZ,   " Kontoauszug drucken
                P_BUPRO      LIKE RFPDO2-FEBBUPRO,
                P_STATIK     LIKE RFPDO2-FEBSTAT,
                PA_LSEPA     LIKE FEBPDO-LSEPA.
    SELECTION-SCREEN  END OF BLOCK 4.
    *eject
    AT SELECTION-SCREEN                                          *
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR FILE.
      CALL FUNCTION 'KD_GET_FILENAME_ON_F4'
        EXPORTING
          MASK      = ',Multicash,*.txt'
          STATIC    = 'X'
        CHANGING
          FILE_NAME = FILE.
    DATA: L_FILES TYPE FILETABLE,                             "mo271101
           H_FILES TYPE FILE_TABLE,                            "mo271101
           L_RC LIKE SY-SUBRC.                                 "mo271101
    CALL METHOD CL_GUI_FRONTEND_SERVICES=>FILE_OPEN_DIALOG    "mo271101
       CHANGING                                                "mo271101
         FILE_TABLE              = L_FILES                     "mo271101
         RC                      = L_RC                        "mo271101
       EXCEPTIONS                                              "mo271101
         FILE_OPEN_DIALOG_FAILED = 1                           "mo271101
         CNTL_ERROR              = 2                           "mo271101
         ERROR_NO_GUI            = 3                           "mo271101
         NOT_SUPPORTED_BY_GUI    = 4                           "mo271101
         OTHERS                  = 5.                          "mo271101
    IF SY-SUBRC <> 0 OR L_RC < 0.                             "mo271101
       MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO       "mo271101
                  WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.    "mo271101
    ENDIF.                                                    "mo271101
    READ TABLE L_FILES INDEX 1 INTO H_FILES.                  "mo271101
    UMSFILE = H_FILES-FILENAME.                               "mo271101
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR UMSFILE.
      CALL FUNCTION 'KD_GET_FILENAME_ON_F4'
        EXPORTING
          MASK      = ',Multicash,*.txt'
          STATIC    = 'X'
        CHANGING
          FILE_NAME = UMSFILE.
    **AT SELECTION-SCREEN ON VALUE-REQUEST FOR AUSZFILE.          "mo271101
    DATA: L_FILES TYPE FILETABLE,                             "mo271101
           H_FILES TYPE FILE_TABLE,                            "mo271101
           L_RC LIKE SY-SUBRC.                                 "mo271101
    CALL METHOD CL_GUI_FRONTEND_SERVICES=>FILE_OPEN_DIALOG    "mo271101
       CHANGING                                                "mo271101
         FILE_TABLE              = L_FILES                     "mo271101
         RC                      = L_RC                        "mo271101
       EXCEPTIONS                                              "mo271101
         FILE_OPEN_DIALOG_FAILED = 1                           "mo271101
         CNTL_ERROR              = 2                           "mo271101
         ERROR_NO_GUI            = 3                           "mo271101
         NOT_SUPPORTED_BY_GUI    = 4                           "mo271101
         OTHERS                  = 5.                          "mo271101
    IF SY-SUBRC <> 0 OR L_RC < 0.                             "mo271101
       MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO       "mo271101
                  WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.    "mo271101
    ELSE.                                                     "mo271101
       READ TABLE L_FILES INDEX 1 INTO H_FILES.                "mo271101
       AUSZFILE = H_FILES-FILENAME.                            "mo271101
    ENDIF.                                                    "mo271101
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR AUSZFILE.
      CALL FUNCTION 'KD_GET_FILENAME_ON_F4'
        EXPORTING
          MASK      = ',Multicash,*.txt'
          STATIC    = 'X'
        CHANGING
          FILE_NAME = AUSZFILE.
    *------- Dateiangaben -
    AT SELECTION-SCREEN ON BLOCK 1.
      IF SSCRFIELDS-UCOMM = 'ONLI' OR
         SSCRFIELDS-UCOMM = 'PRIN' OR
         SSCRFIELDS-UCOMM = 'SJOB'.
        IF EINLESEN IS INITIAL.
          MESSAGE I660(FV).
          SUBMIT RFEBKA30 VIA SELECTION-SCREEN.
        ENDIF.
        MOVE AUSZFILE TO AUSZUG-FILE.
        MOVE UMSFILE  TO UMSATZ-FILE.
        IF NOT UMSFILE IS INITIAL AND FORMAT NE 'M'.
          SET CURSOR FIELD 'UMSFILE'.
          MESSAGE E621(FV).
        ENDIF.
        IF UMSFILE IS INITIAL AND FORMAT EQ 'M'.
          SET CURSOR FIELD 'UMSFILE'.
          MESSAGE E659(FV).
        ENDIF.
      ENDIF.
    *------- Buchungsparameter -
    AT SELECTION-SCREEN ON BLOCK 2.
      IF NOT PA_XBDC IS INITIAL.
      Batch Input erzeugen
        IF MREGEL IS INITIAL.
          SET CURSOR FIELD 'MREGEL'.
          MESSAGE E619(FV).
        ENDIF.
        IF NOT PA_XBKBU IS INITIAL.
          SET CURSOR FIELD 'PA_XBKBU'.
          MESSAGE E611(FV).
        ENDIF.
      ENDIF.
    *------- Algorithmen  -
    AT SELECTION-SCREEN ON BLOCK 3.
      CLEAR T_FILTER.
      LOOP AT T_FILTER.
        SHIFT T_FILTER-LOW  RIGHT DELETING TRAILING ' '.
        SHIFT T_FILTER-HIGH RIGHT DELETING TRAILING ' '.
        MODIFY T_FILTER.
      ENDLOOP.
      CASE PA_BDART.
        WHEN 1.
          IF NOT PA_BDANZ IS INITIAL.
            SET CURSOR FIELD 'PA_BDANZ'.
            MESSAGE E618(FV).
          ENDIF.
        WHEN 2.
          IF PA_BDANZ IS INITIAL.
            SET CURSOR FIELD 'PA_BDANZ'.
            MESSAGE E615(FV).
          ENDIF.
      ENDCASE.
      EXPORT PA_BDART PA_BDANZ TO MEMORY ID 'RFEBKA00_SEL'. "note 410904
    *---- Ausgabesteuerung
    AT SELECTION-SCREEN ON BLOCK 4.
      IF SY-BATCH = 'X'.
        IF BATCH NE 'X'.
          BATCH = 'X'.
        ENDIF.
      ENDIF.
    *---- Program started with EXEC+PRINT online
      IF BATCH NE 'X'.
        IF P_BUPRO = 'X' OR P_STATIK = 'X'.
          IF SSCRFIELDS-UCOMM = 'PRIN'.
            EXECPRI = 'X'.
          ENDIF.
        ENDIF.
      ENDIF.
    *------- Finanzdisposition -
    AT SELECTION-SCREEN ON BLOCK 5.
      IF NOT PA_XDISP IS INITIAL.
      Call Transaktion
        IF NOT PA_XCALL IS INITIAL.
          SET CURSOR FIELD 'PA_XDISP'.
          MESSAGE E610(FV).
        ENDIF.
        IF PA_DSART IS INITIAL.
          SET CURSOR FIELD 'PA_DSART'.
          MESSAGE E612(FV).
        ENDIF.
      ENDIF.
      IF NOT INTRADAY IS INITIAL.
        IF NOT format CA 'AS'.                                  "mo260105
          SET CURSOR FIELD 'INTRADAY'.
          CLEAR ADVICE_X.
          MESSAGE E003(FTCM).
        ELSE.
          ADVICE_X = '4'.
        ENDIF.
      ENDIF.
    *eject
    START-OF-SELECTION                                           *
    START-OF-SELECTION.
    read print parameters (user defaults) for list-output         *
    required for list-output to spool (i.e. batch or exec&print)  *
      IF ( BATCH = 'X' ) OR ( EXECPRI = 'X' ).
        PERFORM GET_PRINT_PARAMETERS USING PRI_PARAM ARC_PARAM.
      ENDIF.
      PERFORM INITIALIZATION.
      VGEXT_OK = TRUE.
    Einlesen im richtigen Format                                 *
      IF EINLESEN = 'X'.
        CASE FORMAT.
          WHEN 'M'.
          Format: MultiCash (AUSZUG.TXT und UMSAT.TXT)
            perform gmbimport.
            PERFORM MULTICASH(RFEKA200).
          WHEN 'S'.
          Format: SWIFT MT940 (mit Strukturiertem Feld 86)
            PERFORM SWIFT_MT940(RFEKA400).
          WHEN 'I'.
          Format: SWIFT MT940 (unstrukturiertes Feld 86)
            PERFORM SWIFT_MT940(RFEKA400).
          WHEN 'D'.
          Format: DTAUS im Diskettenformat
            PERFORM DTAUS_DISK(RFEKA100).
          WHEN 'E'.
          Format: ETEBAC-Format Frankreich
            PERFORM FORMAT_FRANKREICH(RFEBFR20).
          WHEN 'F'.
          Format: TITO-Format Finnland.
            PERFORM FORMAT_TITO(RFEBFI20).
          WHEN 'C'.
          Format: CSB43-Format Spanien
            PERFORM FORMAT_CSB43(RFEBES20).
          WHEN 'R'.
          Format: CSB43-Format Spanien: Referenzfelder zusammen
            PERFORM FORMAT_CSB43_R(RFEBES20).
          WHEN 'B'.
          Format: Brazil, Banco Itau
            PERFORM FORMAT_ITAU(J_1BBR20).
          WHEN '1'.
          Format: Brazil, Banco Bradesco
            PERFORM FORMAT_BRADESCO(J_1BBR30).
          WHEN 'A'.
          Format: Americas/Austrailia BAI
            PERFORM BAI_STMT_HANDLING(RFEKA700).
          WHEN OTHERS.
        ENDCASE.
    begin process returns:
        loop at s_kukey.
          l_statement-kukey = s_kukey-low.
          append l_statement to lt_statements.
        endloop.
        call function 'FIEB_RETURNS'
          TABLES
            t_statements     = lt_statements
            t_return_charges = g_return_charges.
    end returns
      ENDIF.
    Kontoauszug drucken                                          *
    o printout works for statements only that were newly read in *
      IF P_KOAUSZ = 'X' AND EINLESEN = 'X'.
      die zu druckenden Kontoauszuege sind in Range S_KUKEY (Global Data)
        DESCRIBE TABLE S_KUKEY LINES TFILL_S_KUKEY.
        IF TFILL_S_KUKEY > 0 AND VGEXT_OK = TRUE.
          IF BATCH = 'X'.                            " set up print to spool
            NEW-PAGE PRINT ON PARAMETERS PRI_PARAM
                     ARCHIVE PARAMETERS ARC_PARAM  NO DIALOG.
          ENDIF.
          PERFORM DRUCK_KONTOAUSZUG.
          IF BATCH = 'X'.
            NEW-PAGE PRINT OFF.
            MESSAGE S640(FV) WITH SY-SPONO.
          ENDIF.
        ENDIF.
      ENDIF.
    Finanzdispo Avise erzeugen                                   *
      IF PA_XDISP = 'X'.
        PERFORM FINANZDISPO_AVISE_ERZEUGEN.
      ENDIF.
    Export Print Parameters to Memory                            *
      o at least ONE of the variables EXECPRI / BATCH is ALWAYS   *
        initial here (or both)                                    *
      o import takes place in RFEBBU00 if EXECPRI = 'X'           *
      o import takes place in RFEBBU01 if BATCH (<->JOBNAME) = 'X'*
      o WATCH OUT HERE: variablenames for EXPORT / IMPORT must be *
        identical otherwise IMPORT will not return the        *
        contents of the variables while SY-SUBRC EQ 0 (!!)        *
      IF ( EXECPRI = 'X' ) OR ( BATCH = 'X' ).
        PERFORM EXPORT_PRI_PARAMS.
      ENDIF.
    Verbuchung aufrufen                                          *
      IF  PA_XDISP  = 'X'
      AND PA_TEST   = 'X'.
      falls FINANZDISPOAVISE und NICHT BUCHEN Verbuchung nicht aufrufen
      ELSE.
        IF ANWND = '0004'.   "Intraday
    create dunning blocks if customized in T028B*************"mo260105
        REFRESH R_KUKEY.
          LOOP AT S_KUKEY.
            READ TABLE GT_MANSP ASSIGNING <MANSP>
              WITH KEY KUKEY = S_KUKEY-LOW.
    *gt_mansp is filled by the format specific programs (RFEKA400)
            IF SY-SUBRC = 0.
              IF NOT <MANSP>-MANSP IS INITIAL
                AND NOT <MANSP>-BUKRS IS INITIAL.
                MOVE-CORRESPONDING S_KUKEY TO L_KUKEY.
                MOVE <MANSP>-MANSP TO L_KUKEY-MANSP.
                MOVE <MANSP>-BUKRS TO L_KUKEY-BUKRS.
                MOVE <MANSP>-ANZTG TO L_KUKEY-ANZTG.
                APPEND L_KUKEY TO LT_KUKEY.
              ENDIF.
            ENDIF.
          ENDLOOP.
          IF LINES( LT_KUKEY ) > 0.
            PERFORM SET_GLOBAL_RKUKEY(RFEBBU10) USING LT_KUKEY.
            PERFORM SET_GLOBAL_FILTER(RFEBBU10) USING S_FILTER[] T_FILTER[].
            PERFORM EINZELPOSTEN_AUSWERTEN(RFEBBU10) USING 'X'.
            LOOP AT LT_KUKEY INTO L_KUKEY.
              SELECT * FROM FEBCL
                WHERE KUKEY = L_KUKEY-LOW
                  AND ( KOART = 'K' OR KOART = 'D' )
                  AND AGKON <> SPACE
                  AND SELFD = 'BELNR'
                  AND SELVON <> SPACE.
                IF FEBCL-SELVON+10(4) <> SPACE.
                  L_GJAHR = FEBCL-SELVON+10(4).
                ELSE.
                  L_GJAHR = FEBKO-AZDAT(4).
                ENDIF.
                IF FEBCL-KOART = 'D'.
                  L_KUNNR = FEBCL-AGKON.
                  L_LIFNR = SPACE.
                ELSE.
                  L_KUNNR = SPACE.
                  L_LIFNR = FEBCL-AGKON.
                ENDIF.
                CALL FUNCTION 'FIEB_SET_DUNNING_BLOCK'
                  EXPORTING
                    I_KUKEY          = FEBCL-KUKEY
                    I_ESNUM          = FEBCL-ESNUM
                    I_BUKRS          = L_KUKEY-BUKRS
                    I_BELNR          = FEBCL-SELVON(10)
                    I_GJAHR          = L_GJAHR
                    I_KUNNR          = L_KUNNR
                    I_LIFNR          = L_LIFNR
                    I_MANSP          = L_KUKEY-MANSP
                    I_ANZTG          = L_KUKEY-ANZTG
                  IMPORTING
                    E_MANSP          = L_MANSP
                  EXCEPTIONS
                    ALREADY_EXISTING = 1
                    NOT_POSSIBLE     = 2
                    OTHERS           = 3.
                IF SY-SUBRC <> 0 OR L_MANSP <> L_KUKEY-MANSP.
    *should be entered in the protocol
                ELSE.
    *should also be entered in the protocol
                ENDIF.
              ENDSELECT.
              UPDATE FEBEP SET VB1OK = 'X' VB2OK = 'X'
                               BELNR = '' NBBLN = ''
                WHERE KUKEY = L_KUKEY-LOW.
              UPDATE FEBKO SET VB1OK = 'X' VB2OK = 'X'
                               ASTAT = '8'
                WHERE KUKEY = L_KUKEY-LOW.
            ENDLOOP.
          ENDIF.
    end of dunning block enhancement*************************"mo260105
          PERFORM CREATE_MEMO_RECORDS.
        ELSE.
      Verbuchung aufrufen, falls externe Vorgu00E4nge in T028G
          IF VGEXT_OK = TRUE.
            PERFORM VERBUCHUNG_AUFRUFEN.
            DESCRIBE TABLE NOTT028G LINES TFILL_S_KUKEY.        "Unallocated
            IF TFILL_S_KUKEY > 0.            "is OK
            perform set_print_parameters using batch pri_param.
            perform write_wrong_t028g.                        "no data yet
            perform druck_kontoauszug.                        "put in nott
            perform close_print_parameters using batch.       "yet
            perform delete_statement.
              PERFORM WRITE_WRONG_T028G.                        "hw397778
            ENDIF.
          ELSE.
            DESCRIBE TABLE S_KUKEY LINES TFILL_S_KUKEY.
            IF TFILL_S_KUKEY > 0.
              IF BATCH = 'X'.                        " set up print to spool
                NEW-PAGE PRINT ON PARAMETERS PRI_PARAM
                         ARCHIVE PARAMETERS ARC_PARAM  NO DIALOG.
              ENDIF.
              PERFORM WRITE_WRONG_T028G.
              PERFORM DRUCK_KONTOAUSZUG.
              IF BATCH = 'X'.
                NEW-PAGE PRINT OFF.
                MESSAGE S640(FV) WITH SY-SPONO.
              ENDIF.
              PERFORM DELETE_STATEMENT.
            ENDIF.
          ENDIF.
        ENDIF.
      ENDIF.
    *eject
    Seitenanfangsverarbeitung                                   *
    TOP-OF-PAGE.
    --Batch-Heading-Routine aufrufen--
      PERFORM BATCH-HEADING(RSBTCHH0).
      WRITE: /01 SY-VLINE, 02 SY-ULINE(130), 132 SY-VLINE.
      IF PRINTFLAG = 'A'.
        PERFORM DRUCK_BANKUEBERSCHRIFT.
      ENDIF.
    *eject
    Form-Routinen                                               *
    FORM VERBUCHUNG_AUFRUFEN.                                    *
    FORM VERBUCHUNG_AUFRUFEN.
    Wenn Range leer und Einlesen angeXt, dann gab es keine zu verbuchenden
    Kontoauszu00FCge. Z.B. wenn alle Ktoauszu00FCge schon eingelesen wurden.
      DESCRIBE TABLE S_KUKEY LINES TFILL_S_KUKEY.
      IF TFILL_S_KUKEY = 0 AND EINLESEN = 'X'.
        EXIT.
      ENDIF.
    Felder fu00FCr Reportaufruf fu00FCllen.
      IF BATCH = 'X'.
        JOBNAME(8)     = SY-REPID.
        JOBNAME+8(1)   = '-'.
        JOBNAME+9(14)  = TEXT-002.
        EXPORTID(8)    = SY-REPID.
        EXPORTID+8(8)  = SY-DATUM.
        EXPORTID+16(6) = SY-UZEIT.
        LOOP AT S_KUKEY.
          EXPORTID+23(8) = S_KUKEY-LOW.
          EXIT.
        ENDLOOP.
      ENDIF.
    IF SPOOL = 'X'.                       " QHA  GB
       CLEAR PRI_PARAM.                   " QHA  GB
       PRI_PARAM = %_PRINT.               " QHA  GB
       EXPORT PRI_PARAM TO MEMORY.        " QHA  GB
       IF SY-SUBRC NE 0.                  " QHA  GB
          SPOOL = ' '.                    " QHA  GB
       ENDIF.                             " QHA  GB
    ENDIF.                                " QHA  GB
    Verbuchungsreport aufrufen falls Buchungen erzeugt werden sollen.
      IF BUBER NE SPACE.
        SUBMIT RFEBBU01 AND RETURN
                        WITH ANWND    =  ANWND
                        WITH S_KUKEY  IN S_KUKEY
                        WITH JOBNAME  =  JOBNAME
                        WITH EXPORTID =  EXPORTID
                        WITH BUBER    =  BUBER
                      WITH USEREXIT =  USEREXIT                     "30D
                       WITH SELFD    =  SELFD
                       WITH SELFDLEN =  SELFDLEN
                        WITH S_FILTER IN S_FILTER
                        WITH T_FILTER IN T_FILTER
                        WITH PA_BDART =  PA_BDART
                        WITH PA_BDANZ =  PA_BDANZ
                        WITH FUNCTION =  FUNCTION
                        WITH MODE     =  MODE
                        WITH MREGEL   =  MREGEL
                        WITH PA_EFART =  EFART
                        WITH P_BUPRO  =  P_BUPRO
                      WITH SPOOL    =  SPOOL
                        WITH P_STATIK =  P_STATIK
                        WITH VALUT_ON =  VALUT_ON
                        WITH TESTL    =  PA_TEST
                        WITH EXECPRI  = EXECPRI.
      Jobcount importieren
        IMPORT JOBCOUNT FROM MEMORY ID EXPORTID.
      WRITE: / 'Jobcount = ', JOBCOUNT.
      ENDIF.
    ENDFORM.                    "VERBUCHUNG_AUFRUFEN
    *eject
    *&      Form  FINANZDISPO_AVISE_ERZEUGEN
          text                                                           *
    FORM FINANZDISPO_AVISE_ERZEUGEN.
      LOOP AT S_KUKEY.
        SELECT * FROM FEBKO WHERE KUKEY = S_KUKEY-LOW.
        ENDSELECT.
        IF SY-SUBRC = 0.
          SUBMIT RFEBFD00 AND RETURN
                          WITH P_BUKRS  =  FEBKO-BUKRS
                          WITH P_HBKID  =  FEBKO-HBKID
                          WITH P_HKTID  =  FEBKO-HKTID
                          WITH P_ANWND  =  FEBKO-ANWND          "40a
                          WITH R_AZNUM  =  FEBKO-AZNUM
                          WITH R_AZDAT  =  FEBKO-AZDAT
                          WITH BI-NAME  =  SY-REPID
                          WITH BI-PROC  =  ADVICE_X             "46b
                          WITH BI-DSART =  PA_DSART
                          WITH P_VERD   =  PA_VERD.
        ENDIF.
      ENDLOOP.
    ENDFORM.                               " FINANZDISPO_AVISE_ERZEUGEN
    *eject
    *&      Form  INITIALIZATION
          Felder initialisieren                                          *
    FORM INITIALIZATION.
      DATA: l_job LIKE tbtcjob-jobcount,                        "mo260105
            ls_param LIKE btcselect,                            "mo260105
            lt_joblist TYPE STANDARD TABLE OF tbtcjob.          "mo260105
      UPLOAD    = PCUPLOAD.
      EB_FORMAT = FORMAT.
      IF NOT PA_XCALL IS INITIAL.
        FUNCTION = 'C'.
      ENDIF.
      IF NOT PA_XBDC  IS INITIAL.
        FUNCTION = 'B'.
      ENDIF.
      MODE     = PA_MODE.
      IF  PA_XCALL = 'X'
      AND PA_XBKBU = 'X'.
        BUBER    = '1'.
      ELSE.
        BUBER    = 'A'.
      ENDIF.
      IF INTRADAY = 'X'.
        ANWND    = '0004'.                   "Intraday Stmt
    *begin of MT942 intraday enhancement                       "mo260105
        SELECT SINGLE * FROM t028b WHERE mansp <> space.
        IF sy-subrc = 0.
          ls_param-jobname = 'RFEBKA20'.
          ls_param-username = '*'.
          CALL FUNCTION 'BP_JOB_SELECT'
            EXPORTING
              jobselect_dialog  = 'N'
              jobsel_param_in   = ls_param
              enddate           = sy-datum
            TABLES
              jobselect_joblist = lt_joblist
            EXCEPTIONS
              OTHERS            = 6.
          IF sy-subrc <> 0 OR LINES( lt_joblist ) = 0.
            CALL FUNCTION 'JOB_OPEN'
              EXPORTING
                jobname  = 'RFEBKA20'
              IMPORTING
                jobcount = l_job
              EXCEPTIONS
                OTHERS   = 4.
            IF sy-subrc <> 0.
              MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                 WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
            ENDIF.
            SUBMIT rfebka20 VIA JOB 'RFEBKA20' NUMBER l_job AND RETURN.
            IF sy-subrc = 0.
              CALL FUNCTION 'JOB_CLOSE'
                EXPORTING
                  jobcount  = l_job
                  jobname   = 'RFEBKA20'
                  strtimmed = 'X'
                EXCEPTIONS
                  OTHERS    = 9.
              IF sy-subrc <> 0.
                MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                  WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
              ENDIF.
            ENDIF.
          ENDIF.
        ENDIF.
    *end of MT942 intraday enhancement                         "mo260105
      ELSE.
        ANWND    = '0001'.                   "Anwendung Zwischenspeicher
      ENDIF.
      EFART    = 'E'.                      "Electronischer Kontoauszug
    IF SY-PDEST NE SPACE.                             " QHA
       SPOOL  = 'X'.                                  " QHA
    ENDIF.                                            " QHA
    *-- Avoid initial BUKRS - field: Defaults to page-header for company
    *-- 0000. Fill instead with non-existing value - leads to printout of
    *-- header-text for client.
      BHDGD-BUKRS = '----'.                                     "ak101199
    ENDFORM.                               " INITIALIZATION
    *eject
    *&      Form  WRITE_WRONG_T028G
          Ausgabe der fehlenden Eintru00E4ge in T028G                        *
    FORM WRITE_WRONG_T028G.
      DATA: FIRST(1) TYPE C.                                    "HP
      DATA: x_noposting(1) TYPE c.
      PRINTFLAG = SPACE.
      clear x_noposting.
      LOOP AT NOTT028G WHERE VGDEF = SPACE.
        x_noposting = 'X'.
        exit.
      ENDLOOP.
      NEW-PAGE.
        Druck der ext. Vorgu00E4nge, die nicht in T028G enhalten sind.
      WRITE: /01 SY-VLINE,  TEXT-010,  132 SY-VLINE.
      WRITE: /01 SY-VLINE,  TEXT-011,  132 SY-VLINE.
      WRITE: /01 SY-VLINE,  TEXT-012,  132 SY-VLINE.
      WRITE: /01 SY-VLINE,  TEXT-013,  132 SY-VLINE.
      WRITE: /01 SY-VLINE,  TEXT-014,  132 SY-VLINE.
      WRITE: /01 SY-VLINE,  TEXT-015,  132 SY-VLINE.
      IF X_NOPOSTING EQ 'X'.
        WRITE: /01 sy-vline,  text-017,  132 sy-vline.
      ENDIF.
    WRITE: /01 SY-VLINE,  TEXT-018,  132 SY-VLINE.           "MP
    WRITE: /01 SY-VLINE,  TEXT-019,  132 SY-VLINE.           "MP
    WRITE: /01 SY-VLINE,  TEXT-020,  132 SY-VLINE.           "MP
      FIRST = 'X'.                                              "HP
      LOOP AT NOTT028G WHERE VOZPM = '*'.                       "HP
        IF FIRST = 'X'.                                         "HP
          WRITE: /01 SY-VLINE,  TEXT-010,  132 SY-VLINE.        "HP
          WRITE: /01 SY-VLINE,  TEXT-040,  132 SY-VLINE.        "HP
          WRITE: /01 SY-VLINE,  TEXT-041,  132 SY-VLINE.        "HP
          WRITE: /01 SY-VLINE,  TEXT-042,  132 SY-VLINE.        "HP
          WRITE: /01 SY-VLINE,  TEXT-031,  132 SY-VLINE.        "HP
          "HP
          WRITE: /01 SY-VLINE, 02 SY-ULINE(130), 132 SY-VLINE.  "HP
          CLEAR FIRST.                                          "HP
        ENDIF.                                                  "HP
        WRITE: /01     SY-VLINE,                                "HP
                03(08) NOTT028G-VGTYP,                          "HP
                12(27) NOTT028G-VGEXT,                          "HP
                40(03) '+/-',                                   "HP
                44(20) TEXT-032,                                "HP
                65(15) NOTT028G-BANKL,                          "HP
                81(18) NOTT028G-KTONR,                          "HP
               100(05) NOTT028G-AZNUM,                          "HP
               106(08) NOTT028G-KUKEY,                          "HP
               115(05) NOTT028G-ESNUM,                          "HP
               132     SY-VLINE.                                "HP
        DELETE NOTT028G.                                        "HP
      ENDLOOP.                                                  "HP
      SORT NOTT028G.                                            "HP
      LOOP AT NOTT028G.                                         "HP
        AT FIRST.                                               "HP
          WRITE: /01 SY-VLINE,  TEXT-010,  132 SY-VLINE.
          WRITE: /01 SY-VLINE,  TEXT-030,  132 SY-VLINE.
          WRITE: /01 SY-VLINE,  TEXT-031,  132 SY-VLINE.
          WRITE: /01 SY-VLINE, 02 SY-ULINE(130), 132 SY-VLINE.
        ENDAT.                                                  "HP
    LOOP AT nott028g.                                         "HP
        WRITE: /01     SY-VLINE,
                03(08) NOTT028G-VGTYP,
                12(27) NOTT028G-VGEXT,
                40(01) NOTT028G-VOZPM,
                44(20) TEXT-032,
                65(15) NOTT028G-BANKL,
                81(18) NOTT028G-KTONR,
               100(05) NOTT028G-AZNUM,
               106(08) NOTT028G-KUKEY,
               115(05) nott028g-esnum.
        if nott028g-vgdef = 'X'.
          write  121(07) G_VGEXT.
        endif.
        write  132     sy-vline.
      ENDLOOP.
      WRITE: /01 SY-VLINE, 02 SY-ULINE(130), 132 SY-VLINE.
      if x_noposting = 'X'.
        MESSAGE s773.
      endif.
    ENDFORM.                               " WRITE_WRONG_T028G
    *eject
    Include der Form-Routinen  fu00FCr Ausdruck des Kontoauszuges    *
    INCLUDE ZFEKAP00.
          Form  DELETE_STATEMENT
    FORM DELETE_STATEMENT.
      SELECT * FROM FEBKO  WHERE KUKEY IN S_KUKEY AND ANWND = '0001'.
        DELETE FROM FEBRE WHERE KUKEY = FEBKO-KUKEY.
        DELETE FROM FEBEP WHERE KUKEY = FEBKO-KUKEY.
        MOVE-CORRESPONDING FEBKO TO FEBVW.
        DELETE FEBVW.
        DELETE FEBKO.
      ENDSELECT.
    ENDFORM.                               " DELETE_STATEMENT
    Form  GET_PRINT_PARAMETERS                                           *
    FORM GET_PRINT_PARAMETERS USING P_PRI_PARAM LIKE PRI_PARAMS
                                    P_ARC_PARAM LIKE ARC_PARAMS.
      DATA: LIST_NAME LIKE PRI_PARAMS-PLIST.
      LIST_NAME     = SY-REPID.
      CALL FUNCTION 'GET_PRINT_PARAMETERS'
           EXPORTING
                NO_DIALOG              = 'X'
                LIST_NAME              = LIST_NAME
                MODE                   = 'CURRENT'
              LAYOUT                 = 'X_65_132'
           IMPORTING
                OUT_ARCHIVE_PARAMETERS = P_ARC_PARAM
                OUT_PARAMETERS         = P_PRI_PARAM.
    P_PRI_PARAM-LINSZ = '132'.  "workaround
    ENDFORM.                    "GET_PRINT_PARAMETERS
    Form  EXPORT_PRI_PARAMS                                             *
    Export print and archive parameters for later import in reports     *
    RFEBBU00 or RFEBBU01 (depending on parameters EXECPRI and JOBNAME)*
    Variablenames for IMPORT / EXPORT must be the same, so we better    *
    don't use local variables here.                                     *
    FORM EXPORT_PRI_PARAMS.
      CLEAR PRI_KEY.
      PRI_KEY-REPID = 'RFEBBU00'.
      LOOP AT S_KUKEY.
        PRI_KEY-KUKEY = S_KUKEY-LOW.
        EXIT.
      ENDLOOP.
      EXPORT PRI_PARAM ARC_PARAM TO MEMORY ID PRI_KEY.
    ENDFORM.                                            " EXPORT_PRI_PARAMS
    ----  T H E   E N D -
    *&      Form  CREATE_MEMO_RECORDS
          text
    -->  p1        text
    <--  p2        text
    FORM CREATE_MEMO_RECORDS.
      DATA: XFEBKO LIKE FEBKO OCCURS 2 WITH HEADER LINE.
      DATA: XFEBPI LIKE FEBPI OCCURS 2 WITH HEADER LINE.
      DATA: HEADER_LINE(130) TYPE C.
      DATA: POMSG LIKE BALMT.
      DATA: BEGIN OF ITAB_FDES OCCURS 10.
              INCLUDE STRUCTURE FDES.
      DATA: END OF ITAB_FDES.
      PRINTFLAG = SPACE.
      LOOP AT S_KUKEY.
        AT FIRST.
          IF P_BUPRO = 'X'.
            NEW-PAGE.
            WRITE: /01 SY-VLINE,
                       TEXT-170,
                   132 SY-VLINE.
            WRITE: /01 SY-VLINE, 02 SY-ULINE(130), 132 SY-VLINE.
            HEADER_LINE = TEXT-031.
            SHIFT HEADER_LINE BY 62 PLACES.
            WRITE: /01 SY-VLINE,
                       HEADER_LINE(35),
                   132 SY-VLINE.
            WRITE: /01 SY-VLINE, 02 SY-ULINE(130), 132 SY-VLINE.
          ENDIF.
        ENDAT.
        SELECT * FROM FEBKO WHERE KUKEY = S_KUKEY-LOW.
        ENDSELECT.
        IF SY-SUBRC = 0.
          REFRESH XFEBKO.
          CLEAR   XFEBKO.
          XFEBKO = FEBKO.
          APPEND XFEBKO.
          REFRESH XFEBPI.
          CLEAR   XFEBPI.
          SELECT SINGLE * FROM FEBPI INTO XFEBPI
                 WHERE KUKEY = XFEBKO-KUKEY
                   AND ESNUM = 0.
          IF SY-SUBRC = 0.
            APPEND XFEBPI.
            CALL FUNCTION 'POST_MEMO_ENTRIES_POLLING_DIR'
              TABLES
                T_FEBKO                 = XFEBKO
              T_FEBEP                 =
                T_FEBPI                 = XFEBPI
              EXCEPTIONS
                STATEMENT_NOT_PROCESSED = 1
                DISTINCT_FDES_NOT_FOUND = 1
                OTHER_CUSTOMIZATION     = 1
                NOTHING_TO_POST         = 2
                OTHERS                  = 1.
            IF SY-SUBRC = 0.
              CLEAR POMSG.
    *-- update bdb --
              LOOP AT XFEBKO.
                UPDATE FEBKO
                   SET ASTAT = XFEBKO-ASTAT
                       VB1OK = XFEBKO-VB1OK
                       VB2OK = XFEBKO-VB2OK
                       XFDIS = XFEBKO-XFDIS
                 WHERE ANWND = XFEBKO-ANWND
                   AND ABSND = XFEBKO-ABSND
                   AND AZIDT = XFEBKO-AZIDT
                   AND EMKEY = XFEBKO-EMKEY.
              ENDLOOP.
              LOOP AT XFEBPI.
                UPDATE FEBPI
                   SET IDENR = XFEBPI-IDENR
                       DATM1 = XFEBPI-DATM1
                       TIME1 = XFEBPI-TIME1
                 WHERE KUKEY = XFEBPI-KUKEY
               

    More than 90% of this time it's due to a misunderstanding (in-apps, subscription renewals, etc.), or accidental due to family members (other accunts)...
    At least you can check what's purchased on your own account:
    Tunes Store & Mac App Store: Seeing your purchase history and order numbers
              http://support.apple.com/kb/HT2727
    If the purchases do not show up there, then it's coming from another iTS account. You may wish to contact iTS...
    iTunes Store Support
    http://www.apple.com/emea/support/itunes/contact.html
    They could disable the other account if it turns out not to be accidental, etc.

  • Invoice and Invoice amount in FI/CO When enter check number

    Hi  All,
       I have a requirement like this. We have custom t-code ZF04 ( FAST CASH ) to post payments to customer accounts. In this t-code, we have one field for Check#.  When they enter Check# number and click on 'SEARCH' icon i need to display list of invoices and amounts with in a check.
    I have no idea about tables,. Where to look? What tables do i need to look when enter check number, which returns invoice details.
    Please let me know ASAP....
    I appreciate your help!
    Thanks,
    Suneetha

    Hi,
    One question - Are you getting customer payment trrough <b>LOCKBOX</b>? If yes, then following are the tables
    Check tables <b>FEBKO</b> and <b>FEBEP.</b> The field is <b>FEBEP-CHECT</b> for check number. For this check number take <b>FEBEP-KUKEY</b>. With this KUKEY read table FEBRE. <b>FEBRE-VWEZW is the invoice number</b>.
    So, sequence is
    1. Put Check# --> FEBEP-CHECT  and get FEBEP-KUKEY
    2. Put FEBEP-KUKEY into --> FEBRE-KUKEY
    3. FEBRE-VWEZW is invoice no.
    If you are not using LOCKBOX, How are you getting customer payment? Let me know so i can give you exact answer.
    Regards,
    RS

  • BDC for FF67 not displaying the line itmes of second page

    Hi all,
    I am using the Z BDC report Manual Bank Statement Upload (FF67). The BDC is as mentioned below :
    We are using start variant in the BDC.
    The report is working fine but the issue is that suppose if their are 45 line items and on one page we can have only 30 line items . Then only 30 line items are been displayed . It is not taking the line items which have come on the second page. Please advsie . Below is the code of the BDC.
    REPORT  zfi_bank_recon.
    TABLES : febko.
    DATA: bdcdata LIKE bdcdata    OCCURS 0 WITH HEADER LINE.
    DATA : i_messtab LIKE bdcmsgcoll OCCURS 0 WITH HEADER LINE.
    DATA : BEGIN OF itab OCCURS 0,
           vgman TYPE febmka-vgman,
           valut TYPE char10, "febep-valut,
           kwbtr TYPE char17, "febmka-kwbtr,
           chect_kf TYPE febmkk-chect_kf,
           sgtxt_kf TYPE febmkk-sgtxt_kf,
           count(6) TYPE n,
           END OF itab.
    DATA : BEGIN OF error OCCURS 0,
           msg TYPE string,
          END OF error.
    DATA :flag,
          update VALUE 'A',
          mode VALUE 'N'.
    DATA : aznum1 TYPE aznum,
    lv_esbtr TYPE febko-esbtr,
    lv_esvoz TYPE febko-esvoz,
    lv_opening TYPE char17, "febmka-kwbtr,
    lv_closing TYPE char17. "febmka-kwbtr.
    *& Selection screen
    SELECTION-SCREEN : BEGIN OF BLOCK blk WITH FRAME TITLE text.
    PARAMETERS :  bukrs LIKE febmka-bukrs OBLIGATORY,
                  hbkid LIKE febmka-hbkid OBLIGATORY,
                  hktid LIKE febmka-hktid OBLIGATORY,
                  azdat LIKE febmka-azdat OBLIGATORY,
                  aznum LIKE febmka-aznum OBLIGATORY,
                  budtm LIKE febmka-budtm OBLIGATORY  DEFAULT sy-datum.
    SELECTION-SCREEN :  END OF BLOCK blk.
    SELECTION-SCREEN : BEGIN OF BLOCK blk1 WITH FRAME TITLE text1.
    PARAMETERS: p_file LIKE rlgrap-filename OBLIGATORY.
    SELECTION-SCREEN : END OF BLOCK blk1.
    AT SELECTION-SCREEN.
      SELECT SINGLE * FROM febko INTO febko
      WHERE bukrs = bukrs AND hbkid = hbkid AND
      hktid = hktid  AND aznum = aznum
           AND budtm = budtm
            AND azdat = azdat.
      IF sy-subrc EQ 0.
        MESSAGE e038(000) WITH 'Statement' aznum  'already uploaded; No further processing done'.
      ENDIF.
    At Selection Screen Event
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_file.
      CALL FUNCTION 'F4_FILENAME'
        IMPORTING
          file_name = p_file.
    *& Start of Selection
    START-OF-SELECTION.
      CLEAR : flag.
      PERFORM data_upload.
      PERFORM check_data.
      IF itab[] IS NOT INITIAL AND flag IS INITIAL..
        PERFORM open_group.
        REFRESH bdcdata.
        PERFORM bdcdata. " USING LV_OPENING LV_CLOSING.
      PERFORM bdc_insert.
        PERFORM close_group.
      ENDIF.
    *&      Form  check_data
    FORM check_data.
      LOOP AT itab.
        DATA : int(6) TYPE n.
        CLEAR : int.
        int = sy-tabix.
        IF itab-vgman  IS  INITIAL.
          CONCATENATE 'Transaction type should not be blank : Record no'  int INTO error-msg SEPARATED BY space.
          APPEND error.
          CLEAR : error.
        ENDIF.
        IF itab-valut IS INITIAL.
          CONCATENATE 'Value Date should not be blank : Record no'  int INTO error-msg SEPARATED BY space.
          APPEND error.
          CLEAR : error.
        ENDIF.
        IF itab-kwbtr IS INITIAL.
          CONCATENATE 'Amount should not be blank : Record no'  int INTO error-msg SEPARATED BY space.
          APPEND error.
          CLEAR : error.
        ENDIF.
        IF itab-chect_kf IS INITIAL.
          CONCATENATE 'Bank Reference should not be blank : Record no'  int INTO error-msg SEPARATED BY space.
          APPEND error.
          CLEAR : error.
        ENDIF.
         IF  itab-vgman  NE 'DLF1'
           AND itab-vgman  NE 'DLF2'.
          CONCATENATE 'A Transaction type is not used : Record no'  int INTO error-msg SEPARATED BY space.
          APPEND error.
          CLEAR : error.
        ENDIF.
         IF itab-vgman  EQ 'DLF1'
        AND itab-kwbtr LE 0.
          CONCATENATE 'As per Transaction type, the Amount should be Positive : Record no'  int INTO error-msg SEPARATED BY space.
          APPEND error.
          CLEAR : error.
        ENDIF.
         IF   itab-vgman  EQ 'DLF2'
        AND itab-kwbtr GE 0.
          CONCATENATE 'As per Transaction type, the Amount should be Negative : Record no'  int INTO error-msg SEPARATED BY space.
          APPEND error.
          CLEAR : error.
        ENDIF.
      ENDLOOP.
      IF error[] IS NOT INITIAL.
        WRITE : / 'Error found in upload file'.
        SKIP 2 .
        LOOP AT error.
          WRITE : / error-msg.
        ENDLOOP.
        flag = 'X'.
      ENDIF.
      CLEAR : lv_esbtr, lv_esvoz, aznum1, lv_opening, lv_closing.
      IF flag IS INITIAL.
        SELECT MAX(  DISTINCT  aznum )  FROM febko INTO aznum1
        WHERE bukrs = bukrs AND hbkid = hbkid  AND hktid = hktid.
        IF sy-subrc = 0.
          SELECT SINGLE esbtr esvoz  FROM febko INTO (lv_esbtr,lv_esvoz)
          WHERE bukrs = bukrs AND hbkid = hbkid  AND hktid = hktid AND aznum = aznum1 .
          IF lv_esvoz = 'S'.
            lv_opening = lv_esbtr * -1.
          ELSE.
            lv_opening = lv_esbtr.
          ENDIF.
          lv_closing = lv_opening.
        ENDIF.
        LOOP AT itab.
          lv_closing = lv_closing + itab-kwbtr.
          DATA : lv_count(6) TYPE n.
          lv_count = lv_count + 1.
          MOVE lv_count TO itab-count .
          MODIFY itab FROM itab.
          CLEAR : itab.
        ENDLOOP.
      ENDIF.
    ENDFORM.                    "check_data
    *&      Form  data_upload
    FORM data_upload.
      DATA: loc_filename TYPE string.
      loc_filename = p_file.
      CALL FUNCTION 'GUI_UPLOAD'
        EXPORTING
          filename                = loc_filename
          filetype                = 'ASC'
          has_field_separator     = 'X'
        TABLES
          data_tab                = itab
        EXCEPTIONS
          file_open_error         = 1
          file_read_error         = 2
          no_batch                = 3
          gui_refuse_filetransfer = 4
          invalid_type            = 5
          no_authority            = 6
          unknown_error           = 7
          bad_data_format         = 8
          header_not_allowed      = 9
          separator_not_allowed   = 10
          header_too_long         = 11
          unknown_dp_error        = 12
          access_denied           = 13
          dp_out_of_memory        = 14
          disk_full               = 15
          dp_timeout              = 16
          OTHERS                  = 17.
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
        WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
    ENDFORM.                    "data_upload
    *&      Form  bdcdata
    FORM bdcdata. " USING lv_opening TYPE febko-ssbtr
      "    lv_closing TYPE febko-esbtr.
      DATA : day(2),
             month(2),
             year(4),
             date(10).
      year = azdat+0(4).
      month = azdat+4(2).
      day = azdat+6(2).
      CONCATENATE day month year INTO date.
      CONDENSE : date.
    Comment
      PERFORM bdc_dynpro      USING 'SAPMF40K' '0101'.
      PERFORM bdc_field       USING 'BDC_OKCODE'
                                    '/EVORG'.
      PERFORM bdc_field       USING 'BDC_CURSOR'
                                    'FEBMKA-AZDAT'.
      PERFORM bdc_dynpro      USING 'SAPMF40K' '0110'.
      PERFORM bdc_field       USING 'BDC_CURSOR'
                                    'FEBMKA-VARI_START'.
      PERFORM bdc_field       USING 'BDC_OKCODE'
                                    '=ENTE'.
      PERFORM bdc_field       USING 'FEBMKA-KONT_INT'
                                    'X'.
      PERFORM bdc_field       USING 'FEBMKA-FDIS_SEL'
                                    'X'.
      PERFORM bdc_field       USING 'FEBMKA-VARI_START'
                                    'Z0001'.
      PERFORM bdc_field       USING 'FEBMKA-DEBI_MID'
                                    'D'.
      PERFORM bdc_field       USING 'FEBMKA-KRED_MID'
                                    'K'.
      PERFORM bdc_field       USING 'FEBMKA-WVAR_ART'
                                    '4'.
      PERFORM bdc_field       USING 'FEBMKA-BUCH_VAL'
                                    'X'.
      PERFORM bdc_dynpro      USING 'SAPMF40K' '0101'.
      PERFORM bdc_field       USING 'BDC_CURSOR'
                                    'FEBMKA-ESALD'.
      PERFORM bdc_field       USING 'BDC_OKCODE'
                                    '/00'.
      PERFORM bdc_field       USING 'FEBMKA-BUKRS'
                                    bukrs.
      PERFORM bdc_field       USING 'FEBMKA-HBKID'
                                    hbkid.
      PERFORM bdc_field       USING 'FEBMKA-HKTID'
                                    hktid.
      PERFORM bdc_field       USING 'FEBMKA-AZNUM'
                                    aznum.
      PERFORM bdc_field       USING 'FEBMKA-AZDAT'
                                    date.
      PERFORM bdc_field       USING 'FEBMKA-SSALD'
                                    lv_opening.
      PERFORM bdc_field       USING 'FEBMKA-ESALD'
                                    lv_closing.
      PERFORM bdc_dynpro      USING 'SAPMF40K' '8000'.
      PERFORM bdc_field       USING 'BDC_CURSOR'
                                    'FEBMKK-SGTXT_KF(01)'.
      SORT itab DESCENDING BY count.
      LOOP AT itab.
        PERFORM bdc_field       USING 'BDC_OKCODE'
                                      '=SICH'.
        PERFORM bdc_field       USING 'FEBMKA-VGMAN(01)'
                                      itab-vgman.
        PERFORM bdc_field       USING 'FEBEP-VALUT(01)'
                                      itab-valut.
        PERFORM bdc_field       USING 'FEBMKA-KWBTR(01)'
                                              itab-kwbtr.
        PERFORM bdc_field       USING 'FEBMKK-CHECT_KF(01)'
                                      itab-chect_kf.
        PERFORM bdc_field       USING 'FEBMKK-SGTXT_KF(01)'
                                      itab-sgtxt_kf.
        PERFORM bdc_dynpro      USING 'SAPMF40K' '8000'.
        PERFORM bdc_field       USING 'BDC_CURSOR'
                                      'FEBMKK-SGTXT_KF(01)'.
      ENDLOOP.
      PERFORM bdc_dynpro      USING 'SAPMF40K' '8000'.
      PERFORM bdc_field       USING 'BDC_CURSOR'
                                    'FEBMKA-KWBTR(01)'.
      PERFORM bdc_field       USING 'BDC_OKCODE'
                                    '=SICH'.
      PERFORM bdc_dynpro      USING 'SAPMF40K' '0101'.
      PERFORM bdc_field       USING 'BDC_CURSOR'
                                    'FEBMKA-BUKRS'.
      PERFORM bdc_field       USING 'BDC_OKCODE'
                                    '=BACK'.
      PERFORM bdc_dynpro      USING 'SAPLSPO1' '0100'.
      PERFORM bdc_field       USING 'BDC_OKCODE'
                                    '=NO'.
    ENDFORM.                    "bdcdata
    *&      Form  OPEN_GROUP
    FORM open_group .
      CALL FUNCTION 'BDC_OPEN_GROUP'
        EXPORTING
          client = sy-mandt
          group  = 'BANK_STAT'
          user   = sy-uname.
         keep   = 'X'.
    ENDFORM.                    " OPEN_GROUP
    *&      Form  CLOSE_GROUP
    FORM close_group .
      CALL FUNCTION 'BDC_CLOSE_GROUP'.
      CALL TRANSACTION 'SM35'.
    ENDFORM.                    " CLOSE_GROUP
    *&      Form  bdc_insert
    FORM bdc_insert.
      CALL FUNCTION 'BDC_INSERT'
        EXPORTING
          tcode     = 'FF67'
        TABLES
          dynprotab = bdcdata.
    ENDFORM.                    " bdc_insert
           Start new screen                                              *
    FORM bdc_dynpro USING program dynpro.
      CLEAR bdcdata.
      bdcdata-program  = program.
      bdcdata-dynpro   = dynpro.
      bdcdata-dynbegin = 'X'.
      APPEND bdcdata.
    ENDFORM.                    "BDC_DYNPRO
           Insert field                                                  *
    FORM bdc_field USING fnam fval.
      CLEAR bdcdata.
      bdcdata-fnam = fnam.
      bdcdata-fval = fval.
      APPEND bdcdata.
    ENDFORM.                    "BDC_FIELD

    Hi,
    Use:
    If line item = 30.
    OKCODE = 'P++'. --->For next page after every 30 line items.
    endif.
    Or:(Sumilate in BDC)
    1 . New line.   -
    >Get the Fcode/Sy-ucomm value of New line(Icon on menu bar)
    2.Enter Line Item.
    Follow this after every line item.
    Hope this resolves the issue.
    Regards,
    Gurpreet

  • Automatic post of bank statement

    Hello Gurus,
    Sorry for my bad english, i know i need to imrpove it. So if something sounds really odd, sorry.
    Let´s go, here's my problem.
    We have here a non-standard program wich establish a connection with the bank via Business Connector, and do the download of the bank statement to the SAP and process the bank statement automatically, do the entries in G/L account and other stuff of the process. This process was working perfectly, but a month ago, maybe more, the bank statement stopped to be automatically processed, and becomes avaible only for manual processing in FEBA.
    I think it could might be something envolving the KUKEY field of FEBKO table, i dont know. And something strange is happening sometimes the bank statement is processed automatically, so i was wondering if the KUKEY numbers are not repeating or something like that.
    So here is my question is there any standard TCODE wich i can manager this KUKEY numeration? Or any TCODE to manage the bank statements? Or see any diagnoses for this non automatic importation?
    I hope you have understood my scenario.
    Waiting for advices.
    Regards
    Rafael Valim

    Thanks for the reply Raj,
    Any idea what may causing the problem?
    Regards
    Rafael

  • Ruge problem with bank statement

    Hello Gurus,
    Sorry for my bad english, i know i need to imrpove it. So if something sounds really odd, sorry.
    Let´s go, here's my problem.
    We have here a non-standard program wich establish a connection with the bank via Business Connector, and do the download of the bank statement to the SAP and process the bank statement automatically, do the entries in G/L account and other stuff of the process. This process was working perfectly, but a month ago, maybe more, the bank statement stopped to be automatically processed, and becomes avaible only for manual processing in FEBA.
    I think it could might be something envolving the KUKEY field of FEBKO table, i dont know. And something strange is happening sometimes the bank statement is processed automatically, so i was wondering if the KUKEY numbers are not repeating or something like that.
    So here is my question is there any standard TCODE wich i can manager this KUKEY numeration? Or any TCODE to manage the bank statements? Or see any diagnoses for this non automatic importation?
    I hope you have understood my scenario.
    Waiting for advices.
    Regards
    Rafael Valim

    Hi, I have the same problem when working with local Sap B1 client and DB on the local computer (and connecting as a superuser). Can anyone help?
    May be this additional info will help to determine the problem:
    when working with SAP-client on the terminal server via remote desktop (and DB is on another server) and when I try to update FormatFilePath (in File Formats Setup window), SAP-clinet hangs on (for approximately 10 minutes ) and then I see that no changes were saved (I see button "Update" again, while expect to see "OK", and no changes were saved to DB). There are no error or warning messages..
    When I am updating FileFormat without setting FormatFilePath-column - everything is ok. (info about FileFormat is updated)
    Regards,
    Katrine

  • Quries Regarding EBS

    Hi,
    I uploaded the EBS through TCode: FF_5( MT940 unstructured format),but my problem is that it is not updating the main bank account & how to clear open items for related documents.
    In our case the uploaded file is updating the Table FEBKO field HKONT updating (G/L account for Main Bank) but on Table FEBEP not updating the Field BELNR & ZUONR (No entry found).
    MT940 unstructured format
    Eg
    :20:20101227
    :25:20059281804
    :28C:05
    :60F:D101227INR0,00
    :61:1012271227DX25000,00NCHK500202//
    :86:999/CHEQUE 500202
    :61:1012271227RCX10000,00FREVNONREF//
    :86:999/CHEQUE 500202
    :62F:D101227INR15000,00
    Rgds
    Pramitha.

    Hi,
    Please check the your file contains the document information for the clearing. e.g. invoice document number etc.
    Regards,
    SDNer

  • Red icon remain in FEBAN after using transaction F-03

    Hello,
    From our accounting department I get the following issue, I don't know how to solve this:
    In FEBAN there are some red icons after loading the Electronic Bank Statement (EBS).
    Normally, those issues are solved from FEBAN, but now three issues are solved by transaction F-03 (Clear G/L account).
    These issues now still got a red icon in FEBAN, assuming there is an action required. But the clearing is done.
    How can I solve this, so the red icons will become green?

    E Steures,
    Go to SE16, table FEBKO. Enter AZNUM - Statement number and run. You get this number from FEBAN at the beginning digits of the statement folder. 
    Get KUKEY - Short key and go to SE38, report RFEBKA90 and enter like first field ID and make Change status = '8'.
    When you run FEBAN statement will be green.
    Regards

Maybe you are looking for

  • Year old iPad2

    My year old iPad 2 tells me that it is not charging. It currently has a 13% charge and will not charge with the adapter for an a/c outlet or connected to my Mac. Is my battery finished or is there another fix?

  • Differences between Oracle 8i for a UNIX Platform and Oracle 8i for a Linux Platform

    Hello, J would like to know if there are some differences between Oracle 8i for a UNIX Platform and Oracle 8i for a Linux Platform. I know that there are some differences on Oracle 8i Parallel Server and i know that some products are not include like

  • RWB not in SLD

    Hi guys, I am facing the following problem in a new PI 7.01 installation (be careful the PI version is 7.01 not 7.1). According to the Readiness Check guide everything seems to be working fine, but the RWB is not registered itself in the SLD, under t

  • Cant find the vlan-membership command

    I cant find the vlan-membership command on my 3700 layer 3 switch, i've searched google on whether the command has upgraded to a new syntax to no avail, i'm using GNS3 and the IOS is c3725-adventerprisek9-mz.124-25d.bin

  • Leopard cannot be installed on MacBook Air

    I have not been able to install Leopard on my MacBook Air because of an error message "Mac OS X cannot be installed on "Macintosh HD", because this disk cannot be used to start up your computer." I have gotten this message when trying to install Leop