Brazil Bank Itau Boleto

Hi
We are configuring the Brazil Boleto for Bank Itau.  And i have a few questions
-There is a discount field in the boleto but i can not find how to get a value in there, i have tried populating a discount in the accounting document and that does not seem to work.
-Then there is the CFC number and the INSCR number where do i enter those?
-How do i get the barcode to appear?
- there is also a field under the instrucoes that has a spot for a comment where can i configure the options for that?
Thank you!
Christina

Please refer SAP 784748 note for the bar code.
Rgds
Raj/

Similar Messages

  • Brazil - Vendor Issued Boleto

    hello, I have a question regarding Vendor issued Boletos. The process we have is
    1. we recieved NF/invoice from third party [ creates IR and uses payment method 'Vendor issued Boleto' ]
    2. We recieve physical Boleto from vendor
    3. IR is completed using MIRO and released to accounting
    4. Boleto number is entered using FB02 in released accouting document in bank ref field
    5. Docment can then be paid out
    Question:
    1. Is above the ususal process done in Brazil for vendor issued boletos
    2. How do you block invoices released from MIRO? because we dont want to send out the invoices out for payment without having the bank ref file?
    Thanks

    Paulo,
    Thanks for the answer. I understand there is a payment block field in MIRO screen. But I need something automatic. So that if it is payment method 'Vendor issued Boleto', then the block is checked automatically. So that user does not forget to select the check mark.
    We dont want a situation where user forgets to block at miro and then payment goes out without boleto number and errors out. We do not want that to happen.
    so do you use some sort of validation or substitution or is there some default setting where documents are posted to accounting with a payment block in it.
    Thanks
    DN

  • Format SWIFT MT940 for Brazil - Bank Statements

    Dear all,
    Does anybody knows if is it possible to charge bank statements through FF_5 transaction, in Swift MT940 format, for BRAZIL company codes?
    Does it works?
    Recently we are try to receive bank statements automatically from the Citibank (CFX - Citibank File Exchange), but it doesn't works with CNAB 240 (exclusive for Brazil). They asked me if is it possible to send the file in MT940 format.
    Could help me in this issue?
    Thanks in advance.
    Kindly
    Aguinaldo Masetto

    Hi
    SWIFT MT940 works with FF_5 for Brazil, we use it .
    Regards
    Sachin

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

  • Brazil - payment with saving accounts

    Dear Sirs,
    I'm an SAP Project Manager helping our customer elucidating a major doubt.
    In Brazil we have a situation where there are different accounts for movements and savings (for saving accounts, the bank asks the additional information "variation").
    We want to run automatic payment program (transaction F110) using saving accounts instead of traditional account movement.
    Is it possible? If so, which is the procedure and where do we have to register this account in master data?
    Nerimir Pincinato
    SAP Project Manager

    Hi Nerimir,
    This procedure is commom for "Banco do Brasil" (Brazil Bank).  You Have a "Poupança" Account (Saving) with variations: 01 and 02, and others.
    In SAP System Savings Accounts is operated manualy, not
    by F110.
    In Master Data and FBZP transactions have no fields to maintain it. You must send DME File to Bank analisys. Afterwards you have to compare lines and columns with Bank Layout.
    Regards

  • Error 70  - Código do status 225: Rejeição: Falha no Schema XML da Nfe.

    Bom dia grupo!
    Nós estamos atualmente recebendo a seguinte mensagem de erro da SEFAZ relacionado aos batches que nós enviamos: Error status 70 "Error from the authorities" and Código do status (Status Code) 225: Rejeição: Falha no Schema XML da Nfe.
    Nossa configuração é 46C com muitos OSS notes aplicados (veja abaixo)
    Nós estamos realmente parados neste momento e não temos nem ideia de onde começar.
    Atenciosamente,
    Marc de Ruijter
    OSS notes for NF-e phase 2
    989115      Nota Fiscal Electronica (NF-e) - Overview Note
    852302      Implementation Overview ISS 2004 - Legal Change MP135/LC116
    759965      New Condition Formulas for MP-135 and ISS 2004
    747607      Basic Customizing for MP135 and ISS legal change Brazil
    980214      DDIC changes: PIS / Cofins Tax Law and Tax Situation
    981123      PIS / Cofins Tax Law and Tax Situation
    981687      NFe: For Services in Muncipio Sao Paulo
    934846      Syntax error: TYPE-POOL 'SXRT' is unknown
    979881      Message S 000 in NF writer when mandatory fields not filled
    980213      Nota Fiscal Electronica (NF-e) of SEFAZ - Phase 2
    1037070      NF-e of SEFAZ - Phase 2, Enhancement 01
    1014600      No output found for the Nota Fiscal
    1052575      NF-e of SEFAZ - Phase 2 / DDIC changes after shipment
    1043688      NF-e of SEFAZ - Phase 2, Enhancement 02
    1062468      NF-e: Multiple volume structure for XML file
    1062251      NF-e: Extension of BADI Interface FILL_HAEDER
    1070261      NF-e of SEFAZ - Phase 2, Enhancement 03
    1094041      NF-e of SEFAZ - Phase 2, Enhancement 04
    1000130      Public System for Digital Bookkeeping (SPED) - Overview Note
    1008306      SD: Manual changes of CFOP for services when ISS tax applies
    998194      Missing ISS Tax Situation in the Nota Fiscal
    1047606      SD/Brazil: Using of error log during Nota Fiscal creation
    120449      SD-Brazil Exchange variance error in Nota Fiscal
    92383      LSA:BR:SD: Tax laws in return nota fiscal
    689157      Nota Fiscal Split and number of Packages
    987882      ISS Tax Law (field J_1BTAXLW3) not copied from sales order
    989965      CFOP redermination in the delivery document not working
    909835      Message 8B 679 raised during the delivery process
    337554      SD: No. of packages in Nota Fiscal
    533046      Repair order inconsistent to object list
    920330      Error when changing the tax codes in a sales order
    998195      PIS/COFINS/ISS Tax Law and Tax Situation in SD
    104606      EDI/IDoc: Mapping IDoc types to ANSI X12
    1094041      NF-e of SEFAZ - Phase 2, Enhancement 04
    1105588      J_1BLFZF: Runtime error OBJECTS_OBJREF_NOT_ASSIGNED
         OSS notes for XML ver 1.1 and NF-e phase 3
    1065334      NF-e: Extension of BADI Interface FILL_ITEM with tax table
    1068615      NF-e: Extension of BADI Interface with SD document flow
    1079826      NF-e: BAdI Interface Enhancement for NF Messages
    1069919      NF-e: Partner in Block E should always be main partner
    1090279      NF-e monitor: automatic refresh upon user actions
    1093252      NF-e: ICMS tax situation in XML File and DANFE
    1113127      NFe: New XML Layout - Version 1.10
    1114348      NF-e - xNFe integration - backend
    1122294      Send/resend NF-e: fill VBFA for BAdI item method
    1124075      NF-e: Serie not taken from Contingency NF-Type
    1144194      NF-e: Cancellation/Skipping Reason
         Bug Fix notes for NF-e BAPI.
    1049946      NF-e: Adaption of Nota Fiscal Bapis
    1147934      NFe: Random number should not be generated for incoming NFes
    1150733      NFe: Randon number and check digit not cleared
    1154995      NF-e: NF BAPI - enhancement for NF-e processing
    1158622      NF-e: NF BAPI - no input of random number possible
         Bug Fix notes for Contingency process
    1158612      NF-e: Wrong partner in Block-E for Entrada
    1240212      NF-e: One time Vendor data not transferred to XML file
    1255450      NF-e: Jurisdiction code for one time vendor / customer
    1257030      NF-e: Country Name for one time vendor / customer
    1069018      Cancellation of incoming NFe shows error J1B_NFE 003
    1070077      NF-e: Protocol number and document status for Denied NF-e
    1145148      NFe: Cancellation for Contingency NFes
    1152263      NF-e monitor: wrong action status '7' for C-NF-e
    1146914      NFe: Synchronous call to messaging system from backend
    1149356      NFe: Dump when NFe is cancelled with MIGO
    1152081      NFe: Dump when NFe is cancelled with VL09
    1153533      NFe: Dump when NFe in contingency is cancelled with VL09
    1156116      NF-e: Contingency by stock transfers
    1160107      NF-e: Cancellation of contingency NF-e with DOCSTA = 1 or 2
    1161347      NF-e: Cancellation of Contingency NF-e - correction
    1238648      NF-e monitor: req. action '3' (send) wrong for swtch. NF-e
    1165953      NF-e: Numbering Gaps
    1244326      NF-e: Numbering gaps - Status update in table J_1BNFENUMGAP
    1245425      NF-e monitor: required process step - contingency
    1252567      NF-e: Resend of NF-e - rejected or with validation error
    1266344      NF-e: Action Indicator for NF-e with validation error
    1254565      NF-e: Synchronization of RFC call between ERP and xNFe
    1053626      MIRO: wrong document reference in nota fiscal
    1073259      NF-e: Transfers - Outgoing NF-e No. not taken by Incoming
    1153874      NF-e: GR for future delivery takes wrong NF-e number
    1174946      NF-e: Serie not considered for duplicate NF-e number in MIRO
         Miscellaneous bug fix notes
    1175538      NF-e: Reference between NF and NF-e
    1244881      NF-e: Mixed scenario in MIRO shows error 8B219
    1257422      MIRO: Error 8B 219 by posting of reference invoices
    1150843      NFe: Text for cancel reason not transferred to XML file
         Bug Fix Notes Group 2
    1059699      NF-e: Reference between NF and NF-e
    1139062      NF-e incoming: Posted via J1B1N -> Wrong Document Status
    1144199      NF-e: SD Billing and Contingency
    1145089      NF-e: Cancellation despite rejected cancel request
    1149787      NF-e: Wrong status-code text in NF-e history
    1151112      NF-e: cancellation-reason text gets lost (pre req of 1150172)
    1150172      NF-e monitor: selection leads to dump
    1068379      Creation of Billing document issues an error 8B 145 (pre req of 1145089)
    1152842      NF-e: cancellation reason does not work
    1154700      NF-e: Random number & check digit not stored in active table
    1073145      PIS / COFINS Tax Laws for Transfers (pre req for 1155231)
    1082527      Missing PIS / COFINS Tax Laws for Transfers (pre req for 1155231)
    997868      VL02N: CFOP, tax laws not copied from delivery (error 8B148) u2013 (pre req of 1155231)
    1155231      PIS/COFINS tax law in NF/NF-e by split valuated material
    1155424      NF-e monitor: Menu -> "Check MS Connection" does not work
    1159177      NF-e: FUNC J_1B_NFE_SET_STATUS_IN_BACKEND set as Rem.Enabl
    1161951      NF-e monitor: "Resend" functionality.
    1162232      NF-e: switch to contingency not possible after MSS Update
    1162512      NF-e: cancellation reason not initial at first-time call.
    1162629      NF-e: creation date gets deleted from NF-e data-base table
    1164283      NF-e: SCS '5' - upon authr.to cancel system does not cancel
    1165155      NF-e Monitor: BACK (F3) leads to cancellation
    1165360      NF-e Monitor: new selection parameter - creation user
    1168394      NF-e: Reference document not taken from Nota Fiscal header
    1168798      NF-e: User decision for used NF-Type for Material Movements
    1171383      NF Writer: Copy NF-e that was switched to contingency.
    799445      Nota Fiscal creation: Consideration of local dates (pre req of 1171383)
    1104003      NF-Writer: Serie not taken from Reference NF (pre req of 1171383)
    1156037      NF-e: NF-Writer allow reference with different NF-types (pre req of 1171383)
    1175759      NF-e: central contingency per business place - correction
    1239598      NF-e: Random number and check digits are lost in NF writer.
    1163888      NF-e: Random Number includes spaces (pre req of 1239598)
    1245425      NF-e monitor: required process step u2013 contingency. u2013 applied in bug fix notes no need to apply.
    1246700      NF-e: Wrong reference for NF entradas.
    1257688      NF-e: Update termination with error J1B_NFE 021
    1258021      NF-e: Dump by creation of NF header text for XML file
    1258974      NF-e: Monitor report aborts with DBIF_RSQL_INVALID_RSQL
    1265172      NF-e - Decouple RFC from DB Update
    1285851      NF-e: Cancellation of none authorized documents
    1288925      NF-e: References between NF-e and non NF-e
    1272677      NF-e: Cancellation for Material Document with serial number (pre req for 1288925)
    1247602      NF-e: Cancellation of material documents with serial numbers
    1163104      NF-e: Cancel Material documents with initial cancel reason
    1293944      NF-e: Cancellation of material documents with batch classes.
    1267128      NF-e: Cancellation goods movement with MVT 844 not possible (pre req for 1293944)
    1300000      NF-e: Decouple - Contingency
    1314856      NF-e: Decouple - Contingency in J1BNFE and VF01 & VF04
    1321837      F-e: Cancel of material documents not possible
    1092028      NF-e: Protocol number in NF-header overwritten (pre req for 1265172)
    1114283      NF-e: cancellation - document status cleared in J_1BNFDOC (pre req for 1265172)
    1234053      Local time / local date in NF header and NF-e XML (pre req for 1265172)
    1288994      NF-e: Decupling note 1265172 causes error for incoming NF-e (pre req for 1300000)
    1297042      NF-e: NF-e number missed in access key after decoupling (pre req for 1300000)
    1087535      RFFOBR_A,U:Doc.no should be filled with 9 digits in DME file Applied OSS note 1087535 to the object Z_RFFORIY1 which was copied from RFFORIY1
    1097455      NFE: Bank files should accommodate Doc. Numbers with 9 digits
    304961      Wrong boleto check digit with carteira data (pre req of 1097455) - Not relevant
    336117      Include due date factor in Boleto barcode for A/R (pre req of 1097455) - Not relevant
    705726       ITAU: Boleto has negative interest value (pre req of 1097455) - Not relevant
    846297      Func Mod - BOLETO_DATA not printing correct nosso numero (pre req of 1097455) - Not relevant
    852782       BOLETO_DATA - Corrections of note 846297 for Bredesco only (pre req of 1097455) - Not relevant
    1227478      Dump in payment run (F110) when XBLNR is empty
    1138278      NFe: Field PREDBC not filled in XML interface structure (pre req of 1149585)
    1149585       NFe: CST field required in XML file for taxes not in NFe
    1053855      VL02N raises error 8B 053 "Branch not foundu201D
    1165696      RFEBBU00: Error in batch input due to changes in Nota Fiscal
    1180402      NF-e: BADI methods FILL_HEADER and FILL_ITEM
    1180672      NF-e: Gap numbering check doesnu2019t consider the series
    1225338      RFEBBU00: Additional changes to the note 1165696
    1241922      NF-e: Report J_1BNFECHECKNUMBERRANGES xNFe adaption
    1244326      NF-e: Numbering gaps - Status update in table J_1BNFENUMGAP (Applied using other Kintana)
    1270813      NF-e: Year not included in the XML file
    1247264      NF-e: Error in RFC to /XNFE/NFE_CREATE after note 1241922 (pre req for 1274200)
    1274200      NF-e: Numbering gaps report sends SERIE with spaces
    1276185      NF-e: Numbering gaps report sends SERIE with spaces
    1294917      NF-e: Gap numbering check - several corrections
    1324538      Missing address for OT Customer in J_1B_NFE_CREATE_TXT_FILE
    1331432      NF-e: Numbering gaps report detects gaps for initial series
    1332167      NF-e: Rep. J_1BNFECHECKNUMBERRANGES aborts with error DC 006
    1092341      RFFOBR_A,RFFOBR_D: Performance problem while rebate calcula
    1237089      RFEBBU10:While uploading ITAU Bank returnfile- Error(F5 170)
    1051314      Check Digit missing from Boleto number (pre req for 1306966)
    1306966      J_1BBR30:XREF3 is not updated correctly with Boletofrom bank
    1005924      RFFOBR_A-The DME file does not include Rebate for ITAU (pre req for 1287633)
    1287633      RFFOBR_A: Discount amount not calculated correctly
    1234054      NF-e: function J_1B_NFE_MS_REQUESTS_DATA is not RFC enabled
    1297534      NFe cancellation problems in GRC
    1243964      NF-e: Adaption of xNFe interface of function NFE/NFE_SKIP
    1165746      NF-e: Cancel - Error log not updated
    1327465      The program /xnfe/update_erp_status is not updating R/3
    1326691      BAdI for controlling the RFC call of external systems
    1333136      Prevent simultaneous click on buttons in NF-e monitor
    1333742      NF-e got the status 218
    1354192      Validation rules: correction for fields TPLACA and T_UF1
    1373175      Lock object for /XNFE/NFE_CREATE to prevent double transm
    1376500      BAPIRET2 to provide the detailed information to ERP
    1267455      Not possible to create different DOCREF per item using BAPI (pre req for 1373321)
    1373321      BAPI_J_1B_NF_CREATEFROMDATA: DOCREF from Header go to item
    1328583      NF-Writer posting of NF/NFe when mandatory fields not filled
    1338166      NF-e: Random number and check digit lost after note 1328583
    1259918      NF-e: RFC calls for request for cancellation or skip
    1152140      NF-e: backend allows inconsistent new SCS (pre-req for 1298283)
    1162852      NF-e: Inbound errors missed in error log of Monitor Report (pre-req for 1298283)
    1163056      NF-e: Problems with printing via BADI method CALL_RSNAST00 (pre-req for 1298283)
    1276438      NF-e: Parallel Phase not identified in messaging system (pre-req for 1298283)
    1296515      NF-e: J1BNFE reset rejected NF-e after skipping request (pre-req for 1298283)
    1297823      NF-e: Cancelled NF-e shows wrong action indicator (pre-req for 1298283)
    1298283      NF-e: Skip for NF-e with validation error
    1362969      NF-e: check cancellation for billing documents
    1368159      NF-e: cancellation of invoices via original application only
    1370933      NF-e: Accept Rejection to Cancel - wrong status in monitor
    1376324      NF-e: Skip for NF-e with validation error
    1140579      NFe: Field length conflicts from backend interface to XML
    1357713      NF-e: Cancel of incoming NF-es does not update active table.
    1173018      NF-e: Field control for Random Number and Check Digit (pre-req for 1366320)
    1321517      NF-e: MIRO Credit Memos for NF-e shows error 8B 020 (pre-req for 1366320)
    1366320      NF-e MIRO:Save is allowed without mandatory fields filled for NFe
    1375066      NF-e: J_1BNFECHECKNUMBERRANGES ends too early, wrong subrc
    1375894      NF-e: J1BNFE authority check for company code
    1377879      NF-e: Report J_BNFECALLRFC aborts with message A098
    1379062      NF-e: posting GR after cancellation leads to wrong NF-e
    1357777      Cancel billing document without Nota Fiscal cancellation
    1380861      NF-e Resend(proc.stat.07) with Signature error impossible
    1362025      Error while sending Bacen Code EX with 0 on begining
    1249819      NF-e: Field MODFRETE filled incorrectly

    Bom dia Marc de Ruijter,
    Não dá para ler sua thread, mas imagino que seu validador esteja desligado.
    No GRC vá em SPRO --> SAP GRC Nota Fiscal Electronica --> Configure System Response for Each Tax Number (CNPJ)
    Para ligar/desligar o Validador basta clicar no check box na coluna Validation.
    Observação: Para correto funcionamento do GRC deve-se sempre utilizar o validador ligado.
    Após isto refaça seu teste, é provável que você receba um erro de validação para a NF-e. Veja em GRC Web monitor -> NFe Detailed View -> Validation History.
    Atenciosamente,
    Fernando Da Ró

  • I bought and paid a Premium 300 minutes Skype on M...

    I chose the "bank order" (boleto bancario) format to pay for my Premium package, which was reported to take up to 10 days to be credited. However, since the 24th I have been checking my account at least twice a day to no avail. Not only that, but I registered a complaint with Skype and was indeed contacted by customer service, however the case remains open with no solution in sight. It must be mentioned that the corresponding Premium amount was debited instantly from my bank account! In other words, there was no delay whatsoever in charging me, but it is taking forever to upgrade my Skype account. I am very disappointed with Skype and about to go to the Consumer Protection authorities in Brazil to secure my rights and seek compensation for my troubles and expenses, hoping that Skype will then finally get moving and do whatever has to be done to satisfactorily respond to this most disagreeable experience!

    Hi Grandmommy,
    Thanks for visiting Apple Support Communities.
    After you click the "Report a Problem" link, you may be prompted to enter your Apple ID, and then type a description of the probem you're reporting. See these steps for more information:
    How to report an issue with your iTunes Store, App Store, Mac App Store, or iBooks Store purchase
    http://support.apple.com/kb/HT1933
    If the app you purchased is not behaving correctly, see this link for troubleshooting steps that can help:
    https://www.apple.com/support/ipad/assistant/application/
    Cheers,
    Jeremy

  • Acct &: Statement & already exists - FF.5

    Hello,
    I am trying to import an extract using transaction FF.5 to the bank Itau, but this generates the following error "Acct &: Statement & already exists", analyzing realized that this message occurs because the program is trying to contain twice the data in the T028A.
    Does anyone have a clue?
    Thank you,

    The following note will fix the issue if you have posted.
    SAP NOTE: 1025077
    Context Block:
    SELECT * FROM  febko INTO TABLE i_febko                   "HW139804
             WHERE anwnd       = febko-anwnd                   "HW139804
             AND ( absnd       = febko-absnd                   "HW407675
               OR ( absnd       = febko-absnd(45)               "HW407675
                 AND waers      = febko-waers ) )               "HW407675
             AND ktonr       = febko-ktonr                   "HW139804
             AND emkey       = space                         "HW139804
    Delete Block:
    *        ORDER BY aznum DESCENDING.                         "HW139804
             ORDER BY azdat DESCENDING.                         "HW139804
    Insert Block:
    ORDER BY aznum DESCENDING.                         "mod_1025077

  • Compute Unrealized Gain/Loss and Provisions for Valuated Forex Contract

    Hi Everyone,
    Can anyone tell me how unrealized gain/loss or provisions were computed for forex contract?
    I created a spot/forward transaction with the following details:
    Product Type: 60A
    Transaction Type: 102
    Buy Currency: USD
    Sell Currency: NZD
    Local Currency: SGD
    Forward Rate: 0.6864
    Spot Rate: 0.7045
    Swap Rate: 0.199-
    I used midyear valuation w/ reset as a valuation category when I execute valuation in TPM1.
    Your response would be greatly appreciated.
    Thank you.
    Canto

    Hi  Murlidhar,
    Thank you for the response.  Yes, I understand that a gain/loss can be realized based on exchange rate differences between when invoice entered/posted and when paid.  That's only part of the gain/loss in minds of the accountants.  The other part is gain/loss from time that cash was put into bank account.  For example, we spend $100 USD to purchase and deposit R$167 BRL into Brazil bank account.  Three months later that same R$167 BRL is worth only $85 USD.  At that time we post and pay Brazil invoice on same day in amount of R$167 with no exchange gain/loss on the invoice.  System posts credits of R$167 BRL and $85 USD to bank account G/L account.  System does not record gain/loss on payment because invoice currency translation date and paid date are same.  However, the bank account G/L account balance now reflects R$0 BRL and $15 USD on which system calculates a $15 USD unrealized gain/loss at month end.  This unrealized gain/loss on the bank G/L account posts and reverses each month just as you said but never goes away.  In minds of accountants the $15 USD gain/loss should be recognized.  How best to recognize the $15 USD gain/loss, that is the question.
    Thanks
    Steve

  • How to Configuration Boleto and make the files  - Bank Itau00FA   - Brazil

    Hi, Friends
    I need to configuration a bank since the beginning until to make a boleto and and make the files to send to the bank.
    I am alone in the customer and I do not have anyone  to help me.
    Thaks a lot.

    HEllo,
    The main transaction you'll use is FBZP. In this transaction you'll configure the payment method and the RFFO* program or PMW format you'll use.
    The main RFFO* programs are RFFOBR_V and RFFOBR_D.
    If you read the documentation of the programs (se38 -> program name -> documentation) you can see the steps you must perform in order to use the program.
    If you're going to use PMW you should check the  FEBRABAN_P format.
    After doing all the configuration steps you should create a variant for the print program and depending on your business requirements you shoulda add this to the last tab of F110.
    Regards,
    Renan

  • Brazil Boleto Barcodes - Single Barcode for multiple vendor invoices

    Hi All,
    I have the following two questions in Brazil Boleto process.
    1) The vendor is giving a single boleto bar code for multiple invoices. However when we are entering the barcode in the Bank reference field, the last digits are getting changed as the system is picking the amount of that particular invoice in the barcode instead of the consolidated amount of all the invoices?  How to handle this scenario in SAP?  Is it possible to handle the single Boleto bar code for multiple invoices case in SAP?
    2) In F110 Automatic Payment run, we want to pick only the Vednor invoices for which boleto barcodes are updated. Is there any standard way of only picking the invoices updated with barcode only in the F110 payment run?
    Advance thanks for your help.
    Regards
    Kotesh Padarti

    Hi Hussein Merchant ,
    For your requirement you have to do single payment at F-53.There you need to select Other account check box at open item selection.Give the all open item vendor codes and get a cleared document number.
    Go to FCH5 and assign manual single check here
    May be this information is useful to you
    If you have any doubt feel free to ask
    Regards
    Surya

  • Payment with Boleto Bancario - Brazil

    Dear SAP experts,
    Do you know if for payments with Boleto in Brazil, there is a fixed length for the boleto codification?
    I know that the boleto should be inserted in bank reference fields in AP lline (invoice)..but what about the boleto's length? Is there any official rule in order
    If you have any past experience on this topic, please help me.
    Thanks,
    Karim

    Hi,
    Please refere the below
    [http://help.sap.com/saphelp_erp60_sp/helpdata/en/e3/ed2940cbf2195de10000000a1550b0/content.htm]
    Regards,
    SRinu

  • New BarCode Type to print Brazil Boleto forms

    Hi
    We have requirement to print BOLETO form with Bar Code for Citi Bank Brazil. As per Citi Bank manual provided, we need to print the Bar Code with bar code type "INTERCALATED type 2 of 5".
    But in SAP, when we create new custom bar code(ex. ZBAR2) using SE73, we are not finding the above said bar code type.
    The nearest match is 2OF5 ( Bar Code ITERLEAVED 2 OF 5). We used this, but the output of bar code printed is not upto the expectation.
    Please can someone help on how to bring/install the new bar code type INTERCALATED in SAP.
    Thanks in advance.

    hi,
    as for reference i did the same and it is working fine for me...
    pls check that smartstyle character format is activated and u assign this characterformat to the variable to print as barcode.
    if it works with standard barcode then try to create one for zbarcode for reference.
    se73--> system barcodes --> create..
    Regards
    CNU

  • Brazil - Boleto using FEBRABAN_P DME

    Hi All,
    In DMEE FEBRABAN_P, how can we use this payment medium workbench to generate payment file for payment method BOLETO for vendor outgoing payments for Brazil?
    I am able to generate the payment file for Payment Method TED and DOC where the segment A and segment B shows up in the payment file.
    I want to use the same PWM (FEBRABAN_P) for Segment J and Segment J-52.
    Or is there any other PMW for BOLETO for segment J and J-52?
    Thanks,
    Ranjha

    Ranjhbir Dhillon
    In order to user Boleto J-52 you have to use classical print program RFFOBR_U (outgoing) and devolop the additional requirements.
    Have a check on following notes:
    1843750 - LC announcement:Circular 3.598/2012 and 3.656/2013
    1876119 - Brazil: Itau and Febraban segment J-52 Legal change
    regards

  • Boleto in Retorno Phase for Brazil

    Hello
    We are using the boleto for customers payments.
    The Remessa phase  is ok.
    In Retorno phase we have a problem with our bank account.
    We have the example bank account: 001234767
    When we are using the program RFEBKA00 to do the retorno the system clear the zeros from left of our bank account and cannot find the bank account in table T028B.
    Does anyone know what is necessary to do for the system doesn' t clear the zeros from our bank account.
    Thanks
    Joao Simoes

    Hello Renan
    Thanks for your reply
    The files that i'm receiving are from Citibank.
    I thinhk the file is the same as you use in ITAU Bank.
    Do you know if this OSS note solve the problems with this bank.
    I will read the note.
    Thnaks
    Joao Simoes
    Edited by: joao  simoes on Sep 15, 2010 3:45 PM

Maybe you are looking for

  • SATA Problem: Can see hard disks in USB enclosures, but not internal

    I have a mid-2010 macbook pro 13". The other day, it crashed on wake-up, and would not boot. I had a OCZ Vertex SSD boot drive, and the OEM hard drive in an optibay enclosure (replaces the optical drive and used only for data). I used this setup for

  • Photoshop CS2 crashes on startup (Mac OS X 10.6.6)

    We have a new Mac in the office. We initially tried to copy all documents/programs from the old to the new, but for some reason, we noticed Photoshop CS2 would crash when we booted it up. So we uninstalled CS2 entirelly and reinstalled the suite. Sti

  • Can't get from ServletInputStream to ZipInputStream

    Here's a problem that's been bothering me: I'm trying to set up an import program where I submit a .zip file via POST to a servlet. I can submit the .zip and read its binary data just fine. I can also open a zip file that's on the server and parse it

  • Is this possible to connect Trex 6 To EP7?

    Hi Experts,   We did instal Trex 6.0 and it's working with EP6 Portal, now We install a Sandbox EP7 to do some test, I'm just wondering can I connect this to current Trex or I should install new Trex 7.0? Thanks, Matryam

  • Link between Bin Location and Batch Number

    Hello. I'm having some issues to find an link between the Bin Location and Batch Number. I've searched through OBIN, OIBT, OBTN, OWTS, but no clue of what makes the link between this guys. Does anyone here know something about that? Best Regards.