How to rectify the error "basic type z_idocname could not be converted"

hi,
I am trying to create a partner profile for a outbound process. In the transaction we20 i gave a new partner number, attached the message type and the idoc and the port no, when i tried saving its showing basic type z_idocname could not be converted how to rectify this error.

Have you made the corresponding entries in WE81 and WE82?

Similar Messages

  • How to rectify the errors through call transaction metod in bdc

    how to rectify the errors through call transaction metod in bdc

    Hi ,
    View the highlited part of the below code.
    REPORT ygfrivat1 NO STANDARD PAGE HEADING
                     LINE-SIZE 165
                     MESSAGE-ID yif_groc.
    Program     YGFRIVAT1
    Function    Report to Upload the VAT Adjustment File.
    Author      ARENAPU
    Date        11.05.2007
    PMTS        AM12810157
    Transport   G6DK937834
    Description:
    Modification log:
    1. Changed by  :
       Changed on  :
       PMTS        :
       Transport   :
       Tag         :
       Description :
           T A B L E S   D E C L A R A T I O N S
    TABLES: edidc,  "Control record (IDoc)
            edids,  "Status Record (IDoc)
            t001w.
    Internal Tables Declaration.
    Internal table to hold data from table EDIDS
    DATA: BEGIN OF t_edids OCCURS 0,
           docnum LIKE edids-docnum,
           logdat LIKE edids-logdat,
           logtim LIKE edids-logtim,
           countr LIKE edids-countr,
           credat LIKE edids-credat,
           uname  LIKE edids-uname,
          END OF t_edids,
    Internal table to hold data from table EDIDC
          BEGIN OF t_edidc OCCURS 0,
           docnum LIKE edidc-docnum,
           rcvprt LIKE edidc-rcvprt,
           rcvprn LIKE edidc-rcvprn,
           credat LIKE edidc-credat,
          END OF t_edidc,
    Internal table to hold data from upload file
          BEGIN OF t_tab OCCURS 0,
           cust(10),        "site/customer number
           date(10),        "transaction date
           currency(04),    "currency
           extnbr(15),      "external reference number
           pos-cont(05),    "POS controler
           pos-id(25),      "POS id
           cashier(10),     "cashier name
           qualif(04),      "qualifier of the article
           matnr(25),       "article number
           qty(10),         "quantity
           sale(16),        "sale value
           pos-tr(04),      "POS transfert type
           paymeth(04),     "payment method
           final(35),       "final price
           tarcur(04),      "target currency
           assign(35),      "assignment day
           error,
          END OF t_tab,
    Internal table for Report display.
          BEGIN OF t_tab1 OCCURS 0,
           cust(10),                    "site/customer number
           date(10),                    "transaction date
           currency(04),                "currency
           extnbr(15),                  "external reference number
           pos-cont(05),                "POS controler
           pos-id(25),                  "POS id
           cashier(10),                 "cashier name
           qualif(04),                  "qualifier of the article
           matnr(25),                   "article number
           qty(16)   TYPE p DECIMALS 2, "quantity
           sale(16)  TYPE p DECIMALS 2, "sale value
           pos-tr(04),                  "POS transfert type
           paymeth(04),                 "payment method
           final(16) TYPE p DECIMALS 2, "final price
           tarcur(04),                  "target currency
           assign(35),                  "assignment day
          END OF t_tab1,
          t_tab_temp LIKE t_tab OCCURS 0 WITH HEADER LINE,
    Internal table to Validate Customer no.
          BEGIN OF t_check OCCURS 0,
           werks LIKE t001w-werks,
           vkorg LIKE t001w-vkorg,
           value(40),
          END OF t_check,
          t_check_temp LIKE t_check OCCURS 0 WITH HEADER LINE.
    Internal table to hold data from table ZCS_PARAM.
    DATA: BEGIN OF t_zcs_param OCCURS 0.
            INCLUDE STRUCTURE zcs_param.
    DATA: vkorg LIKE t001w-vkorg,
          END OF t_zcs_param.
    *Internal table to hold Messages.
    DATA: BEGIN OF t_message OCCURS 0,
             msgnum TYPE msgnum,
             msgtyp TYPE msgtyp,
             msgtxt TYPE msgtext,
           END OF t_message.
    *Work area for table t_message
    DATA : w_message LIKE LINE OF t_message.
    Internal table to hold BDC data
    DATA: t_bdcdata LIKE bdcdata    OCCURS 0 WITH HEADER LINE,
    Internal table to collect error messages
          messtab   LIKE bdcmsgcoll OCCURS 0  WITH HEADER LINE.
    *Internal table to hold messages from call transaction
    DATA: BEGIN OF t_text OCCURS 0,
           desc(150),
           msgtxt(100),
          END OF t_text.
           D A T A   D E C L A R A T I O N S
    DATA: n TYPE i,
          gv_status(11) TYPE c, "Shows status, Production or Test
          gv_exit TYPE c,  "Exit Flag
          gv_qty(16)   TYPE p DECIMALS 2, "Variable to sum Quantity
          gv_sale(16)  TYPE p DECIMALS 2, "Variable to sum Amount
          gv_final(16) TYPE p DECIMALS 2. "Variable to sum Final Amount
    DATA: w_text(100),
          gv_mode TYPE c,
          error TYPE c.  "Flag to Indicate error.
    CONSTANSTS DECLARATION
    CONSTANTS : gc_fieldname LIKE dynpread-fieldname VALUE 'P_FNAME',
                gc_seq_no LIKE zcs_param-seq_no VALUE '00110',
                gc_object LIKE zcs_param-object VALUE 'YGFVAT',
                gc_paraname LIKE zcs_param-paraname VALUE 'VKORG',
                gc_back TYPE c VALUE 'N',
                gc_error TYPE c VALUE 'E',
                gc_all TYPE c VALUE 'A'.
               S E L E C T I O N   S C R E E N
    SELECTION-SCREEN BEGIN OF BLOCK a1 WITH FRAME TITLE text-001.
    PARAMETERS : p_fname LIKE rlgrap-filename OBLIGATORY.
    SELECTION-SCREEN BEGIN OF LINE.
    SELECTION-SCREEN COMMENT 1(31) text-002 FOR FIELD p_test.
    PARAMETERS : p_test AS CHECKBOX.
    SELECTION-SCREEN END OF LINE.
    SELECTION-SCREEN END OF BLOCK a1.
    SELECTION-SCREEN BEGIN OF BLOCK a2 WITH FRAME TITLE text-006.
    PARAMETERS : rb_back RADIOBUTTON GROUP rb1 DEFAULT 'X',
                 rb_error RADIOBUTTON GROUP rb1,
                 rb_all RADIOBUTTON GROUP rb1.
    SELECTION-SCREEN END OF BLOCK a2.
    AT SELECTION SCREEN
    AT SELECTION-SCREEN ON VALUE-REQUEST FOR p_fname.
    *Subroutine to provide F4 help for file name
      PERFORM fr_get_filename.
           I N I T I A L I Z A T I  O N
    INITIALIZATION.
    *Subroutine to check authorization.
    PERFORM fr_authority_check.
            T O P - O F - P A G E
    TOP-OF-PAGE.
    *Subroutine to diplay header
      PERFORM fr_display_header.
             S T A R T - O F - S E L E C T I O N
    START-OF-SELECTION.
    *Subroutine to upload data from presentation server.
      PERFORM fr_upload_data.
    *Subroutine to validate records from uploaded file.
      PERFORM fr_validate_data.
    *Subroutine to build report internal table.
      PERFORM fr_build_rep.
             E N D - O F - S E L E C T I O N
    END-OF-SELECTION.
    *Subroutine to display report.
      PERFORM fr_write_report.
            F O R M   S U B R O U T I N E S
    *&      Form  fr_get_filename
          text
    FORM fr_get_filename.
      DATA : lv_repid LIKE sy-repid,         " Report id
             lv_file  LIKE ibipparms-path.   " File Path
      lv_repid = sy-repid.
    F4 help for file path.
      CALL FUNCTION 'F4_FILENAME'
           EXPORTING
                program_name  = lv_repid
                dynpro_number = syst-dynnr
                field_name    = gc_fieldname                    " p_fname1
           IMPORTING
                file_name     = lv_file.
      IF NOT lv_file EQ space.
        p_fname = lv_file.
      ELSE.
        MESSAGE e999 WITH 'Invalid Path'(005).
      ENDIF.
    ENDFORM.                    " fr_get_filename
    *&      Form  fr_upload_data
          text
    FORM fr_upload_data.
      DATA: lv_fname TYPE string.
      CLEAR lv_fname.
      lv_fname = p_fname.
    Uploading file from PC or presentation server to internal table.
      CALL FUNCTION 'GUI_UPLOAD'
           EXPORTING
                filename            = lv_fname
                filetype            = 'ASC'
                has_field_separator = 'X'
           TABLES
                data_tab            = t_tab
           EXCEPTIONS
                file_open_error     = 1.
      IF sy-subrc <> 0.
        DESCRIBE TABLE t_message LINES n.
        w_message-msgnum = n + 1.
        w_message-msgtyp = 'E'.
        MOVE text-m01  TO w_message-msgtxt.
        APPEND w_message TO t_message.
    Subroutine for writing log.
        PERFORM fr_write_log.
      ENDIF.
    ENDFORM.                    " fr_upload_data
    *&      Form  fr_validate_data
          text
    FORM fr_validate_data.
      DATA : lv_lines1 TYPE i,
             lv_lines2 TYPE i.
    *Obtain Status depending on Check box selected.
      IF p_test IS INITIAL.
        gv_status = 'PRODUCTION'.
      ELSE.
        gv_status = 'TEST RUN'.
      ENDIF.
    *Batch Mode
      CLEAR gv_mode.
      IF rb_back EQ 'X'.          "No Display
        MOVE gc_back TO gv_mode.
      ELSEIF rb_error EQ 'X'.     "Error Only
        MOVE gc_error TO gv_mode.
      ELSEIF rb_all EQ 'X'.       "All Screens
        MOVE gc_all TO gv_mode.
      ENDIF.
      IF NOT t_tab[] IS INITIAL.
        SORT t_tab BY cust.
        REFRESH t_tab_temp.
        t_tab_temp[] = t_tab[].
        SORT t_tab_temp BY cust.
        DELETE ADJACENT DUPLICATES FROM t_tab_temp COMPARING cust.
        IF NOT t_tab_temp[] IS INITIAL.
          SELECT werks vkorg FROM t001w
                             INTO TABLE t_check
                             FOR ALL ENTRIES IN t_tab_temp
                             WHERE werks = t_tab_temp-cust+0(4).
          IF sy-subrc = 0.
            SORT t_check BY werks.
          ENDIF.
          LOOP AT t_check.
            IF t_check-vkorg <> ' '.
              MOVE t_check-vkorg TO t_check-value.
              MODIFY t_check TRANSPORTING value.
            ENDIF.
          ENDLOOP.
        ENDIF.
        FREE t_tab_temp.
      ENDIF.
      IF NOT t_check[] IS INITIAL.
        REFRESH t_check_temp.
        t_check_temp[] = t_check[].
        SORT t_check_temp BY value.
        DELETE ADJACENT DUPLICATES FROM t_check_temp COMPARING value.
        IF NOT t_check_temp[] IS INITIAL.
          SELECT * FROM zcs_param INTO TABLE t_zcs_param
                   FOR ALL ENTRIES IN t_check_temp
                   WHERE seq_no   EQ gc_seq_no
                     AND object   EQ gc_object
                     AND paraname EQ gc_paraname
                     AND value    EQ t_check_temp-value.
          IF sy-subrc = 0.
            SORT t_zcs_param BY value.
          ENDIF.
        ENDIF.
        FREE t_check_temp.
      ENDIF.
      IF NOT t_tab[] IS INITIAL.
        LOOP AT t_tab.
          READ TABLE t_check WITH KEY werks = t_tab-cust BINARY SEARCH.
          IF sy-subrc <> 0.
            MOVE 'X' TO t_tab-error.
            MODIFY t_tab TRANSPORTING error.
            DESCRIBE TABLE t_message LINES n.
            w_message-msgnum = n + 1.
            w_message-msgtyp = 'E'.
            CONCATENATE t_tab-cust text-030
            INTO w_message-msgtxt SEPARATED BY space.
            APPEND w_message TO t_message.
    Subroutine for writing log.
            PERFORM fr_write_log.
            EXIT.
          ELSE.
            READ TABLE t_zcs_param WITH KEY value = t_check-vkorg
                                                         BINARY SEARCH.
            IF sy-subrc <> 0.
              MOVE 'X' TO t_tab-error.
              MODIFY t_tab TRANSPORTING error.
              DESCRIBE TABLE t_message LINES n.
              w_message-msgnum = n + 1.
              w_message-msgtyp = 'E'.
              CONCATENATE text-003 t_tab-cust text-004 t_check-vkorg
              INTO w_message-msgtxt SEPARATED BY space.
              APPEND w_message TO t_message.
    Subroutine for writing log.
              PERFORM fr_write_log.
              EXIT.
            ELSE.
              PERFORM fr_format_tab.
            ENDIF.
          ENDIF.
        ENDLOOP.
      ENDIF.
      DESCRIBE TABLE t_tab LINES lv_lines1.
      IF lv_lines1 <> 0.
        DELETE t_tab WHERE error EQ 'X'.
      ENDIF.
      DESCRIBE TABLE t_tab LINES lv_lines2.
      IF lv_lines2 <> 0.
        IF lv_lines2 <> lv_lines1.
          EXIT.
        ELSE.
          IF p_test IS INITIAL.
            LOOP AT t_tab.
    *Subroutine to build BDC table
              PERFORM fr_fill_bdctab.
    *Subroutine to Post Data into SAP.
              PERFORM fr_data_posting.
            ENDLOOP.
          ENDIF.
        ENDIF.
      ENDIF.
    ENDFORM.                    " fr_validate_data
    *&      Form  fr_write_log
          text
    FORM fr_write_log.
      CLEAR error.
      error = 'X'.
      WRITE:/1 'Msg No'(027), 10 'Type'(028), 20 'Text'(029).
      ULINE:/1(120).
      FORMAT RESET.
      LOOP AT t_message.
        IF t_message-msgtyp = 'E'.
          FORMAT COLOR 6 INTENSIFIED .
        ELSEIF t_message-msgtyp = 'W'.
          FORMAT COLOR 3 INTENSIFIED .
        ELSEIF t_message-msgtyp = 'I'.
          FORMAT COLOR 5 INTENSIFIED .
        ENDIF.
        WRITE:/1 t_message-msgnum,
              10 t_message-msgtyp,
              20 t_message-msgtxt.
        FORMAT RESET.
      ENDLOOP.
      ULINE:/1(120).
    ENDFORM.                    " fr_write_log
    *&      Form  fr_write_report
          text
    FORM fr_write_report.
      CLEAR gv_exit.
      LOOP AT t_message.
        IF t_message-msgtyp = 'E'.
          gv_exit = 'X'.
          EXIT.
        ENDIF.
      ENDLOOP.
      IF NOT gv_exit IS INITIAL.
        EXIT.
      ELSE.
        PERFORM fr_display_report.
        IF NOT t_text[] IS INITIAL.
    Subroutine for Display Call Transaction messages.
          PERFORM fr_write_msg.
        ENDIF.
      ENDIF.
    ENDFORM.                    " fr_write_report
    *&      Form  fr_display_report
          text
    FORM fr_display_report.
      IF NOT t_tab1[] IS INITIAL.
        CLEAR: gv_qty, gv_sale, gv_final.
        LOOP AT t_tab1.
          WRITE:/1(10) t_tab1-cust,
                13(10) t_tab1-date,
                25(05) t_tab1-currency,
                32(14) t_tab1-extnbr,
                48(09) t_tab1-pos-cont,
                60(18) t_tab1-matnr,
                80(16) t_tab1-qty RIGHT-JUSTIFIED ,
                98(16) t_tab1-sale RIGHT-JUSTIFIED ,
               116(07) t_tab1-paymeth,
               125(16) t_tab1-final RIGHT-JUSTIFIED,
               143(06) t_tab1-tarcur,
               152(12) t_tab1-assign.
          gv_qty   = t_tab1-qty   + gv_qty.
          gv_sale  = t_tab1-sale  + gv_sale.
          gv_final = t_tab1-final + gv_final.
        ENDLOOP.
        FORMAT COLOR 3.
        ULINE: /(164).
        WRITE:/ 'TOTALS',
          80(16) gv_qty RIGHT-JUSTIFIED,
          98(16) gv_sale RIGHT-JUSTIFIED,
         125(16) gv_final RIGHT-JUSTIFIED,
         182 ''.
        ULINE: /(164).
        FORMAT RESET.
      ENDIF.
    ENDFORM.                    " fr_display_report
    *&      Form  FR_DISPLAY_HEADER
          text
    FORM fr_display_header.
      IF error IS INITIAL.
        FORMAT COLOR 1.
        WRITE:/ 'Date upload           :'(007),   25 sy-datum,  38 ''.
        WRITE:/ 'Production or Test Run:'(008),   25 gv_status, 38 ''.
        WRITE:/ 'Upload User Logon     :'(009),   25 sy-uname,  38 ''.
        ULINE: /(164).
        WRITE:/1(04) 'Site'(010),
              13(10) 'Date'(011),
              25(05) 'Curr.'(012),
              32(14) 'Receipt'(013),
              48(09) 'Cashier'(014),
              60(18) 'Article'(015),
              92     'Qty'(016),
              102    'Item Amount'(017),
              116(7) 'M.o.P.'(018),
              128    'Tender Amount'(019),
              143(6) 'T.Curr'(020),
             152(12) 'Assignment'(021).
        ULINE:/(164).
        FORMAT RESET.
      ENDIF.
    ENDFORM.                    " FR_DISPLAY_HEADER
    *&      Form  fr_newdynpro
          text
    FORM fr_newdynpro USING program LIKE bdcdata-program
                            dynpro  LIKE bdcdata-dynpro.
      t_bdcdata-program = program .
      t_bdcdata-dynpro  = dynpro.
      t_bdcdata-dynbegin = 'X'.
      APPEND t_bdcdata.
      CLEAR t_bdcdata.
    ENDFORM.                    " fr_newdynpro
    *&      Form  fr_loadfield
          text
    FORM fr_loadfield USING field LIKE bdcdata-fnam
                            value.
      t_bdcdata-fnam = field.
      t_bdcdata-fval = value.
      APPEND t_bdcdata.
      CLEAR t_bdcdata.
    ENDFORM.                    " fr_loadfield
    *&      Form  fr_fill_bdctab
          text
    FORM fr_fill_bdctab.
      REFRESH t_bdcdata.
      PERFORM fr_newdynpro USING 'SAPMWPUK' '100'.
      PERFORM fr_loadfield USING 'G_FILIALE' t_tab-cust.
      PERFORM fr_loadfield USING 'G_DATUM'   t_tab-date.
      PERFORM fr_loadfield USING 'BDC_OKCODE' 'BON'.
      PERFORM fr_newdynpro USING 'SAPMWPUK' '500'.
      PERFORM fr_loadfield USING 'WPSCB01-POSKREIS'   t_tab-pos-cont.
      PERFORM fr_loadfield USING 'WPSCB01-KASSID'     t_tab-pos-id.
      PERFORM fr_loadfield USING 'WPSCB01-BELEGWAERS' t_tab-currency.
      PERFORM fr_loadfield USING 'WPSCB01-CSHNAME'    t_tab-cashier.
      PERFORM fr_loadfield USING 'WPSCB01-BONNUMMER'  t_tab-extnbr.
      PERFORM fr_loadfield USING 'E1WPB02-QUALARTNR(01)'  t_tab-qualif.
      PERFORM fr_loadfield USING 'E1WPB02-ARTNR(01)'      t_tab-matnr.
      PERFORM fr_loadfield USING 'E1WPB02-MENGE(01)'      t_tab-qty.
      PERFORM fr_loadfield USING 'WPSCB03-KONDVALUE(01)'  t_tab-sale.
      PERFORM fr_loadfield USING 'E1WPB02-VORGANGART(01)' t_tab-pos-tr.
      PERFORM fr_loadfield USING 'BDC_OKCODE' 'ZAHL'.
      PERFORM fr_newdynpro USING 'SAPMWPUK' '530'.
      PERFORM fr_loadfield USING 'WPSCB06-ZAHLART'  t_tab-paymeth.
      PERFORM fr_loadfield USING 'WPSCB06-SUMME'    t_tab-final.
      PERFORM fr_loadfield USING 'WPSCB06-WAEHRUNG' t_tab-tarcur.
      PERFORM fr_loadfield USING 'WPSCB06-ZUONR'    t_tab-assign.
      PERFORM fr_loadfield USING 'BDC_OKCODE' 'SAVE'.
      PERFORM fr_newdynpro USING 'SAPMWPUK' '530'.
      PERFORM fr_loadfield USING 'WPSCB06-ZAHLART'  t_tab-paymeth.
      PERFORM fr_loadfield USING 'WPSCB06-SUMME'    t_tab-final.
      PERFORM fr_loadfield USING 'WPSCB06-WAEHRUNG' t_tab-tarcur.
      PERFORM fr_loadfield USING 'WPSCB06-ZUONR'    t_tab-assign.
      PERFORM fr_loadfield USING 'BDC_OKCODE' 'BACK'.
      PERFORM fr_newdynpro USING 'SAPLSPO1' '0200'.
      PERFORM fr_loadfield USING 'BDC_OKCODE' 'YES'.
      PERFORM fr_newdynpro USING 'SAPMWPUK' '100'.
      PERFORM fr_loadfield USING 'G_FILIALE' t_tab-cust.
      PERFORM fr_loadfield USING 'G_DATUM'   t_tab-date.
      PERFORM fr_loadfield USING 'BDC_OKCODE' 'BACK'.
    ENDFORM.                    " fr_fill_bdctab
    *&      Form  fr_data_posting
          text
    FORM fr_data_posting.
      IF NOT t_bdcdata[] IS INITIAL.
        REFRESH messtab.
        CALL TRANSACTION 'WPUK' USING t_bdcdata
                                MODE gv_mode
                                UPDATE 'S'
                                MESSAGES INTO messtab.
        IF sy-subrc = 0 .
          CLEAR w_text.
          LOOP AT messtab.
            CALL FUNCTION 'FORMAT_MESSAGE'
                 EXPORTING
                      id        = messtab-msgid
                      lang      = sy-langu
                      no        = messtab-msgnr
                      v1        = messtab-msgv1
                      v2        = messtab-msgv2
                      v3        = messtab-msgv3
                      v4        = messtab-msgv4
                 IMPORTING
                      msg       = w_text
                 EXCEPTIONS
                      not_found = 1
                      OTHERS    = 2.
            MOVE w_text TO t_text-msgtxt.
            CONCATENATE 'Site:'(031)    t_tab-cust
                        'Article:'(024) t_tab-matnr
                        'Posted Sucessfully'(032)
              INTO t_text-desc SEPARATED BY space.
            APPEND t_text.
            CLEAR t_text.
          ENDLOOP.
        ELSE.
          CLEAR w_text.
          LOOP AT messtab.
            CALL FUNCTION 'FORMAT_MESSAGE'
                 EXPORTING
                      id        = messtab-msgid
                      lang      = sy-langu
                      no        = messtab-msgnr
                      v1        = messtab-msgv1
                      v2        = messtab-msgv2
                      v3        = messtab-msgv3
                      v4        = messtab-msgv4
                 IMPORTING
                      msg       = w_text
                 EXCEPTIONS
                      not_found = 1
                      OTHERS    = 2.
            MOVE w_text TO t_text-msgtxt.
            IF messtab-msgnr EQ '213'.
              CONCATENATE 'Site:'(031)    t_tab-cust
                          'Article:'(024) t_tab-matnr
                          'Posted Sucessfully'(032)
               INTO t_text-desc SEPARATED BY space.
              APPEND t_text.
              CLEAR t_text.
              EXIT.        ELSE.
              CONCATENATE 'Site:'(031)    t_tab-cust
                          'Article:'(024) t_tab-matnr
                          'Not Posted'(033)
               INTO t_text-desc SEPARATED BY space.
              APPEND t_text.
              CLEAR t_text.
            ENDIF.
          ENDLOOP.
        ENDIF.
      ENDIF.
    ENDFORM.                    " fr_data_posting
    *&      Form  fr_authority_check
          text
    FORM fr_authority_check.
      AUTHORITY-CHECK OBJECT 'Y_VATADJ'
               ID 'VKORG' FIELD t001w-vkorg
               ID 'TCD'   FIELD 'YGFVAT'.
      IF sy-subrc NE 0.
        MESSAGE e999 WITH text-m02.
      ENDIF.
    ENDFORM.                    " fr_authority_check
    *&      Form  fr_write_msg
          text
    FORM fr_write_msg.
      SKIP.
      ULINE:/(164).
      WRITE:/
      'Messages encountered while Calling Transaction WPUK'(025),
          90 'Message Text'(026).
      ULINE:/1(164).
      LOOP AT t_text.
        WRITE:/1 t_text-desc,
              90 t_text-msgtxt,
              164 ''.
      ENDLOOP.
      ULINE:/1(164).
    ENDFORM.                    " fr_write_msg
    *&      Form  FR_BUILD_REP
          text
    FORM fr_build_rep.
      IF error IS INITIAL.
        IF NOT t_tab[] IS INITIAL.
          LOOP AT t_tab.
            MOVE:
              t_tab-cust     TO t_tab1-cust,        "site/customer number
              t_tab-date     TO t_tab1-date,        "transaction date
              t_tab-currency TO t_tab1-currency,    "currency
            t_tab-extnbr   TO t_tab1-extnbr,      "external reference number
              t_tab-pos-cont TO t_tab1-pos-cont,    "POS controler
              t_tab-pos-id   TO t_tab1-pos-id,      "POS id
              t_tab-cashier  TO t_tab1-cashier,     "cashier name
             t_tab-qualif   TO t_tab1-qualif,      "qualifier of the article
              t_tab-matnr    TO t_tab1-matnr,       "article number
              t_tab-pos-tr   TO t_tab1-pos-tr,      "POS transfert type
              t_tab-paymeth  TO t_tab1-paymeth,     "payment method
              t_tab-tarcur   TO t_tab1-tarcur,      "target currency
              t_tab-assign   TO t_tab1-assign.
            REPLACE ',' WITH '.' INTO t_tab-qty.
            CONDENSE t_tab-qty NO-GAPS.
            MOVE t_tab-qty TO t_tab1-qty.
            REPLACE ',' WITH '.' INTO t_tab-sale.
            CONDENSE t_tab-sale NO-GAPS.
            MOVE t_tab-sale TO t_tab1-sale.
            REPLACE ',' WITH '.' INTO t_tab-final.
            CONDENSE t_tab-final NO-GAPS.
            MOVE t_tab-final TO t_tab1-final.
            APPEND t_tab1.
            CLEAR t_tab1.
          ENDLOOP.
        ENDIF.
      ENDIF.
    ENDFORM.                    " FR_BUILD_REP
    *&      Form  fr_format_tab
          text
    FORM fr_format_tab.
      DATA : lv_qty TYPE string.
      IF NOT t_tab-qty IS INITIAL.
        IF t_tab-qty+0(1) EQ '-'.
          CLEAR lv_qty.
          MOVE t_tab-qty TO lv_qty.
          CLEAR t_tab-qty.
          SHIFT lv_qty LEFT CIRCULAR.
          CONDENSE lv_qty NO-GAPS.
          MOVE lv_qty TO t_tab-qty.
          MODIFY t_tab TRANSPORTING qty.
        ENDIF.
      ENDIF.
    ENDFORM.                    " fr_format_tab

  • How to rectify the error message " duplicate data records found"

    Hi,
    How to  rectify the error "duplicate data records found" , PSA is not there.
    and give me brief description about RSRV
    Thanks in advance,
    Ravi Alakunlta

    Hi Ravi,
    In the Info Package screen...Processing tab...check the option Do not allow Duplicate records.
    RSRV is used for Repair and Analysis purpose.
    If you found Duplicate records in the F fact table...Compress it then Duplicate records will be summarized in the Cube.
    Hope this helps.

  • How to rectify the errors in master data loads & transactional data loads?

    hy,
    please any one tell me
    How to rectify the errors in master data loads & transactional data loads?
    thnQ
    Ravi

    Hi,
    Please post specific questions in the forum.
    Please explain the error you are getting.
    -Vikram

  • How to rectify the errors  occured during session method

    how to rectify the errors  occured during session method

    HI
      When the execution of session is completed: we can check the errors via the log.
      Rectification of errors depends on the kind of errors. It is not specific that we have to approach the same way to handle all kinds of errors.
      Errors can be due to data format, inconsistency due to the configuration, unavailability of master data...
    Kind Regards
    Eswar

  • How to rectify the Errors that occurs in QA system?

    hi,
    if there are some errors that occurs while transporting my ods from development to QA. how should i see the errors? And then how to rectify the errors that happened in the transports in QA nor DEV.
    Can anyone let me know the entire process for the correcting the errors in transports if any docs pls email at [email protected]
    regds
    haritha

    hi,
    while importing the reqst if u get any kind of errors , u need to check the Transport Log Entries
    thez are the posible return codes
    0 means all is ok
    4 means something happens, e. g. something in the destination system is deletet, but else everything ok
    8 means something goes wrong. Some parts could be transportet but not all
    If you have higher than 8 you have a problem. If you want to know more about a transport read the transport protocol. It tells you what the problem is
    Analyze the trnasport log and fix the issue based on the error msg and reimpor t he reqst
    thanks

  • I've got a problems with my Iphone 4, I've recently upgraded to the new software (5.1), since then the iTunes doesn't recognize my iphone, as the error comes up:' iTunes could not connect to this iPhone because an unknown error (ex8000022)

    I've recently upgraded to the new software (5.1), since then the iTunes doesn't recognize my iphone, as the error comes up:' iTunes could not connect to this iPhone because an unknown error (ex8000022).
    Are you guys facing the same problem?
    Let me know your opinions, solutions and even problems.
    Thank You !

    http://support.apple.com/kb/HT4137
    How to restore as new.
    and this for itunes message
    http://support.apple.com/kb/HT1808

  • Why do I get the error message "iTunes Match could not download because disconnected from network?  I'm connected to the internet during that time with Safari so am I not connected to the network?

    Why do I get the error message "iTunes Match could not be updated because you were disconnected from the network during processing."  I'm on the internet during all of this.  What disconnect is the message referring to?  Itunes is frozen now.  I keep clicking OK but it just comes back with no action.

    Hello FredJay,
    Thank you for contacting Apple Support Communities.
    iTunes Match needs a network connection to work, either Wi-Fi, cellular or wired. See the following:
    Make sure you have an active Internet connection
    Be sure your computer or device has an active Internet connection by loading a webpage using Safari or another web browser.
    On an iOS device with cellular support, if you are not on a Wi-Fi network, try enabling 3G cellular data1 for iTunes Match.
    For iOS 6, tap Settings > iTunes & App Stores > Use Cellular Data > On
    For iOS 5.1.1 or earlier, tap Settings > iTunes & App Store > Use Cellular Data > On
    1Fees may be associated with downloading over cellular networks; contact your wireless carrier for details.
    From:
    iTunes Store: Troubleshooting iTunes Match
    http://support.apple.com/kb/TS4054
    Regards,
    Jeff D.

  • How to rectify the error in running the apk file in emulator.

    hi
    I have developed the air based android application and got .apk file.I installed the .apk file in emulator which is version 2.3.1 android but i got the error
    when running it as
    "The Application HelloWorld Has Stopped Unexpectedly.  Please Try Again"
    How to rectify the problem.Please anybody help me with this what the exact problem in this...................
    thanks in advance.....................

    Hi Anson,
    You looked at old installation guide.
    I see you use old UI components which were released in May 2013.
    Important Note: Please use new UI with new SAP Fiori Launchpad
    New UI components have UI extension points and work with new SAP Fiori Launchpad.
    Please find correct components based on your Backend version.
    SAP Fiori - Add-on quick reference for transactional apps
    Regards, Masa
    SAP Customer Experience Group - CEG

  • How to rectify the errors in RWB

    Hi all,
    After executing the scenario ,if i get any errors ,how to rectify those errors,can you tell me the process,
    Regards,
    priya reddy

    HI
    XI runs on an Application Server with double stack (JAVA/ABAP).
    Some components of XI runs on JAVA and some on ABAP:
    JAVA STACK:
    Integration Builder
    SLD
    Adapter Engine
    Runtime Workbench
    ABAP STACK:
    Integration engine(IE) and Business Process Engine(BPE).
    Abap stack is monitored using sxmb_moni / sxmb_moni_bpe
    Java stack is monitored by using Message monitoring, End-End monitoring, Component Monitoring Performance monitoring from RWB.
    Java stack monitoring can be done in Runtime Work Bench.
    In RWB, you can have Message Monitoring and Component Monitoring.
    In Message Monitoring, we can find the the message with status and in "Audit Log" we can have a complete log of processing done for that message. And in Compnent Monitoring, you can find the statuses of all components in Integration Server.
    http://help.sap.com/saphelp_nw04/helpdata/en/14/80243b4a66ae0ce10000000a11402f/frameset.htm
    Central Monitoring: To monitor all components comprehensively at run time.
    Runtime Workbench
    The Runtime Workbench is an XI component that offers a central monitoring view of  all XI components and processes.
    The workbench includes a graphical end-to-end monitoring of integration scenarios.
    You can refer the below links
    Runtime WorkBench Monitoring
    XI CCMS Alert Monitoring : Overview and Features
    The specified item was not found.
    The specified item was not found.
    http://help.sap.com/saphelp_nw04/helpdata/en/58/d22940cbf2195de10000000a1550b0/content.htm
    The specified item was not found.
    The specified item was not found.
    The specified item was not found.
    The specified item was not found.
    XI :  How to Re-Process failed XI Messages Automatically
    Central monitoring:
    http://help.sap.com/saphelp_nw04/helpdata/en/7c/14b5765255e345a9e3f044f1e9bbbf/frameset.htm
    cheers

  • I am not able to activate my iPhone 3GS after upgrading it to IOS 5.1.1 since it shows the error message "your iPhone could not be activated because the activation server is temporarily unavailable. I am asked to retry after some time. How can I avoid thi

    i am not able to active my ipone 3gs after upgrat to ios5.1.1. it show error message " your iphone could not be activted because the activation server is temperarily unavailable.try connecting you iphone to itunes to activate it, or try again in a couple of munutes" i retry many time, could not sold problem.

    You had a jailbreak and unlock.
    When you updated you cooked it.
    Your phone is done.
    Time for a new one.

  • How to resolve "The server is unavailable and could not be accessed. The server is probably disconnected from the network." error in Sharepoint serach crawl.

    Hi all,
    I have created a content source in Search service application for a particular site collection "http://spwebapp/sites".
    I performed reset crawl index of Search service application and then performed a full crawl.
    But i get errors on running crawl on this content source for most of the files. The error is "The server is unavailable and could not be accessed. The server is probably disconnected from the network." Though the site is accessible.
    But before performing reset index the crawl was working fine on this content source. Crawl is working fine for other site collections. Only one site collection is facing this problem. Please let me know if what I can do to resolve this error.
    Thanks in advance.

    Are you seeing any error messages in the URL related to the Gatherer?  And in your content source, are there any site URLs that are no longer active or do you have any crawl rules set up that might be affecting access to the site collection?
    I've seen this happen for a variety of reason, SSL issues, proxy issues, permissions issues.  The Eventvwr and ULS logs should help you narrow down the real problem.
    Sometimes this is an issue because the indexer and the site are sitting on the same box, you could try doing a disable loopback check to see if that resolves the issue and if it does then go through the hassle of setting up a specific LSA :
    http://iedaddy.com/2009/04/sharepointdisable-loopback-check/
    ieDaddy
    Blog: http://iedaddy.com
    Twit: @iedaddy

  • Error Master Type definition could not be found : FPGA

    I am having similar/exact error condition as in the below post..
    http://forums.ni.com/t5/LabVIEW/Error-Master-Copy-for-Type-Definition-Could-Not-Be-Found/m-p/1496866...
    The *.lvbit file i am using was compiled in Labview 8.2.1 and I am now using 2009 version of Labview.  Unlike the suggested solution, recompilation of *.lvbit file is ruled out due to lack of source code access.
    Any help towards troubleshooting is appreciated...

    Because I am a bad scientist, I do not know exactly what fixed my problem because I changed more than one variable at once.
    Here's what I did:
    Removed auto-populating folder from project (doubt this mattered, still broken after this)
    Changed my open FPGA VI reference from using a bitfile to using a VI, selected my FPGA VI, NO MORE BROKEN RUN ARROW! YAY.
    The above finding led me to go look at my FPGA bitfiles on disk -- I had two of them (weird). Usually a compilation just overwrites the older file.
    Just in case the names give any insight, they are:
    Older:  NASATTRControlCo_FPGATarget_FPGAMain_25B3817B.lvbitx
    Newer: NASATTRControlCo_FPGATarget_FPGAMain_25AF817B.lvbitx
    I went back to my open FPGA VI reference, and selected the most recent bitfile that I compile this morning -- No more broken run arrow.
    I have a feeling this may be due to selecting an old bitfile, but usually if the bitfile doesn't include the control, it won't show up in the read/write control node. If anyone from NI would like to comment on this I'd appreciate the insight on what may have happened.
    I am wondering if it's because I installed 2010 SP 1? Who knows but it's fixed now.
    CLA, LabVIEW Versions 2010-2013

  • How to rectify the error while creating hierarchy

    Hi
    I am working on creating a hierarchy for an info object IO_SREP.  I am using the book SAP BW - A Step-by-Step guide written by Biao Fu, and Henry Fu.  As mentioned in the book
    1. I double clicked the info object Sales representative ID then I got the screen Change characteristic IO_SREP:Detail. 
    2.     Accordingly as mentioned I selected the Hierarchy tab wherein I clicked the check box with hierarchies and the radio button Hierarchy structure time-dependent.
    3.     I successfully checked and activated the screen and hit the back button which took me to the screen Administrator Workbench: Modelling.
    4.     <b>As mentioned in the book now I right clicked on the info object Sales representative ID and selected Create Hierarchy option. 
    At this stage I am getting the error “The import parameters were not filled correctly.  When I clicked on the question mark for help I got the screen Performance Assistant with the message “The import parameters were not filled correctly” Message no. RH032.</b>
    But as per the book the screen Create Hierarchy should open.  Can anyone please guide me as to where I am going wrong and what should I do to proceed further? 
    Thank you.
    TR.

    Try transaction RSH1 to create the hierarchy. If you are on 3.0A, this might be due to program error (OSS note 511004).

  • My Time Machine keeps repeating the error message "Time Machine could not complete the back- The back-up disk image "/Volumes/Data/User's iMac.sparsebundle" could not be accessed (error -1). How can I fix this?s/

    My Time Machine could not complete the back-up.  The error message says "The backup disk image "/Volumes/DataUser's iMac.sparsebundle" could not be accessed (error-1).  How can I fix this problem?

    Welcome to the Apple Support Communities
    See > http://pondini.org/TM/C17.html

Maybe you are looking for

  • Photoshop will not open/create new files, cannot resize images etc

    Hi to all. So I'll start with the basics; I am using Photoshop 7 (And yes, I am using it for a specific reason, I'm not interested in migrating to this new $1000 Creative Cloud rubbish), us Australians are getting ripped a new one and I'm happy with

  • RFC_READ_TABLE

    Hello, I´m quite new in xMII. I tried the function module with a table. I set an OPTION and 2 FIELDS. In SAP it worked. I get an entry for DATA/WA. When i try this in MII and put a tracer to the response of the JCO/RFC_READ_TABLE/TABLES/DATA/item/WA

  • Trying to update phone to latest software version

    I am trying to update the version of my iphone and the support page says to check your latest version of iTunes - cannot figure out how?  Then check 'Devices' in the left column and follow instructions?  Help - I cannot figure out how to check the ve

  • Af:panerlFormLayout with empty components

    Hello,I have the following lyout problem: I need to achieve something like that " " text1 " " text2 text3 text4 text5 text6 text7 text8 text9 text10 the " " is supposed to be a blank space. and the text fields to be in rows and columns <af:panelFormL

  • CReative Video Win

    I have a Dell OEm Soundblaster li've value and have just had to re install OS (W2k pro sp4) since doing so cannot view video files in creatibve video window. Note I have a Radeon 7200 graphics card and connot view same graphics files via ATI File Pla