Unicode convertible

Hi friends,
While executing the Modile pool prog. Im gettting the below error
"The type of database table and work area(or internal table) e_sflight are not UNICODE CONVERTIBALE
Can anyone hlep what may be issue
Thank  you
Regards,
Sandy

>
Suraj Nair wrote:
> See if your declarations are without heder lines.
> Suraj
Header lines are for sure unicode compatible. There are a lot of reasons not to use them, but unicode is not.

Similar Messages

  • The type of the database table and work area are not Unicode convertible

    ***Data declaration
    TYPES : BEGIN OF t_zle_lagerplanung,
                       SEl, "stores which row user has selected
                       kdauf TYPE zle_lagerplanung-kdauf,
                       kdpos TYPE zle_lagerplanung-kdpos,
                       etenr TYPE zle_lagerplanung-etenr,
                       papiermaschine TYPE zle_lagerplanung-papiermaschine,
                       runnr TYPE zle_lagerplanung-runnr,
                       prio TYPE zle_lagerplanung-prio,
                       werk TYPE zle_lagerplanung-werk,
                       durchmesser TYPE zle_lagerplanung-durchmesser,
                       breite TYPE zle_lagerplanung-breite,
                       anzle TYPE zle_lagerplanung-anzle,
                       lgpla TYPE zle_lagerplanung-lgpla,
                       lgtyp TYPE zle_lagerplanung-lgtyp,
                       art TYPE zle_lagerplanung-art,
                       anzhoehe TYPE zle_lagerplanung-anzle,
                       fa TYPE zle_lagerplanung-fa,
    END OF t_zle_lagerplanung.
    DATA : it_zle_lagerplanung TYPE STANDARD TABLE OF t_zle_lagerplanung INITIAL SIZE 0,
                wa_zle_lagerplanung TYPE t_zle_lagerplanung.
    Here I am getting the data in internal table by using thiis select statement.
    SELECT kdauf kdpos etenr papiermaschine runnr prio werk durchmesser breite
                  anzle lgpla lgtyp art anzhoehe fa
    FROM    zle_lagerplanung INTO CORRESPONDING FIELDS OF TABLE it_zle_lagerplanung
    WHERE  kdauf IN s_kdauf
    AND       KDPOS IN s_kdpos
    AND      werk = p_werks.
    But while updating the particular field in zle_lagerplanung using this statement
    UPDATE zle_lagerplanung from table it_zle_lagerplanung.
    it is giving syntax error
    "The type of the database table and work area (or internal table)
    "IT_ZLE_LAGERPLANUNG" are not Unicode convertible. "
    Could any one help me out how to resolve this problem....
    Thanks in advance

    Dear Shayamal,
    XXX....are not Unicode convertible
    This  error comes while inserting or updating database and the fields are not matching between  data base table and structure .
    Check you fields of data base table and  "zle_lagerplanung" and struture "it_zle_lagerplanung" . There fields must match.
    thanks and regrds,
    Anup Banerjee

  • Table is not Unicode Convertible

    hello,
    i am getting error the type of tha database table or work area or internal table are not unicode convertible. please help me.
    REPORT ZEXCISE_INVOICE_RTNS
    LINE-COUNT 100
    MESSAGE-ID 8I.
    *INCLUDES
    INCLUDE RVADTABL.
    *TABLES
    TABLES : T001, "Company Codes
    T005, "Countries
    LFA1, "Vendor Master (General Section)
    EKKO, "Purchasing Document Header
    EKPO, "Purchasing Document Item
    MKPF. "Header: Material Document
    *Excise Tables
    TABLES : J_1IEXCHDR, "Excise invoice header detail
    J_1IEXCDTL, "Excise invoice line item details
    J_1IEXCDEF, "Tax default informations
    J_1IMOVEND. "Vendor Master Excise Additional Data
    *INTERNAL TABLES AND STRUCTURES
    DATA : BEGIN OF TJ_1IEXCDTL OCCURS 0.
    INCLUDE STRUCTURE ZJ1IEXCDTL.
    DATA : END OF TJ_1IEXCDTL.
    DATA : i_mseg like mseg occurs 0 with header line.
    DATA : TJ_1IEXCDTL_Temp like TJ_1IEXCDTL occurs 0 with header line.
    DATA : begin of it_ekpo occurs 0,
    ebeln like ekko-ebeln, "PO Number
    ebelp like ekpo-ebelp, "Line item number
    meins like ekpo-meins, "Unit of measurement
    mwskz like ekpo-mwskz, "Tax on Sales/Purchases Code
    netpr like ekpo-netpr, "unit price
    end of it_ekpo.
    DATA : begin of it_a003 occurs 0,
    knumh like a003-knumh, "Condition record number
    kappl like a003-kappl, "Application
    kschl like a003-kschl, "Condition type
    mwskz like a003-mwskz, "Tax on Sales/Purchases Code
    end of it_a003.
    DATA : begin of it_konp occurs 0,
    knumh like konp-knumh, "Condition record number
    kappl like konp-kappl, "Application
    kschl like konp-kschl, "Condition type
    mwsk1 like konp-mwsk1, "Tax on Sales/Purchases Code
    kbetr like konp-kbetr, "Rate/unit
    end of it_konp.
    DATA : begin of it_konv occurs 0,
    knumv like konv-knumv, "Number of the document condition
    kposn like konv-kposn, "Condition item number
    kschl like konv-kschl, "Condition type
    krech like konv-krech, "Calculation type for condition
    kbetr like konv-kbetr, "Rate (condition amount or percentage)
    kwert like konv-kwert, "Condition value
    end of it_konv.
    *VARIABLES
    DATA: RETCODE LIKE SY-SUBRC. "Returncode
    DATA: REPEAT(1) TYPE C.
    DATA: XSCREEN(1) TYPE C. "Output on printer or screen
    DATA: G_FM_NAME TYPE RS38L_FNAM,
    V_SUBTOTAL LIKE J_1IEXCDTL-EXBAS.
    DATA : V_CHID(45) TYPE C,
    V_DESC1(30) TYPE C,
    V_DESC2(30) TYPE C,
    V_DESC3(30) TYPE C.
    DATA : v_document(15) TYPE C.
    SELECTION SCREEN
    SELECTION-SCREEN : BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
    PARAMETERS: p_mblnr like mkpf-mblnr OBLIGATORY,
    P_time like SY-UZEIT.
    SELECTION-SCREEN END OF BLOCK b1.
    START-OF-SELECTION
    start-of-selection.
    PERFORM GET_DATA.
    CHECK RETCODE = 0.
    Get the form name
    PERFORM GET_FORM_NAME.
    Call the form
    PERFORM CALL_FORM.
    End-Of-Selection
    end-of-selection.
    *FORM GET DATA
    FORM GET_DATA.
    SELECT single * from mkpf where mblnr = P_MBLNR.
    IF sy-subrc <> 0.
    RETCODE = 4.
    message i078(8I).
    exit.
    ELSE.
    PERFORM GET_EXCISE_INVOICE.
    if retcode <> 0.
    MESSAGE i301(8I).
    else.
    PERFORM GET_EXCISE_DETAILS.
    endif.
    ENDIF.
    ENDFORM. "GET_DATA
    *FORM GET EXCISE DETAILS
    FORM GET_EXCISE_DETAILS.
    DATA: KAWRT LIKE KOMV-KAWRT. "Excise Duty - Base Amount
    SELECT * FROM J_1IEXCDTL INTO TABLE TJ_1IEXCDTL
    WHERE TRNTYP = J_1IEXCHDR-TRNTYP
    AND DOCYR = J_1IEXCHDR-DOCYR
    AND DOCNO = J_1IEXCHDR-DOCNO.

    The structures do NOT have to be the same for a CORRESPONDING FIELDS. This works in a test program I have:
    ==================
    DATA: itab TYPE STANDARD TABLE OF istruct.
    SELECT *
    FROM ztab
    INTO CORRESPONDING FIELDS OF TABLE itab
    WHERE vkorg = 'XYZ'
    AND zyear = '2007'
    AND werks = '00A'.
    ===================
    where "istruct" is the same as the DB table definition plus two additional columns and minus MANDT.
    However, in another program I get the "not Unicode compatible" error when I try to activate it.
    Why does it work in one case and not the other? Is it some program setting?

  • Unicode convertible, what does it mean?

    TYPES: BEGIN OF zbficheentry_list2,
    FICHENO type zbficheentry-ficheno,
    LOGISTICSCENTER type zbficheentry-logisticscenter,
    KANTARNO type zbficheentry-kantarno,
    TRDATE type zbficheentry-trdate,
    TRHOUR type zbficheentry-trhour,  line_color(4) type c,
    END OF zbficheentry_list2.
    DATA: zbficheentry_list TYPE STANDARD TABLE OF zbficheentry_list2 WITH HEADER LINE,
          wa_ficheentry TYPE zbficheentry_list2.
    The program triggers the error:
    The type of the database table and work area (or internal table)          
    "WA_FICHEENTRY" are not Unicode-convertible . . . . . . . . . .          
    What does this mean?
    Please help.
    Thanks.

    Hello,
    U have to use like this :
    DATA: zbficheentry_list TYPE STANDARD TABLE OF zbficheentry_list2 WITH HEADER LINE,
    wa_ficheentry TYPE line of zbficheentry_list2.
    <b>WHAT is UNICODE ?</b>
    About brief idea about unicode
    In the past, SAP developers used various codes to encode characters of different alphabets, for example, ASCII, EBCDI, or double-byte code pages.
    ASCII (American Standard Code for Information Interchange) encodes each character using 1 byte = 8 bit. This makes it possible to represent a maximum of 28 = 256 characters to which the combinations [00000000, 11111111] are assigned. Common code pages are, for example, ISO88591 for West European or ISO88595 for Cyrillic fonts.
    EBCDI (Extended Binary Coded Decimal Interchange) also uses 1 byte to encode each character, which again makes it possible to represent 256 characters. EBCDIC 0697/0500 is an old IBM format that is used on AS/400 machines for West European fonts, for example.
    Double-byte code pages require 1 or 2 bytes for each character. This allows you to form 216 = 65536 combinations where usually only 10,000 - 15,000 characters are used. Double-byte code pages are, for example, SJIS for Japanese and BIG5 for traditional Chinese.
    Using these character sets, you can account for each language relevant to the SAP System. However, problems occur if you want to merge texts from different incompatible character sets in a central system. Equally, exchanging data between systems with incompatible character sets can result in unprecedented situations.
    One solution to this problem is to use a code comprising all characters used on earth. This code is called Unicode (ISO/IEC 10646) and consists of at least 16 bit = 2 bytes, alternatively of 32 bit = 4 bytes per character. Although the conversion effort for the R/3 kernel and applications is considerable, the migration to Unicode provides great benefits in the long run:
    The Internet and consequently also mySAP.com are entirely based on Unicode, which thus is a basic requirement for international competitiveness.
    Unicode allows all R/3 users to install a central R/3 System that covers all business processes worldwide.
    Companies using different distributed systems frequently want to aggregate their worldwide corporate data. Without Unicode, they would be able to do this only to a limited degree.
    With Unicode, you can use multiple languages simultaneously at a single frontend computer.
    Unicode is required for cross-application data exchange without loss of data due to incompatible character sets. One way to present documents in the World Wide Web (www) is XML, for example.
    ABAP programs must be modified wherever an explicit or implicit assumption is made with regard to the internal length of a character. As a result, a new level of abstraction is reached which makes it possible to run one and the same program both in conventional and in Unicode systems. In addition, if new characters are added to the Unicode character set, SAP can decide whether to represent these characters internally using 2 or 4 bytes.
    A Unicode-enabled ABAP program (UP) is a program in which all Unicode checks are effective. Such a program returns the same results in a non-Unicode system (NUS) as in a Unicode system (US). In order to perform the relevant syntax checks, you must activate the Unicode flag in the screens of the program and class attributes.
    In a US, you can only execute programs for which the Unicode flag is set. In future, the Unicode flag must be set for all SAP programs to enable them to run on a US. If the Unicode flag is set for a program, the syntax is checked and the program executed according to the rules described in this document, regardless of whether the system is a US or an NUS. From now on, the Unicode flag must be set for all new programs and classes that are created.
    If the Unicode flag is not set, a program can only be executed in an NUS. The syntactical and semantic changes described below do not apply to such programs. However, you can use all language extensions that have been introduced in the process of the conversion to Unicode.
    As a result of the modifications and restrictions associated with the Unicode flag, programs are executed in both Unicode and non-Unicode systems with the same semantics to a large degree. In rare cases, however, differences may occur. Programs that are designed to run on both systems therefore need to be tested on both platforms.
    You can also check out these official SAP locations on the SAP Service Marketplace:
    http://service.sap.com/unicode
    http://service.sap.com/unicode@SAP
    http://service.sap.com/i18n
    Regards,
    Deepu.K

  • "DUMMY" are not Unicode convertible. ..

    hi experts,
    data dummy(2256).
    select single * into dummy  from tvsd where stgku in in_wldrg.
    while we executing i am getting this error as
    error : "DUMMY" are not Unicode convertible. ..
    how to rectify this.
    regards,
    praveen

    Hi,
    DATA : stvsd TYPE tvsd.
    DATA : dummy(2256).
    SELECT SINGLE * INTO stvsd FROM tvsd where stgku in in_wldrg.
    dummy = stvsd.
    Try like.
    Thanks,
    Durai.V

  • Not unicode convertible

    HI,
    INSERT ZBALTAB FROM TABLE ITAB_HYP.
    I get an error for the above line.
    ITAB_HYP are not unicode convertible.
    regards
    Bala

    The structures do NOT have to be the same for a CORRESPONDING FIELDS.  This works in a test program I have: 
    ==================
    DATA: itab  TYPE STANDARD TABLE OF istruct.
    SELECT *
      FROM ztab
      INTO CORRESPONDING FIELDS OF TABLE itab
      WHERE vkorg = 'XYZ'
        AND zyear = '2007'
        AND werks = '00A'.
    ===================
    where "istruct" is the same as the DB table definition but with two additional columns and without MANDT. 
    However, in another program I get the "not Unicode compatible" error when I try to activate it. 
    Why does it work in one case and not the other?  Is it some program setting?

  • Re: Unicode Convertible

    Hi All,
    While inserting a the datas from an internal table to a customized Table we are getting a
    Syntax error:  "<b>The type of the database table and work area (or internal table)are not Unicode convertible. Unicode convertible</b>".          
    Is there anyway to overcome this.
    Help and Suggestions will be much apprieciated.
    Regards.
    Ramesh.

    USE "<b>CORRESPONDING FIELDS</b>" IN YOUR OPEN SQL STATEMENT.
    SAMPLE CODE :-
    TABLES : MARA.
    TYPES : BEGIN OF LINE1,
             ERSDA  TYPE MARA-ERSDA,
             LAEDA  TYPE MARA-LAEDA,
             GROES  TYPE MARA-GROES,
             EKWSL  TYPE MARA-EKWSL,
             TRAGR TYPE MARA-TRAGR,
             RBNRM  TYPE MARA-RBNRM,
            END OF LINE1.
    DATA : ITAB1 TYPE STANDARD TABLE OF  LINE1 WITH HEADER LINE.
    SELECT * FROM MARA INTO CORRESPONDING FIELDS OF  TABLE ITAB1.

  • What means "IT_AUXPOS are not unicode-convertible??

    Hi,
    I have to copy some information in a Ztable. I have declared an internal table but
    I have an strange error.
    The type of the database table and work area (or internal table) "IT_AUXPOS" are not Unicode-convertible...
    my table is:
    TYPES: BEGIN OF S_AUXPOS, "ZPEDIDOSPOS
           MANDT1 TYPE MANDT,
           PEDIDO1(8) TYPE C,
           POSICION(6) TYPE N,
           CODIGO_MATERIAL TYPE MARA-MATNR,
           DESCRIPCION TYPE MARAV-MAKTX,
           CANTIDAD(19) TYPE C,
           UNIDAD TYPE UNIT,
           END OF S_AUXPOS.
    data: IT_AUXPOS TYPE STANDARD TABLE OF S_AUXPOS,
          WA_AUXPOS LIKE LINE OF IT_AUXPOS.
    LOOP AT IT_FICHERO INTO WA_FICHERO.
    WA_AUXPOS-PEDIDO1 = WA_FICHERO-NUM_PED. "Num pedido
      WA_AUXPOS-POSICION = POSICION.         "Posicion del pedido
      WA_AUXPOS-DESCRIPCION = WA_FICHERO-MAKTX. "Descripcion
      WA_AUXPOS-CANTIDAD = WA_FICHERO-CANTIDAD. "Cantidad
      WA_AUXPOS-UNIDAD = WA_FICHERO-UNIDAD.   "Unidades de medida
      INSERT WA_AUXPOS INTO TABLE IT_AUXPOS.
    ENDLOOP.
    INSERT ZTABLE FROM TABLE IT_AUXPOS.
    THANKS A LOT

    THE STRUCTURE OF IT_AUXPOS AND YOUR ZTABLE IS NOT MATCHING....
    ELSE PASS THE VALUE FOR MANDT1 FIELD ALSO IN THE STRUCTURE....
    TYPES: BEGIN OF S_AUXPOS, "ZPEDIDOSPOS
           MANDT1 TYPE MANDT,
           PEDIDO1(8) TYPE C,
           POSICION(6) TYPE N,
           CODIGO_MATERIAL TYPE MARA-MATNR,
           DESCRIPCION TYPE MARAV-MAKTX,
           CANTIDAD(19) TYPE C,
           UNIDAD TYPE UNIT,
           END OF S_AUXPOS.
    data: IT_AUXPOS TYPE STANDARD TABLE OF S_AUXPOS,
          WA_AUXPOS LIKE LINE OF IT_AUXPOS.
    LOOP AT IT_FICHERO INTO WA_FICHERO.
    WA_AUXPOS-MANDT1 = '001'.
    WA_AUXPOS-PEDIDO1 = WA_FICHERO-NUM_PED. "Num pedido
      WA_AUXPOS-POSICION = POSICION.         "Posicion del pedido
      WA_AUXPOS-DESCRIPCION = WA_FICHERO-MAKTX. "Descripcion
      WA_AUXPOS-CANTIDAD = WA_FICHERO-CANTIDAD. "Cantidad
      WA_AUXPOS-UNIDAD = WA_FICHERO-UNIDAD.   "Unidades de medida
      INSERT WA_AUXPOS INTO TABLE IT_AUXPOS.
    ENDLOOP.
    INSERT ZTABLE FROM TABLE IT_AUXPOS
    Message was edited by:
            Muthurajan Ramkumar

  • Unicode error

    while i am modity a custom table form a internal table
    an error masege is coming as
    The type of the database table and work area (or internal table)          
    "IT_YMPIT_MR_ISSUE" (internal table name) are not Unicode convertible.          
    Can somebody resolve this problem.

    in the declaration of internal table
    data: ITAB type table of ZTABLE with header line
    This will remove the possible compatibilty issues.
    When modifying the ZTABLE do like this
    MODIFY ZTABLE FROM ITAB.
    If your internal table does not have the stucture like ZTABLE then you need to declare ITAB with its fields type of ZTABLE fields
    data: begin of itab,
          field1 like ztable-field1.
          end of itab.
    Dont forget to award points for helpful answers

  • Regarding unicode problem

    Hi friends,
    Iam converting report programs from 4.6 to ECC 6.0.
    Error:
    The type of database table and work area (internal table) I_TAB are not unicode convertible.
    Statements:
    table declaration:
    DATA: BEGIN OF I_TAB OCCURS 100,
            MANDT   TYPE ZJE_AUDIT-MANDT,
            BUKRS   TYPE ZJE_AUDIT-BUKRS,
            BELNR   TYPE ZJE_AUDIT-BELNR,
            GJAHR   TYPE ZJE_AUDIT-GJAHR,
            BUZEI   TYPE ZJE_AUDIT-BUZEI,
            BUDAT   TYPE ZJE_AUDIT-BUDAT,
            CPUDT   TYPE ZJE_AUDIT-CPUDT,
            SAKNR   TYPE ZJE_AUDIT-SAKNR,
            BLART   TYPE ZJE_AUDIT-BLART,
            BSCHL   TYPE ZJE_AUDIT-BSCHL,
            GSBER   TYPE ZJE_AUDIT-GSBER,
            SGTXT   TYPE ZJE_AUDIT-SGTXT,
            DMBTR   TYPE ZJE_AUDIT-DMBTR,
            USNAM   TYPE ZJE_AUDIT-USNAM,
            TCODE   TYPE ZJE_AUDIT-TCODE,
            R_USNAM TYPE ZJE_AUDIT-R_USNAM,
            XBLNR   TYPE ZJE_AUDIT-XBLNR,
            R_GJAHR TYPE ZJE_AUDIT-R_GJAHR,
            AMOUNT(15),
          END OF I_TAB.
    SELECT * FROM ZJE_AUDIT INTO TABLE I_TAB
      WHERE BUKRS EQ P_BUKRS
         AND GJAHR EQ P_GJAHR
         AND BUDAT IN S_BUDAT
         AND SAKNR IN S_SAKNR.
    How to rectify this unicode problem.
    Pl help in this regard,
    Thanks,
    vamsykrishna

    Change the selection to:
    SELECT * FROM ZJE_AUDIT INTO CORRESPONDING FIELDS OF TABLE I_TAB
    WHERE BUKRS EQ P_BUKRS
    AND GJAHR EQ P_GJAHR
    AND BUDAT IN S_BUDAT
    AND SAKNR IN S_SAKNR.
    Regards,
    John.

  • About unicode and non-unicode

    Hi experts,
    can anybody tell me
    what is unicode and non-unicode in interview point of view.Just 2 or 3 sentences....
    Thanks in advance

    unicode is for multilingual capability in SAP system,
    apart from that important unicode t.code is uccheck if you give report name we will get different error codes,in genaral we get an error of structures miss match,obsolute statemnts,open data set,describe ststment and so on
    more over you can say we delete all obsolute function modules, look at the following it may help you
    Before the Unicode error
       lt_hansp = lt_0201-endda0(4) - lt_0002-gbdat0(4).
    Solution.
    data :abc type i,
          def type i.
    move  lt_0201-endda+0(4) to abc.
    move    lt_0002-gbdat+0(4) to def.
    lt_hansp-endda = abc - def.
    Before the Unicode error:
       WRITE: /1 'CO:',CO(110).
    Solution.
    FIELD-SYMBOLS: <fs_co> type any.
    assign co to <fs_co>.
    WRITE: /1 'CO:',<fs_co>(110).
    DESCIBE002     In Unicode, DESCRIBE LENGTH can only be used with the IN BYTE MODE or IN  CHARACTER MODE addition.
    Before the Unicode error:
        describe field <tab_feld> length len.
    Solution.
    describe field <tab_feld> length len IN character mode.
    Before the Unicode error:
        DESCRIBE FIELD DOWNTABLA LENGTH LONG.
    Solution.
    DESCRIBE FIELD DOWNTABLA LENGTH LONG IN byte MODE.
    DO 002     Could not specify the access range automatically. This means that you need a  RANGE addition     
    Before the Unicode error:
    DO 7 TIMES VARYING i FROM aktuell(1) NEXT aktuell+1(1)
    Solution.
      DO 7 TIMES VARYING i FROM aktuell(1) NEXT aktuell+1(1) RANGE aktuell .
    Before the Unicode error:
    DO 3 TIMES VARYING textfeld FROM gtx_line1 NEXT gtx_line2.
    Solution.
    DATA: BEGIN OF text,
            gtx_line1 TYPE rp50m-text1,
            gtx_line2 TYPE rp50m-text2,
            gtx_line3 TYPE rp50m-text3,
          END OF text.
    DO 3 TIMES VARYING textfeld FROM gtx_line1 NEXT gtx_line2 RANGE text..
    Before the Unicode error:
    DO ev_restlen TIMES
        VARYING ev_zeichen FROM ev_hstr(1) NEXT ev_hstr+1(1).
    Solution.
      DO ev_restlen TIMES
         VARYING ev_zeichen FROM ev_hstr(1) NEXT ev_hstr+1(1) range ev_hstr.
    MESSAGEG!2     IT_TBTCO and "IT_ALLG" are not mutually convertible. In Unicode programs, "IT_TBTCO" must have the same structure layout as "IT_ALLG", independent of  the length of a Unicode character.     
    Before the Unicode error:
             IT_TBTCO = IT_ALLG.
    Solution.
    IT_TBTCO-header = IT_ALLG-header.
    MESSAGEG!3     FIELDCAT_LN-TABNAME and "WA_DISP" are not mutually convertible in a Unicode program     
    Before the Unicode error:
         IF GEH_TA15(73) NE RETTER15(73).
    Solution.
          FIELD-SYMBOLS: <GEHTA> TYPE ANY.
                        <RETTER1> TYPE ANY.
          ASSIGN: GEH_TA TO <GEHTA>,
                  RETTER TO <RETTER>.
    IF <GEHTA>15(73) NE <RETTER>15(73).
    Before the Unicode error:
           IMP_EP_R3_30 = RECRD_TAB-CNTNT.
    Solution.
        FIELD-SYMBOLS:  <imp_ep_r3_30> TYPE X,
                          <recrd_tab-cntnt> TYPE X.
          ASSIGN IMP_EP_R3_30 TO <imp_ep_r3_30> CASTING.
          ASSIGN RECRD_TAB-CNTNT TO <recrd_tab-cntnt> CASTING.
           <imp_ep_r3_30> = <recrd_tab-cntnt>.
    Before the Unicode error:
                and    pernr  = gt_pernr
    Solution.
                  and    pernr  = gt_pernr-pernr
    MESSAGEG!7     EBC_F0 and "EBC_F0_255(1)" are not comparable in Unicode programs.     
    Before the Unicode error:
       IF CHARACTER NE LINE_FEED.
    Solution.
        IF CHARACTER NE LINE_FEED-X.
    MESSAGEG!A     A line of "IT_ZMM_BINE" and "OUTPUT_LINES" are not mutually convertible. In a  Unicode program "IT_ZMM_BINE" must have the same structure layout as  "OUTPUT_LINES" independent of the length of a Unicode character.     
    Before the Unicode error:
    *data: lw_wpbp  type pc206.
    Solution.
    data: lw_wpbp  type pc205.
    Before the Unicode error:
       LOOP AT seltab INTO  ltx_p0078.
    Solution.
    DATA: WA_SELTAB like line of SELTAB.
    CLEAR WA_SELTAB.
    MOVE-CORRESPONDING ltx_p0078 to wa_seltab.
    move-corresponding wa_seltab to ltx_p0078.
    MESSAGEG?Y     The line type of "DTAB" must be compatible with one of the types "TEXTPOOL".     
    Before the Unicode error:
    DATA:
       BEGIN OF dtab OCCURS 100.
         text(100),
    include structure textpool.
       End of changes
    SET TITLEBAR '001' WITH dtab-text+9.
    Solution.
    the following declaration should be mentioned in the declaration of the textpool.
    DATA:
       BEGIN OF dtab OCCURS 100.
      text(100),
    include structure textpool.
       End of changes
      SET TITLEBAR '001' WITH dtab-entry.
    MESSAGEG@1     TFO05_TABLE cannot be converted to a character-type field.     
    Before the Unicode error:
    WRITE: / PA0015, 'Fehler bei MODIFY'.
    Solution.
    WRITE: / PA0015+0, 'Fehler bei MODIFY'.
    MESSAGEG@3     ZL-C1ZNR must be a character-type data object (data type C, N, D, T or  STRING) .     
    Before the Unicode error:
         con_tab  TYPE x VALUE '09',
    Solution.
           con_tab  TYPE string VALUE '09',
    Before the Unicode error:
    data:   g_con_ascii_tab(1)  type x   value '09'.
    Solution.
       data:   g_con_ascii_tab  type STRING   value '09'.
    MESSAGEG@E     HELP_ANLN0 must be a character-type field (data type C, N, D, or T). an open  control structure introduced by "INTERFACE".
    Before the Unicode error:
    WRITE SATZ-MONGH TO SATZ-MONGH CURRENCY P0008-WAERS.
    WRITE SATZ-JAH55 TO SATZ-JAH55 CURRENCY P0008-WAERS.
    WRITE SATZ-EFF55 TO SATZ-EFF55 CURRENCY P0008-WAERS.
    WRITE SATZ-SOFE_EREU TO SATZ-SOFE_EREU CURRENCY P0008-WAERS.
    WRITE SATZ-SOFE_ERSF TO SATZ-SOFE_ERSF CURRENCY P0008-WAERS.
    WRITE SATZ-SOFE_ERSP TO SATZ-SOFE_ERSP CURRENCY P0008-WAERS.
    WRITE SATZ-SOFE_EIN TO SATZ-SOFE_EIN CURRENCY P0008-WAERS.
    WRITE SATZ-SOFE_EREU TO SATZ-SOFE_EREU CURRENCY P0008-WAERS.
    WRITE SATZ-ERHO_ERR TO SATZ-ERHO_ERR CURRENCY P0008-WAERS.
    WRITE SATZ-ERHO_EIN TO SATZ-ERHO_EIN CURRENCY P0008-WAERS.
    WRITE SATZ-JAH55_FF TO SATZ-JAH55_FF CURRENCY P0008-WAERS.
    Solution.
      DATA: SATZ1_MONGH(16),
            SATZ_JAH551(16),
            SATZ_EFF551(16),
            SATZ_SOFE_EREU1(16),
            SATZ_SOFE_ERSF1(16),
            SATZ_SOFE_ERSP1(16),
            SATZ_SOFE_EIN1(16),
            SATZ_ERHO_ERR1(16),
            SATZ_ERHO_EIN1(16),
            SATZ_JAH55_FF1(16).
      WRITE SATZ-MONGH TO SATZ1_MONGH CURRENCY P0008-WAERS.
      WRITE SATZ-JAH55 TO SATZ_JAH551 CURRENCY P0008-WAERS.
      WRITE SATZ-EFF55 TO SATZ_EFF551 CURRENCY P0008-WAERS.
      WRITE SATZ-SOFE_EREU TO SATZ_SOFE_EREU1 CURRENCY P0008-WAERS.
      WRITE SATZ-SOFE_ERSF TO SATZ_SOFE_ERSF1 CURRENCY P0008-WAERS.
      WRITE SATZ-SOFE_ERSP TO SATZ_SOFE_ERSP1 CURRENCY P0008-WAERS.
      WRITE SATZ-SOFE_EIN TO SATZ_SOFE_EIN1 CURRENCY P0008-WAERS.
      WRITE SATZ-ERHO_ERR TO SATZ_ERHO_ERR1 CURRENCY P0008-WAERS.
      WRITE SATZ-ERHO_EIN TO SATZ_ERHO_EIN1 CURRENCY P0008-WAERS.
      WRITE SATZ-JAH55_FF TO SATZ_JAH55_FF1 CURRENCY P0008-WAERS.
      SATZ-MONGH = SATZ1_MONGH.
      SATZ-JAH55 = SATZ_JAH551.
      SATZ-EFF55 = SATZ_EFF551.
      SATZ-SOFE_EREU = SATZ_SOFE_EREU1.
      SATZ-SOFE_ERSF = SATZ_SOFE_ERSF1.
      SATZ-SOFE_ERSP = SATZ_SOFE_ERSP1.
      SATZ-SOFE_EIN = SATZ_SOFE_EIN1.
      SATZ-ERHO_ERR = SATZ_ERHO_ERR1.
      SATZ-ERHO_EIN = SATZ_ERHO_EIN1.
      SATZ-JAH55_FF = SATZ_JAH55_FF1.
    MESSAGEG-0     VESVR_EUR must be a character-type data object (data type C, N, D, T or  STRING).     
    Before the Unicode error:
                TRANSLATE vesvr_eur USING '.,'.
                TRANSLATE espec_eur USING '.,'.
                TRANSLATE fijas_eur USING '.,'.
    Solution.
                 data: vesvreur(16),
                       especeur(16),
                       fijaseur(16).
                 vesvreur = vesvr_eur.
                 especeur = espec_eur.
                 fijaseur = fijas_eur.
                 TRANSLATE vesvreur USING '.,'.
                 TRANSLATE especeur USING '.,'.
                 TRANSLATE fijaseur USING '.,'.
                 vesvr_eur = vesvreur.
                 espec_eur = especeur.
                 fijas_eur = fijaseur.
    MESSAGEG-D     LT_0021 cannot be converted to the line incompatible. The line type must have  the same structure layout as "LT_0021" regardless of the length of a Unicode .     
    Before the Unicode error:
    data: lt_0021    like p0021 occurs 0 with header line.
    Solution.
        DATA: LT_0021 LIKE PA0021 OCCURS 0 WITH HEADER LINE.
    Before the Unicode error:
             append sim_data to p0007.
    Solution.
           DATA:wa_p0007 type p0007.
           move-corresponding sim_data to wa_p0007.
              append wa_p0007 to p0007.
    MESSAGEG-F     The structure "CO(110)" does not start with a character-type field. In Unicode  programs in such cases, offset/length declarations are not allowed      
    Before the Unicode error:
         TRANSFER COBEZ+8 TO DSN.
    Solution.
                FIELD-SYMBOLS:<fs_cobez> type any.
                TRANSFER <fs_COBEZ>+8 TO DSN.
    Before the Unicode error:
         WRITE: /1 COBEZ+16.
    Solution.
    FIELD-SYMBOLS <F_COBEZ> TYPE ANY.
    ASSIGN COBEZ TO <F_COBEZ>.
          WRITE: /1 <F_COBEZ>+16.
    MESSAGEG-G     The length declaration "171" exceeds the length of the character-type start  (=38) of the structure. This is not allowed in Unicode programs.
    Before the Unicode error:
       write: /1 '-->',
                 pa0201(250).
    Solution.
    field-symbols <fs_pa0201> type any.
    ASSIGN pa0201 TO <fs_pa0201>.
        write: /1 '-->',
                  <fs_pa0201>(250).
    MESSAGEG-H     The offset declaration "160" exceeds the length of the character-type start  (=126) of the structure. This is not allowed in Unicode programs . allowed.     
    Before the Unicode error:
    WRITE:/ SATZ(80),
             / SATZ+80(80),
             / SATZ+160(80),
             / SATZ+240(80),
             / SATZ+320(27).
    Solution.
      FIELD-SYMBOLS <FS_SATZ> TYPE ANY.
      ASSIGN SATZ TO <FS_SATZ>.
      WRITE:/ <FS_SATZ>(80),
              / <FS_SATZ>+80(80),
              / <FS_SATZ>+160(80),
              / <FS_SATZ>+240(80),
              / <FS_SATZ>+320(27).
    MESSAGEG-I     The sum of the offset and length (=504) exceeds the length of the start (=323) of the structure. This is not allowed in Unicode programs .     
    Before the Unicode error:
              /5 PARAMS+80(80),
    Solution.
        FIELD-SYMBOLS: <PARAMS> TYPE ANY.
        ASSIGN PARAMS TO <PARAMS>.
               /5 <PARAMS>+80(80),
    MESSAGEGWH     P0041-DAR01 and "DATE_SPEC" are type-incompatible.     
    Before the Unicode error:
       DO 5 TIMES VARYING I0008 FROM P0008-LGA01 NEXT P0008-LGA02.
    Solution.
        DO 5 TIMES VARYING I0008-LGA FROM P0008-LGA01 NEXT P0008-LGA02. "D07K963133
    Before the Unicode error:
       DO VARYING ls_data_aux FROM p0041-dar01 NEXT p0041-dar02.
    Solution.
         DO VARYING ls_data_aux-dar01 FROM p0041-dar01 NEXT p0041-dar02.
    MESSAGEGY/     The type of the database table and work area (or internal table) "P0050" are  not Unicode-convertible      
    Before the Unicode error:
    select * from  pa9705 client specified
            into ls_9705
    Solution.
       select * from  pa9705 client specified
              into corresponding fields of  ls_9705
    Before the Unicode error:
         select        * from  pa0202 client specified
                into ls_0202
    Solution.
           select  * from  pa0202 client specified
                  into corresponding fields of ls_0202
    OPEN   001     One of the additions "FOR INPUT", "FOR OUTPUT", "FOR APPENDING" or "FOR UPDATE" was expected.     
    Before the Unicode error:
    OPEN DATASET FICHERO IN TEXT MODE.
    Solution.
      OPEN DATASET FICHERO IN TEXT MODE FOR INPUT ENCODING NON-UNICODE.
    OPEN   002     IN... MODE was expected.     
    Before the Unicode error:
    OPEN DATASET P_OUT FOR OUTPUT IN TEXT MODE.
    Solution.
        OPEN DATASET P_OUT FOR OUTPUT IN TEXT MODE ENCODING non-unicode.
    OPEN   004     In "TEXT MODE" the "ENCODING" addition must be specified.     
    Before the Unicode error:
       open dataset dat for output in text mode.
    Solution.
         open dataset dat for output in text mode ENCODING NON-UNICODE.
    UPLO     Upload/Ws_Upload and Download/Ws_Download are obsolete, since they are not  Unicode-enabled; use the class cl_gui_frontend_services
    Before the Unicode error:
    move p_filein to disk_datei.
      CALL FUNCTION 'WS_UPLOAD'
           EXPORTING
                filename        = disk_datei
                FILETYPE        = FILETYPE
           TABLES
                DATA_TAB        = DISK_TAB
           EXCEPTIONS
                FILE_OPEN_ERROR = 1
                FILE_READ_ERROR = 2.
    Solution.
    DATA: file_name type string.
    move p_filein to file_name.
    CALL METHOD CL_GUI_FRONTEND_SERVICES=>GUI_UPLOAD
      EXPORTING
        FILENAME                = file_name
        FILETYPE                = 'ASC'
        HAS_FIELD_SEPARATOR     = 'X'
       HEADER_LENGTH           = 0
       READ_BY_LINE            = 'X'
       DAT_MODE                = SPACE
       CODEPAGE                = SPACE
       IGNORE_CERR             = ABAP_TRUE
       REPLACEMENT             = '#'
       VIRUS_SCAN_PROFILE      =
    IMPORTING
       FILELENGTH              =
       HEADER                  =
      CHANGING
        DATA_TAB                = disk_tab[]
      EXCEPTIONS
        FILE_OPEN_ERROR         = 1
        FILE_READ_ERROR         = 2
        NO_BATCH                = 3
        GUI_REFUSE_FILETRANSFER = 4
        INVALID_TYPE            = 5
        NO_AUTHORITY            = 6
        UNKNOWN_ERROR           = 7
        BAD_DATA_FORMAT         = 8
        HEADER_NOT_ALLOWED      = 9
        SEPARATOR_NOT_ALLOWED   = 10
        HEADER_TOO_LONG         = 11
        UNKNOWN_DP_ERROR        = 12
        ACCESS_DENIED           = 13
        DP_OUT_OF_MEMORY        = 14
        DISK_FULL               = 15
        DP_TIMEOUT              = 16
        NOT_SUPPORTED_BY_GUI    = 17
        ERROR_NO_GUI            = 18
        others                  = 19
    Before the Unicode error:
       CALL FUNCTION 'WS_DOWNLOAD'
            EXPORTING
                 filename = fich_dat
                 filetype = typ_fich
            TABLES
                 data_tab = t_down.
    Solution.
    data: filename1 type string,
          filetype1(10).
    move fich_dat to filename1.
    move typ_fich to filetype1.
    CALL METHOD CL_GUI_FRONTEND_SERVICES=>GUI_DOWNLOAD
      EXPORTING
        FILENAME                  = filename1
        FILETYPE                  = filetype1
        WRITE_FIELD_SEPARATOR     = 'X'
      CHANGING
        DATA_TAB                  = t_down[].
    Before the Unicode error:
    *CALL FUNCTION 'UPLOAD'
        TABLES
             DATA_TAB                =  datos
       EXCEPTIONS
            CONVERSION_ERROR        = 1
            INVALID_TABLE_WIDTH     = 2
            INVALID_TYPE            = 3
            NO_BATCH                = 4
            UNKNOWN_ERROR           = 5
            GUI_REFUSE_FILETRANSFER = 6
            OTHERS                  = 7
    Solution.
    DATA: file_table type table of file_table,
          filetable type file_table,
          rc type i,
          filename type string.
    CALL METHOD CL_GUI_FRONTEND_SERVICES=>FILE_OPEN_DIALOG
      CHANGING
        FILE_TABLE              = file_table
        RC                      = rc
    EXCEPTIONS
       FILE_OPEN_DIALOG_FAILED = 1
       CNTL_ERROR              = 2
       ERROR_NO_GUI            = 3
       NOT_SUPPORTED_BY_GUI    = 4
       others                  = 5
    READ table file_table into filetable index 1.
    move filetable to filename.
    CALL METHOD CL_GUI_FRONTEND_SERVICES=>GUI_UPLOAD
      EXPORTING
        FILENAME                = filename
        FILETYPE                = 'ASC'
        HAS_FIELD_SEPARATOR     = 'X'
       HEADER_LENGTH           = 0
       READ_BY_LINE            = 'X'
       DAT_MODE                = SPACE
       CODEPAGE                = SPACE
       IGNORE_CERR             = ABAP_TRUE
       REPLACEMENT             = '#'
       VIRUS_SCAN_PROFILE      =
    IMPORTING
       FILELENGTH              =
       HEADER                  =
      CHANGING
        DATA_TAB                = datos[]
      EXCEPTIONS
        FILE_OPEN_ERROR         = 1
        FILE_READ_ERROR         = 2
        NO_BATCH                = 3
        GUI_REFUSE_FILETRANSFER = 4
        INVALID_TYPE            = 5
        NO_AUTHORITY            = 6
        UNKNOWN_ERROR           = 7
        BAD_DATA_FORMAT         = 8
        HEADER_NOT_ALLOWED      = 9
        SEPARATOR_NOT_ALLOWED   = 10
        HEADER_TOO_LONG         = 11
        UNKNOWN_DP_ERROR        = 12
        ACCESS_DENIED           = 13
        DP_OUT_OF_MEMORY        = 14
        DISK_FULL               = 15
        DP_TIMEOUT              = 16
        NOT_SUPPORTED_BY_GUI    = 17
        ERROR_NO_GUI            = 18
        others                  = 19
    IF SY-SUBRC <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
                WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    ENDIF.
    Before the Unicode error:
    CALL FUNCTION 'DOWNLOAD'
       EXPORTING
         filename            = p_attkit
         filetype            = 'ASC'
       TABLES
         data_tab            = tb_attrkit
       EXCEPTIONS
         invalid_filesize    = 1
         invalid_table_width = 2
         invalid_type        = 3
         no_batch            = 4
         unknown_error       = 5
         OTHERS              = 6.
    Solution.
               DATA : lv_filename    TYPE string,
                       lv_filen       TYPE string,
                       lv_path        TYPE string,
                       lv_fullpath    TYPE string.
                DATA: Begin of wa_testata,
                      lv_var(10) type c,
                      End of wa_testata.
                DATA: testata like standard table of wa_testata.
                OVERLAY p_attkit WITH lv_filename.
                CALL METHOD cl_gui_frontend_services=>file_save_dialog
                  EXPORTING
                   WINDOW_TITLE         =
                   DEFAULT_EXTENSION    =
                     default_file_name    = lv_filename
                   WITH_ENCODING        =
                   FILE_FILTER          =
                   INITIAL_DIRECTORY    =
                   PROMPT_ON_OVERWRITE  = 'X'
                  CHANGING
                    filename             = lv_filen
                    path                 = lv_path
                    fullpath             = lv_fullpath
                  USER_ACTION          =
                  FILE_ENCODING        =
                  EXCEPTIONS
                    cntl_error           = 1
                    error_no_gui         = 2
                    not_supported_by_gui = 3
                    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.
                CALL FUNCTION 'GUI_DOWNLOAD'
                        EXPORTING
                        BIN_FILESIZE                    =
                          filename                        = lv_fullpath
                          filetype                        = 'ASC'
                        APPEND                          = ' '
                        WRITE_FIELD_SEPARATOR           = ' '
                        HEADER                          = '00'
                        TRUNC_TRAILING_BLANKS           = ' '
                        WRITE_LF                        = 'X'
                        COL_SELECT                      = ' '
                        COL_SELECT_MASK                 = ' '
                        DAT_MODE                        = ' '
                        CONFIRM_OVERWRITE               = ' '
                        NO_AUTH_CHECK                   = ' '
                        CODEPAGE                        = ' '
                        IGNORE_CERR                     = ABAP_TRUE
                        REPLACEMENT                     = '#'
                        WRITE_BOM                       = ' '
                        TRUNC_TRAILING_BLANKS_EOL       = 'X'
                        WK1_N_FORMAT                    = ' '
                        WK1_N_SIZE                      = ' '
                        WK1_T_FORMAT                    = ' '
                        WK1_T_SIZE                      = ' '
                      IMPORTING
                        FILELENGTH                      =
                        TABLES
                          data_tab                        = tb_attrkit
                          fieldnames                      = testata
                       EXCEPTIONS
                         file_write_error                = 1
                         no_batch                        = 2
                         gui_refuse_filetransfer         = 3
                         invalid_type                    = 4
                         no_authority                    = 5
                         unknown_error                   = 6
                         header_not_allowed              = 7
                         separator_not_allowed           = 8
                         filesize_not_allowed            = 9
                         header_too_long                 = 10
                         dp_error_create                 = 11
                         dp_error_send                   = 12
                         dp_error_write                  = 13
                         unknown_dp_error                = 14
                         access_denied                   = 15
                         dp_out_of_memory                = 16
                         disk_full                       = 17
                         dp_timeout                      = 18
                         file_not_found                  = 19
                         dataprovider_exception          = 20
                         control_flush_error             = 21
                         OTHERS                          = 22
                IF sy-subrc <> 0.
                  MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                          WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
                ENDIF.

  • RDDPURI4 not unicode compatible

    Hi guys!
    I am facing an upgrade and i have this error with the standard report RDDPURI4
    The type of the database table and work area (or internal table)
    "GT_PKTAB" are not Unicode convertible.
    The point is that, it is a standard object! I haven't found any oss note related to this object...
    any idea?
    thanks in advance,
    Aaron

    HI aaron,
    Jorge is right , You may find any substitute for the include.It would be a good idea to consult the objects where it has been used.
    Cheers.!

  • How to retreive data from  view

    hi,
    i have created a view with 8 fields. including reference unit for netwr field.
    REPORT  ZVIEWTEST.
    data: begin of itab occurs 0,
          kunnr type kunnr,
          name1 type name1,
          ort01 type ort01,
          land1 type land1,
          vbeln type vbeln,
          erdat type erdat,
          netwr type netwr,
          end of itab.
          select * from zview001 into table itab.
          loop at itab.
          write: / itab-kunnr,
                   itab-name1.
      endloop.  
    when i am executing this program i am getting syntax error.
    "the type of the database table and work area(or internal table)"itab" are not unicode convertible."
    what does it mean?

    Hi Prashanth,
    Declare the internal table with the type of View.
    Data : itab type table of zview001.
    or write select query as
    select * from zview001 into corresponding fields of itab.
    Also you can uncheck the Unicode checks active (checkbox) in the program attributes.
    {When you check that unicode checkbox, you should use an internal table without a header line. Instead you should declare a work area)
    Hope it helps...
    Lokesh Aggarwal
    Please reward appropriate points
    Message was edited by: Lokesh Aggarwal

  • Error while extracting data from Generic VBAK Table

    Hi,
    When i am extracting data from VBAK using generic extraction via tavle, i am, getting the error "Syntax error in program "SAPLXRSA ""
    What happened?
        Error in the ABAP Application Program
        The current ABAP program "SAPLRSAP" had to be terminated because it has
        come across a statement that unfortunately cannot be executed.
        The following syntax error occurred in program "SAPLXRSA " in include "ZXRSAU01
         " in
        line 159:
        "The type of the database table and work area (or internal table) "L_ST"
        "R_CE1IDEA" are not Unicode convertible. ."
    Please help me out in fixing this,
    Thansk,

    do you have an user-exit? if yes, post the code....
    did you try regenerating the entire stuff (ds, structure,...)...there might be a mismatch between the structures of datasource and the generated extraction program....
    M.

  • Regardig error while updating the database table

    hi experts,
       i m trying to update the database table from the values containig in my internal table  ,,,but the system is giving this error plz help me::::
    The type of the database table and work area (or internal table)
    "ITAB_UPDATE" are not Unicode convertible. Unicode convertible.          
    my internal table name itab_update and the database table name yitab.i m using this statement::
        modify yitab from itab_update.

    Hi
    1. You  have to Declare the Itab with the same structure as DB table.
    2. Use the statement
        Modify <DBtable> from TABLE <itab>.
    or
       Update <DBtable> from TABLE <itab>.
    Hope this will solve.
    Reward .....if so.
    Regards.

Maybe you are looking for

  • Ipad 4 Retina display keeps freezing and reboots

    the past week my Ipad 4 has been having problems with freezing and rebooting. I deleted a game app which I thought was the problem and now when I use my email app it will start to freeze then reboot. Of course my warranty has just run out when this h

  • How to upload RAW images from Nikon 600 into Elements 11?

    Hi recently purchased Elements 11 and cannot load Raw images from also recently purchased Nikon D600. Is there a download and if so where is it and how does it work? Many thanks in advance trevor

  • Transmission error in SAPSCRIPTS

    Hai guys, I copy MEDRUCK form from client 000, save it in zmedruck. Then, i goto NACE>EF>OUTPUTTYPES>NEU>PROCESSINGROUTINES. next i select medium1 ,write ZMEDRUCK in form name and save press. Here, i get following message-- 'NEU(transmission message

  • Purchase limit for in app purchases

    Ive been playing clash of clans for a while now, and its really annoying if i buy the $100 pack of gems more then three times then i cant purchase it anymore, it tells me to contact itunes support for further assiatance, and ive did that and same thi

  • N85 video recording problem

    hi, I´ve got a serious problem with my N85. When I try to record a video in high-TV-quality(to my microSD card) it starts to lag extremely after about 8 sec., same problem with normal TV-quality after 30 sek.. Another interesting part is that after I