Bank statement iteams r showing as error iteams in GLaccounting level.

Hi viewers
when i uploaded the Bank statement iteams through BDC it is uploading successfully. But in Update Account statement/check deposit Transaction - while we r viewing No.of postings, Errors, Totals........All iteams r showing as error iteams in Bank Accounting level & no error items in subledger accounting level.
Even if i view the values in FEBA - it is showing all iteams r incompletely posted iteams in GLaccounting level. AND in subledger accounting showing as completely posted iteams.
But in my statement i have given all as correct iteams why it was happning ?? i want to viwe all iteams r completely posted in GLaccounting level(FEBA) ...... pls guide me.
Rgds,
Swathi.
Edited by: swathi fico on Jan 7, 2009 12:09 PM
Edited by: swathi fico on Jan 10, 2009 2:00 PM

First check whether bank statement has any items relevant to GL. This status is sometimes expected if Bank statement has no items relevant to GL, but if User tries to post this to GL.
On other hand If Item is relevant to GL, then you can process the item in foreground and find the error.

Similar Messages

  • FF67 - Manual bank statement 'not to be posted' error

    Hi all,
    I am using ff67 to view my manual bank statements but there is an amount with the status 'Not to be Posted'.
    I go into FEBAN to find more information and this document is set as 'incomplete' (yellow status). Can someone explain to me why this is happening and how to fix this?
    Thanks,

    Thank you for the response Atif,
    My question is: why was the wrong clearing entry originally posted?
    Because of this clearing entry, it looks like we now have an open item in the incoming account. When looking at the incoming/master accounts, after the manual posting has been made, we have an open item in the incoming account which cannot be cleared.
    Example
    Incoming a/c = -8000 <- this line is open
    Master a/c = 8000
    What is the way to proceed? thanks,

  • FF_5 - Import Bank Statement, Err: Formatting error in the field COBL-KOSTL

    Hi
    When importing the bank statement I'm getting the error
    Error: (00 298) Formatting error in the field COBL-KOSTL ; see next message
    Why is it doing this? In OKB9 I have the GL Account and the cost center assigned. It is the ne GL that is giving this problem, in the classic GL I do not have this problem.
    Thanks in advance

    Hi
    No, it is not that. For some reason in the new GL it does not seem to determine the cost centers and profit centers as usual.
    For exampl to allocate the Profit Center for Balance Sheet Account I used to use 3KEH in the classic gl but in the New gl we must use FAGL3KEH.
    Now with cost center i'm having the same problem, does not determine the cost center when importing the bank statement.
    Can someone help me.
    Thanks in advance
    Edited by: Louis De Gouveia on Mar 3, 2009 7:07 AM

  • Manual Bank Statement (MBS) -- Masking problem

    Hi viewers,
    My client has implemented MBS and useing from longback to icici bank. Now he wants to extnd the MBS to HDFC bank.  when i saw the customization facts are :
    - Main, checkin, checkout accounts r cash credit accounts and these GL's r created under Liabilities.
    - instead of masking GL accounts they have directly assigned Gl accounts to account symbols
    - They have created 21 posting Rules.
    Now my question is :
    1. now can i remove the Gl accounts by placing masking.... if i do... is there any effect... to the  existing icici process AND wil it work for HDFC
    2. can i use the same posting rules to HDFC.... since in posting riles they have mentioned name of account symbols as icicimain, iciciin, iciciout....... instead of main, in , out.
                                                                                    OR
    3. if i follw the existing customization instead of masking is it need to create again ACCOUNT SYMBOLS, HAVE TO ASSIGN GL ACCOUNTS DIRECTLY WITHOUT MASKING,  and SEPERATE POSTING RULES

    Hi
    Thanx to every one........
    i have done Brs for HDFC successfully.......
    But... while entering bank statement iteams in FF67 user has wrongly entered the cheque numbers in "Allocation fields/bank reference fields"  eventhough it has uploaded. when i checked "only iteams incompletely posted"  in FEBA it is not showing any values............... throwing error .....
    "No Bank statements corresponding to your selection exist (message no. Fv616)"
    if i want to see the wrong postings in iteams to be posted in FEBA......... pls let me know the necessary actions
    Rgds,
    Swathi.
    Edited by: swathi fico on Dec 24, 2008 4:51 PM
    Edited by: swathi fico on Dec 24, 2008 5:04 PM
    Edited by: swathi fico on Dec 24, 2008 6:21 PM

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

  • Problem to Upload bank statement

    Dear all,
    Why cannot upload bank statement (t code ff_5). Error message show as termination in statement no 00000 of account;
    closing records 62F missing

    Hi Linda,
    As said by gupta, please check, whether the bank statement has the statement 62F:
    If not, please get the statement again from bank and ensure that the end statement 62F exists in the statement..
    This will help you to overcome your problem..
    Regards,
    Praisty

  • Setup Bank Statement Processing for Belgium

    Hi,
    I need help with the setup of Bank Statement Processing for a Belgian system in version 8.8  (pl 16). This is an upgrade from 2005A.
    We installed the BTHF add-on and weu2019ve checked u201CInstall Bank Statement Processingu201D in the company details.
    Banks and house banks (2 banks) are set up according to the Belgian values to validate bank account data.
    However when I go to u201CBank Statement Processingu201D and select Country u201CBelgiumu201D I donu2019t see (let alone can select) the house banks that I set up.
    It almost seems like thereu2019s another table that needs to be adjusted, but I have no clue where that could be.
    Any ideas?
    Thanks,
    Josephine

    Hi Josephine Noah  ,
    Try this .... May it will help you...
    Steps to Reconciliation Bank Statement
    1) Select Review & Install Bank Statement Processing form to detail in business.
    2) Fill the informaion bank on the same window.
    3.After the need BTHF installed add-on add-on window management for the activation of the Import option on the bank statement process form (in banking module.
    4.Need to FD (Definination format) install of the same form by using this add-on, we make banking format (Indian Bank in the SAP format.
    Made using this format, then it should assign bank account level house.
    Administration> Settings> banking> bank account and select the column (import file
    Name), then new window will appear from this window we can create new file formate filled by relavent info (format name (SAP_TEST), make formate-type (account statement) to).
    Then assign file format (. BFP), from another add-on
    (FormatDefination).
    Click on the row that was added as a file format name
    After selecting the correct file name to update the file format setup form
    Here we show format to bank account
    For mapping based on the number of: -
    Now make this internal code that is used with external code link (which by bank provided) This code is the date the statement summery you use this code also recognize that the nature of the booking process at the time the bank statement processing (ie BP from used / to the account, property account from / to bank, interim account from / to bank account etc.)
    Administration> Settings> Banking> Bank Statement Process> Internal Bank operation code
    Administration> Settings> Banking> Bank Statement Process> External Bank Operation Code
    Banking> Bank Statement Reconciliation and external> Process statement form (if we're to import from a file, click here button, then select statement we file for processing)
    After successfuly import the bank statement file, it shows as a draft.
    If we account statement finilize then double-click on the same line to design, then new window opens
    If we import into SAP bank statement, if any open party invoive either A / P or A / R should reflect it to produce incoming and outgoing payments. Have assigned its totally dependent on what kind of accounting method users.
    Then customize SAP users or to reconcile all bank transaction. When the user double-clicks on row then new windows to open again for the setting.
    Thanks
    Manvendra Singh Niranjan

  • Importing Bank statements

    HI
    Can bank statements can be imported for Indian localisation in SAP B1 8.8 PL13?
    Any help is appreciated.

    Hello,
    Try this .... i
    Steps for Bank Reconcilliation Statement
    1) Select check (Install Bank & Statement Processing) in company detail form.
    2) Fill the house bank informaion on the same window.
    3.After that need to installed BTHF add-on from Add-on Administration window for activation of import option on Bank statement process form(in Banking Module.
    4.Need to install FD (Formate Definination) from same form by use this add-on we make bank format(indian bank format in SAP.
    After made this format then it should be assign to house bank account level.
    Administration>Setup>Banking>House bank Account and select column (import file Name) then new window will appear from this window we can make new file formate after filled relavent info (format name (SAP_TEST),formate Type(Bank Statement)).
    After that assign to file format(.bfp) which made by another Add-on(FormatDefination).
    click on the row which was added as file format name
    After select correct file name update the file format setup form
    Here we assign file format to house bank account
    For Mapping on the basis of Amount :-
    Now here make Internal code which will link with external code(which provided by bank ) this code will use at the time of Bank Statement Summery this code also identify that which type of posting method used at the time of bank statement processing(i.e. BP from/to Bank Account, G/L Account from/to Bank, Interim Account from/to Bank Account etc.)
    Adminstration>Setup>Banking>Bank Statement Process> Internal Bank Operation Code
    Administration>Setup>Banking>Bank Statement Process> External Bank Operation Code
    Banking>Bank Statement And external reconciliation>Bank Statement Process form(When we click on Import from file button then here we select Bank Statement file for processing
    ) After successfuly import the bank statement file it show as draft document.
    If we want to finilize the bank statement then double click on same draft row then new window will appear
    When we import bank statement in SAP then if party have any open invoive either A/P or A/R it should be reflect for making incomming or outgoing payment. Its totally depends on which type of posting method user have mapped.
    After that SAP user can adjust or reconcile all bank transaction. If user double clicks on row then new window again open for adjustment.
    Thanks
    Manvendra
    Edited by: Manvendra Singh Niranjan on May 13, 2011 4:13 PM

  • This bank statement header contains no statement lines to reconcile

    HI All,
    In 11.5.9 while laoding the bank statement(using 'Bank statement Loader') we get following error in Autoreconciliation report.
    'This bank statement header contains no statement lines to reconcile.'
    We checked all the setup, nothing is missing.
    In the data file the transaction code, bank account number etc all things are fine.
    Any idea what could be the reason for this error?
    Thanks in advance,
    Anant Nimbalkar.

    Hi Alexander,
    this is the wrong forum, the folks here usually discuss SAP Cloud Appliance Library related topics.
    Unlukily I have no authorizations to move your question to the correct forum ;-(
    Therefore you should ask your question again either in the SAP ByDesign SCN space (SAP Business ByDesign) or via OSS ticket through the SAP Service Marketplace (http://service.sap.com).
    Regards,
      Hannes

  • Bank Statement Error

    I am having a peculiar error in bank statement processing (Manual).
    I had to block a Cheq clearing GL account for some reasons and I created a new clearing GL account.  I assigned this GL number in the FI12 (bank account directory) by deleting the old GL number and also the house bank updated in the new GL account number.  I posted the open item in this clearing account also.  However, while processing the Bank Statement, system is picking the same old clearing GL account number and says there is no open item available.  It is not picking the new clearing GL account. 
    Why this is happening ?  All the bank statement processing settings were reviewed and changes made.  I am using the masking setting for GL account search.  That is also done fine.

    Hi,
    Please check this also
    Electronic Bank Reconciliation
    The primary configuration steps necessary to set up Electronic Bank Statements (EBS) Processing in SAP.
    1. Create House Bank and Account ID (FI12)
    2. Setup EDI Partner Profile for FINSTA Message Type (WE20)
    3. Configure Global Settings for EBS (IMG)
    Create Account Symbols
    Assign Accounts to Account Symbols
    Create Keys for Posting Rules
    Define Posting Rules
    Create Transaction Types
    Assign External Transaction Types to Posting Rules
    Assign Bank Accounts to Transaction Types
    Also check out this very useful link which shows how to configure in detail
    [http://www.sap-topjobs.com/sapFI/bankreco4/index.htm]
    Thanks

  • Electronic Bank statement error

    Hi gurus,
    I have configured electronic bank statement settings for multicash format when ever i execute the file in ff.5 it is showing the error message and accounting entries will not get generated please help me on this
    Error message.
    Account 560036003      45605043982                   INR: Statement
    200800466 is not in the bank data storage
         Message no. FB770
    Diagnosis
         The previous account statment has not been imported.
    System response
         The system permits the import regardless.
    Procedure
         You can deactivate the message for the formats Multicash and MT940:
    Effects on Customizing
         You can define when this system message is to be issued in accordance with your requirements.
    You do this in Customizing as follows: Controlling -> Controlling:
    General -> Change Message Control.
    The application area and message number can be taken from the technical
    documentation.
    Its very urgent please help me
    Regards,
    Yashwanth

    Thanks for reply
    Again iam getting one more error
    Account statement was not updated
         Message no. FB773
    While importing electronic bank statement, the system determ
    that not all external transactions (business transaction cod
    text keys, or posting texts) were in
    table T028G.
    Enter the transactions in table T028G.
    Afterwards, start the processing again.
    Following entries missing in table T028G:
    These two error messages I am getting please help on this
    Regards,
    Yashwanth

  • Error - Manual Bank statement

    Dear SAP gurus,
    i have configures manual bank statement and posting the statement thru FF67.. after saving statement, when i try to post the statement it is giving me a screen of Update account statement where it is showing me an error. but i am not able to get that what is the cause of error. seems that the config is fine.. Pls help..
    PS: if u want the screen shot then forward ur mail ids pls

    Dear Shashank,
    Which error message number is the system displaying? And the long text in it? This should be a more quicker way of finding out which the problem is.
    Thanks.
    Abdali

  • Error in updating OBNK Table ( Bank Statements and Reconciliations,Manual)

    PLease advise ,
    Bank Statements and Reconciliations,Manual Reconciliation
    Client is receiving the following message:
    Error in updating OBNK Table
    Edited by: Philip Eller on May 20, 2008 9:03 AM

    Hi Darpal Thiarha,
    Please kindly refer to note 1132591 and note 1128677 to see if these are relevant to this issue. Upgrading to  2007A PL15 or above may avoid such issues relevant with the error 'Error in updating OBNK Table'.
    Regards,
    Candice Ren
    SAP Business One Forums Team

  • Manual bank statement upload error FB727

    Hi Experts
    When we are uploading the manual bank statements using transaction FF67, we are getting the error message FB727 "There are no transactions that have this amount's plus or minus sign"
    We are using SAP version 4.7, I am not sure how this message is coming and how can we correct this
    I could see there is a OSS note for this but that is not applicable for version 4.7 and above
    Rishi

    Hi Rishi,
    Message - FB727 says There are no transactions that have this amount's plus or minus sign
    While assigning the Business transactions to posting rules you may specified the +/- symbol to Incoming payments. Similarly while entering the amounts use the symbols.
    Eg: If the amount CHQ deposit (Incoming Payment) : +XXXX
          If the amount CHQ Issue (Out Going Payment)  : - XXXX
          If the amount Bank Charge (Expense-Outgoing) : - XXXX
    Amount with Symbol if you enter, Then you will not get this error.

  • Bank statement Loading error

    Hi,
    I got this error log for my Bank Statement Loader
                     Bank Statement Loader Execution Report
                                                        Report Date: 24 MAR 2009
             Name:            TEST_BAI2
             Description:     TEST BAI2
             Format Type:     BAI2
             Control File Nam BAI2.ctl
             Data File Name:  $CE_TOP/bin/BAI2.dat
            Bank Account Number:  10271-17621-619
            Statement Number:   011022
             --  General Exceptions  --
              No Error Found.
             -- Record Exceptions --
             Rec No Type     Message
             3      Error     Bank account 10271-17621-619 is not
                              defined.  Set up the bank account first.
             8      Warning   Counted number of records (6) do not match
                              the number of records specified (8) in the
                              bank file.
                                   *** End Of Report ***I can see that the bank acct. is not existing in our bank setup because i just cut n paste
    the sample data :). I want to query the valid bank acct on our EBS, so i navigate to
    CM Super User > setup > banks > bank accounts
    But when I tried to search any field in the window i got "! Error on page" displaying at the bottom error message bar...then the form just freeze forever :(
    http://farm4.static.flickr.com/3560/3382480808_7616feec6c.jpg?v=0
    How do I resolve this please....
    Thanks a lot

    Hi,
    in Apache
    The access_log has:
    bxuMe0 HTTP/1.1" 200 7 0 "-" "Mozilla/4.0 (Windows XP 5.1) Java/1.5.0_10"
    127.0.0.1 - - [24/Mar/2009:22:57:56 +0800] "HEAD  /index.html HTTP/1.1" 200 0 0 "-" "-"
    202.175.244.98 - - [24/Mar/2009:22:58:02 +0800] "POST /forms/lservlet;jsessionid=c0a8642f5654ada6f8803e214ca1a0c7cc27e1a27a05.e34OahiOb3yNby0Lax4PaNmRbxuMe0 HTTP/1.1" 200 2 0 "-" "Mozilla/4.0 (Windows XP 5.1) Java/1.5.0_10"
    127.0.0.1 - - [24/Mar/2009:22:58:16 +0800] "HEAD  /index.html HTTP/1.1" 200 0 0 "-" "-"
    127.0.0.1 - - [24/Mar/2009:22:58:36 +0800] "HEAD  /index.html HTTP/1.1" 200 0 0 "-" "-"
    202.175.244.98 - - [24/Mar/2009:22:58:53 +0800] "POST /forms/lservlet;jsessionid=c0a8642f5654c1cb8615b94e4768b695c2cac7ef7159.e34OahiOb3yNby0Lax4PaNmRbxuMe0 HTTP/1.1" 200 2 0 "-" "Mozilla/4.0 (Windows XP 5.1) Java/1.6.0_07"In j2ee I can see only dir of forms oacore oafm
    Thanks

Maybe you are looking for