Program to create Bank Statement

Hi
There is a program to create Bank statement, so that it can be used for Electronic Bank statement processiong FEBA...
I am not able to recollect that program.
Can any help me in this regard.
Points assured
Kalyan

Hi,
I think FINSTA is the message type of IDOC interface
Go to WE20 and maintain the partner profile for FINSTA message type.
To generate the postings that result from the bank statement, schedule report RFEBKA30
http://help.sap.com/saphelp_sm32/helpdata/en/e4/52ec78bfff11d295f400a0c9426c73/content.htm
Regards,
Sridevi
<i><b>Pls. assign points, if it is useful</b></i>

Similar Messages

  • CREATE BANK STATEMENT UPLOAD TXT FILE SAPBYD

    Hi,
    I implemented bank statement upload TXT FILE and loading the file format MT940 UK, load the file with status CONFIRMED but does not perform any bank statement in the list of BANK STATEMENT just seems like INBOUND FILES with status FINISHED but not as financial status.
    Anyone have a UK model MT940, and knows that the next step has to be performed after loading INBOUND FILE
    Email: [email protected]
    PD: Attached my MT940 UK inbound file to review in case .
    Regards

    goto to the user exit where u will find import & export parameters...Now create a project and implement this enhancement...Inside the FM u will find Zprogram which needs to be created. Now write ur code in this by importing data and check routinues and export back to variables....When u run actual transaction, this user exit automatically triggers...

  • Bank Statement Import interface tables

    Hi all,
    I'm using OEBS R 12.1.3. Can anybody tells me/some links or info / about the Bank Statement Import Program which interface tables uses as i cannot found or i'm just a bad researcher...? I have to insert data there in order this program to create bank statements.
    Thanks in advance,
    Bahchevanov.

    See http://docs.oracle.com/cd/A60725_05/html/comnls/us/ce/intert01.htm
    and How To Create New Bank Statement Mapping Template To Requirement, Latest Patch [ID 563476.1]
    Sandeep Gandhi

  • Bank Statement Interface update program for R12

    Hi
    Working on a custom pgm which runs like below
    1.seeded bank statement loader pgm
    2. custom pgm updates the CE_STATEMENT_HEADERS_INT and
    CE_STATEMENT_LINES_INTERFACE tables
    3.seeded Bank Statement Import Program
    Anyone wrote a custom pgm(like in step 2) please let me know how to join
    ap checks all and CE_BANK_ACCOUNTS tables.
    In 11i there is ap bank accounts table and it has attribute2 column..Does 'atribute2' serve the same in R12 CE BANK ACCOUNTS TABLE also?
    Also would like to know how to join between
    --ar_batches_all and ce_bank_accuonts_all tables
    --ap_inv_selection_criteria_all isc and ap_checks_all c and CE_BANK_ACCOUNTS
    please advise
    kp
    Edited by: user12220718 on Feb 25, 2011 9:26 AM

    Hi Tan,
    Based on the external transaction type, you will link to the posting rules. Yes there are so many subfields, available if you see 61 fields, it tells you about the payment you have received/made, it gives the line item details of a particular transaction.
    My sincere request is dont look at the bank statement and do the configuration. Do the configuration first and then SAP provides one program RFEBKATX. Using this program you can create a bank statement file and customer line items. Once after bank statement file is created you can import it using FF_5 and if your configuration is not properly made, it will let you know where you are missing. But this program will generate bank statement file in multi cash. How ever if your configuration is correct and if you are able to import bank statement, then there will not be any difficulty in importing MT 940.
    Hope you understood.
    Regards
    Srikanth

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

  • Bank Statement Import Execution Report error listing

    Hi all,
    Does somebody knows how to see detail error generated via Bank Statement Import Execution Report. The CE_HEADER_INTERFACE_ERRORS and CE_LINE_INTERFACE_ERRORS are populated but i cannot found in metalink description how to solve these errors/or i'm just a bad researcher.../.
    Version: EBS 12.1.3
    OS: Linux
    Thanks in advance,
    Bahchevanov.

    Hi,
    Thanks for reply.
    The tables i'm checking are ce_statement_headers_int, ce_statement_lines_interface. For any errors: CE_HEADER_INTERFACE_ERRORS, CE_LINE_INTERFACE_ERRORS.
    I found that these 3 lines are reconciled. When i unreconciled them and after that reconciled again - they disappeared from the output.
    Do you know if that program contains information about the statements created?
    Because if i execute it, it creates bank statement header with lines correctly but i received no information about what i just created.
    Thanks in advance,
    Bahchevanov.

  • Bank Statement Interface

    I'm working at a site setting up Cash Management for the first time in the UK - they want to import bank statements using Barclays Business Manager software - the format that seems most useful is BAI - does anyone have the specification of the fields in a BAI format file and / or written this interface in the past ?

    Hi Tan,
    Based on the external transaction type, you will link to the posting rules. Yes there are so many subfields, available if you see 61 fields, it tells you about the payment you have received/made, it gives the line item details of a particular transaction.
    My sincere request is dont look at the bank statement and do the configuration. Do the configuration first and then SAP provides one program RFEBKATX. Using this program you can create a bank statement file and customer line items. Once after bank statement file is created you can import it using FF_5 and if your configuration is not properly made, it will let you know where you are missing. But this program will generate bank statement file in multi cash. How ever if your configuration is correct and if you are able to import bank statement, then there will not be any difficulty in importing MT 940.
    Hope you understood.
    Regards
    Srikanth

  • SAP MT940 bank statement interface to SAP

    Dear expert,
    We plan to integrate the bank statement in SAP MT940 format to SAP. Can you please kindly share if you have any information on how to configure the SAP for uploading the SAP MT940 format?
    The configuration guide that I have is : FI Electronic Bank Statement from SAP R/3; based on this guide the recommended bank statement format is in Multicash Format.
    Thank you very much in advance for your kind assistance.
    Best regards,
    DTan

    Hi Tan,
    Based on the external transaction type, you will link to the posting rules. Yes there are so many subfields, available if you see 61 fields, it tells you about the payment you have received/made, it gives the line item details of a particular transaction.
    My sincere request is dont look at the bank statement and do the configuration. Do the configuration first and then SAP provides one program RFEBKATX. Using this program you can create a bank statement file and customer line items. Once after bank statement file is created you can import it using FF_5 and if your configuration is not properly made, it will let you know where you are missing. But this program will generate bank statement file in multi cash. How ever if your configuration is correct and if you are able to import bank statement, then there will not be any difficulty in importing MT 940.
    Hope you understood.
    Regards
    Srikanth

  • Bank Statement Import Execution Report output wrong?

    Hi all,
    In EBS R 12.1.3. for the concurrent request Bank Statement Import Execution Report i have always as output :
    Miscellaneous Receipts Created
       ---------------------Transaction-------------------
    Line      Numbe       Type                 Date        Curr           Amount
    2         25-МАР-2012 Misc Receipt         25-MAR-12   BGN          9,000.00
    4         25-МАР-2012 Misc Payment         25-MAR-12   BGN              1.00
    5         25-МАР-2012 Misc Receipt         25-MAR-12   BGN             10.00I checked the interface tables - they are empty...
    Even the output is strange... it created miscellaneous receipts which i'm not sure is possible via this program.
    Any ideas? Do i have to purge other tables?
    The interface tables for errors are also empty.
    Thanks in advance,
    Bahchevanov.

    Hi,
    Thanks for reply.
    The tables i'm checking are ce_statement_headers_int, ce_statement_lines_interface. For any errors: CE_HEADER_INTERFACE_ERRORS, CE_LINE_INTERFACE_ERRORS.
    I found that these 3 lines are reconciled. When i unreconciled them and after that reconciled again - they disappeared from the output.
    Do you know if that program contains information about the statements created?
    Because if i execute it, it creates bank statement header with lines correctly but i received no information about what i just created.
    Thanks in advance,
    Bahchevanov.

  • Bank statement generation

    Hi ABAP gurus,
    Please suggest me regarding a immediate issue. I have to generate bank statements in two different file formats. Already we have standard program which generates bank statements in IDOC format . Now the thing is i have to generate bank statements with another file format called MT940.
            Can i generate bankstatements second time for the same accounts on the same day.
    thanks&regards,
    Hemanth

    hi
    when u upload the electronic bank statement entries post to FI. there is no idoc to gereration as per as my knowledge.
    is there any interface using to upload the bank statement? or directly upload in SAP using T.code FF_5
    and Please explain what business process following? then i will try to explain.
    Regards
    Venkat

  • How to use the program "Generate test data for BAI bank statement" ?

    Hi all,
    I use the program RFEBKAT5 to create an Electronic Bank Statement file in BAI format ,but it doesn't generate the file .
    I don't know how to generate the file.
    Please help me !
    Thanks all !

    You need to suitably adjust your GL accounts for "Posting Offset Account" (Whisch is defaulted as ++++++++19" and Checkout/Funds Out/Funds IN GL accounts to your configuration.
    Once you do this try generating the file again.

  • FPB7 Create Payment Lot after loading Manual Bank Statement

    Hello Everyone,
    My question is can we create payment lot after loading Manual Bank Statement(FF67).
    Thanks,

    Hi Imitiyaz,
    Transaction code-FF67 (Manual bank statement) is used to enter the bank statement data manually via dynpro. Moreover, since it contains no front end controls so it can be called via batch. You need to develop a custom program to cater the requirement.
    You can create a program which creates batch input sessions for transaction FF67. Use transaction SHDB to record the transaction in order to see program, dynpro and field names.
    Hope it helps...
    Thanks,
    Amlan

  • I have realised over time I have created multiple accounts. I have bought music on my iphone and am not able to locate the account that I made most of my purchases on. I have bank statements on the purchases but don't know how to contact someone to help.

    I have realised over time I have created multiple accounts. I have bought music on my Iphone and am not able to locate the account that I made most of my purchases on. I have bank statements on the purchases but don't know  how to contact someone in Itune to help me.  PLEASE

    I don't have the app adn no expereince with it, but it appears basec on teh app description you may need it installed on your MAC as well to download the files.
    You might find help on the vendors website: http://www.nfinityinc.com/index.html

  • Clearing postings by bank statement program FF_5

    Hello
    the bank statement program clears open items on customers (invoices customers paid) and on bank sub accounts (gl accounts with open item management). (for vendor invoices where we gave payment orders by running the payment run) Does the system look up the items to be cleared purely based on amount or does it also use fields such as
    VERTN     VERTT     VBEWA
    ZUONR     GSBER     VBUND
    Regards
    Arjan
    for customer payment the posting is correct?
    bank account
    against customer
    for vendor payment the posting is correct?
    bank sub account
    against bank account
    Edited by: Arjan Hogenes on Dec 1, 2009 12:01 PM
    In the information of the program RFEBKA00 I find:
    Interpretation of the note to payee fields
    For incoming payments, the notes to payee lines of the account statement can be searched either for document numbers or reference document numbers by specifying the selection field (BELNR or XBELNR). Thus, the relevant information for clearing customer payments is obtained.
    If you do not specify a selection field, the note to payee fields are not interpreted.
    For outgoing payments, one always searches for the document number."
    For incoming payments is the document number the SAP bkpf-belnr?
    For outgoing payments is the document number the SAP bkpf-belnr or the vendor's invoice number?

    Hi,
    Please go through this link for better understanding of the various interpretation algorithms which can be used.
    http://help.sap.com/saphelp_erp60_sp/helpdata/en/43/0bd87b43de11d1896f0000e8322d00/frameset.htm
    Regards,
    Teja

  • IHC FINSTA Bank Statement not created in head office IHC account

    Hi,
    This is regarding Incoming Receipt for subsidiary in IHC.
    I uploaded electronic bank statement with payment notes indicating it is a incoming receipt for subsidiary 3000.
    IHC document is generated while executing FF_5.
    FINSTA bank statement available in Subsidiary IHC account 3000010.
    However there is no IHC bank statement available for head office 100010.
    No Payment order is created in IHC0.
    Appreciate the IHC experts out there to help me with this issue.
    Cheers.

    Hello Anya,
    Yes I got it fixed by scheduling FEBP as job after bank statement generation in my IHC day end processing. Now the statements are getting posted.
    Thanks for your post.
    Regards
    Ashish

Maybe you are looking for

  • Adobe Photoshop CS5.1 Keyboard Shortcuts Help

    Hey! Not sure if I am posting this in the right location, but anyway...           I use a Wacom Cintiq with my Photoshop Cs5.1 package and have had some troubles when it comes to a particular keyboard shortcut.      The scroll wheel on the Cintiq whe

  • "conflicts with the WAN IP address"

    I just picked up a used AirPort Extreme N (Gigabit Ethernet) to replace my current non-Apple router, which has worked satisfactorily but lacks the ability to share disks--something I need. Using my G5 running 10.4.11, I downloaded AirPort Utility 5.4

  • Creating metadata in Flash CS3 and reading it in AS3

    Is there a way to store metadata in a library symbol in Flash CS3, and then read it in AS3? For example, I want to have the following code run: m_Metadata = 'You're cool!' I need this data before I can play the movie clip. Is there a way to store thi

  • Migration and DVD/CD Sharing Update" (1.1)

    I recently installed the "Migration and DVD/CD Sharing Update" (1.1)" update using the Software Update application on 10/19/08. The installation went fine with no errors or apparent problems. I noticed yesterday that when I adjust the brightness up o

  • Combine the 3 BW systems Into new BW System

    Hi Frds, Thee are 3 BW/BI systems in my company for some years. Now we plan to combine the 3 BW systems into new BI System. for exp we have A, B , C BW systems( each system having BW 3.X And BI7.0 Objects) and each system having diffrent kind of Sour