CX_SY_CONVERSION_NO_NUMBER dump.

Hi all,
I have an issue while i move a string field to WRBTR field.
I have a form in which an int table is passed. It has a field of Char255 length.
This is moved to string field. All the commas and periods are replaced with spaces.
Later this is moved to WRBTR field. It gives dump here as
Unable to interpret "000 " as a number.
It seems there is an extra space at the end of the number in the string field.
I have tried CONDENSE WITH NO GAPS the string field and the same with the char255 field too with no success.
Eg code :
DATA : tt_inp TYPE STANDARD TABLE OF  itcsy,
            ls_intab   TYPE itcsy,
           lv_wrbtr TYPE wrbtr,
            lv_wrbtr_char TYPE string.
FORM zztest TABLES itab TYPE tt_inp.
  READ TABLE in_tab INTO ls_intab WITH KEY name = 'BSIK-WRBTR'.
  IF sy-subrc EQ 0.
    lv_wrbtr_char = ls_intab-value.
  ENDIF.
CONDENSE lv_wrbtr_char.
REPLACE ALL OCCURRENCES OF '.' IN lv_wrbtr_char WITH ''.
  REPLACE ALL OCCURRENCES OF ',' IN  lv_wrbtr_char WITH ''.
lv_wrbtr = lv_wrbtr_char.  (giving dump in this statement)
ENDFORM.
Please find above the code which is resulting in error. when passing the data from ls_intab-value to lv_wrbtr_Char an extra blank is getting appended at the end. Tried all options as CONDENSE WITH NO GAPS, SHIFT, PACK etc.
Please help me in this regard.
Thanks,
Prasad

Hi,
The problem is not with the move statement but with thr replace logic you are using.
REPLACE ALL OCCURRENCES OF '.' IN lv_wrbtr_char WITH ','.
REPLACE ALL OCCURRENCES OF ',' IN lv_wrbtr_char WITH '.'.
First you replace . with ,. This time the string has values with comma.
next you replace comma with dots . this time the string may contain two or more dots converting the comma as changed recently also.
commas in inappropriate palces will cause the dump.
Try modfying the logic for proper separation.Make sure that the number you get after all replacement is a valid SAP number.
Like, 12,345.50 is your input.
your output to be put in wrbtr field should be 12.345,50.
With the current logic it becomes: 12,345,50
and then 12.345.50  which is not a valid number. that is why it gives dump.
change your logic like this.
DATA : tt_inp TYPE STANDARD TABLE OF itcsy,
ls_intab TYPE itcsy,
lv_wrbtr TYPE wrbtr,
lv_offset type i,
lv_numc type n length 16,
lv_wrbtr_char TYPE string,
itab like tt_inp,
result type MATCH_RESULT_TAB with header line.
lv_wrbtr_char = '  12,456.00'.
CONDENSE lv_wrbtr_char no-gaps.
find '.' in lv_wrbtr_char match offset lv_offset.
REPLACE ALL OCCURRENCES OF ',' IN lv_wrbtr_char WITH '.'.
if lv_offset is not initial.
replace section offset lv_offset length 1 of lv_wrbtr_char with ',' .
endif.
lv_numc = lv_wrbtr_char.
lv_wrbtr = lv_numc.
write lv_wrbtr.
Here i have assumed that the user data in sAP system has decimal format as 1.234.456,00
Regards,
Kamini Rawat

Similar Messages

  • CX_SY_CONVERSION_NO_NUMBER dump coming

    CX_SY_CONVERSION_NO_NUMBER dump appears when key is sleected in transaction WTYRCL.
    Unable to interpret " " as a number.
    An exception occurred that is explained in detail below.
    The exception, which is assigned to class 'CX_SY_CONVERSION_NO_NUMB
      caught in
    procedure "CONVERSION_IN2EX" "(FORM)", nor was it propagated by a R
      clause.
    Since the caller of the procedure could not have anticipated that t
    exception would occur, the current program is terminated.
    The reason for the exception is:
    The program attempted to interpret the value " " as a number, but
    since the value contravenes the rules for correct number formats,
    this was not possible.
    What could be possible reason for this ?

    Theres 612 notes about this and 21 about CONVERSION_IN2EX
    Did you look at them?...
    Regards
    Juan

  • CONVT_NO_NUMBER , CX_SY_CONVERSION_NO_NUMBER  dump in a zreport.

    Hi  gurus,
                   we have a custom report which retrieves the data from table TSP03 from backend and synchronise if there is change in the data in SRM table  ZHTSP03. currently this report is generating dump CONVT_NO_NUMBER  , with short text
    Unable to interpret "IlFQ" as a number. 
    i have checked all data in TSP03  but there is no string like "IlFQ" . in the code the dump is occuring at the below syntax.
                                                                                    >>>>>          CALL TRANSFORMATION id                                                                               
    SOURCE table = <tab>                                                                               
    RESULT table = data.     
    i have checked the entries of internal table <tab> which is the entries of table TSP03 and could not know why this dump is happening.
    the data type for <tab> is type standard table  AND
                                  data is type data.
    Please help
    Thanks and Regards
    Aditya Shrivastava

    Hi ,
            the code where the dump is getting is
    call transformation id
          source table  =  <tab>
          result   table  = data.                                
    Thanks
    Aditya
    Edited by: Aditya Shrivastava on Mar 16, 2010 4:17 PM
    Edited by: Aditya Shrivastava on May 4, 2010 8:19 AM

  • Function EXCEL_OLE_STANDARD_DAT Dump CX_SY_CONVERSION_NO_NUMBER

    Hi everybody,
    We are migrating R/3 from 4.6 to 5.0, when executing Z's programs using function 'EXCEL_OLE_STANDARD_DAT' in the new version it ends in a short dump CX_SY_CONVERSION_NO_NUMBER, that's because de field of the data table for the column in excel is an integer, and de the header for this column is text, can anybody help with this problem.
    Thanks in advance,
    Julio Cesar

    Please refer to Note 721793 - Problems with MS_EXCEL_OLE_STANDARD_DAT.
    - Guru
    Reward points for helpful answers

  • Error in Moving values to field symbols. - CX_SY_CONVERSION_NO_NUMBER

    Hi Friends,
    I have asigned the component 'ICON' to the field symbol . While i am adding the value to the field symbol it is going for Dump.
    Erro Message :
    Unable to interpret "@08\QGreen Light; Go; Okay@ " as a number.
    Error analysis
        An exception occurred that is explained in detail below.
        The exception, which is assigned to class 'CX_SY_CONVERSION_NO_NUMBER', was not
         caught and
        therefore caused a runtime error.
        The reason for the exception is:
        The program attempted to interpret the value "@08\QGreen Light; Go; Okay@ " as
         a number, but
        since the value contravenes the rules for correct number formats,
        this was not possible.
    Code :
      ASSIGN COMPONENT 'ICON' OF STRUCTURE <line> TO <fs_icon>.
      add wa_result-icon to <fs_icon>.
    Please find the information and i waiting for your valuable anwers.
    Thanks,
    Shankara Narayan

    HI,
    What do you mean by adding the value?
    Do you want to move the value of wa_result-icon to the field-symbols <fs_icon>.
    use move statement or use '=' operator.
    ADD will try to do an addition.
    You cannot add character fields. It will surely give a dump.
    Do as follows:-
    Move wa_result-icon to <fs_icon>.
    Regards,
    Ankur Parab

  • F-44 vendor clearing dump

    Dear All,
    Runtime Errors         CONVT_NO_NUMBER
    Exceptn                CX_SY_CONVERSION_NO_NUMBER
    Date and Time          03.12.2009 12:08:30
    ShrtText
         Unable to interpret "*0" as a number.
    What happened?
         Error in ABAP application program.
         The current ABAP program "SAPLFWTH" had to be terminated because one of the
         statements could not be executed.
         This is probably due to an error in the ABAP program.
    Error analysis
         An exception occurred. This exception is dealt with in more detail below
         . The exception, which is assigned to the class 'CX_SY_CONVERSION_NO_NUMBER',
          was neither
         caught nor passed along using a RAISING clause, in the procedure
          "FI_WT_COLLECT_KONTAB" "(FUNCTION)"
         .     Since the caller of the procedure could not have expected this exception
          to occur, the running program was terminated.
         The reason for the exception is:
         The program attempted to interpret the value "*0" as a number, but
         since the value contravenes the rules for correct number formats,
         this was not possible.
    Trigger Location of Exception
        Program                                 SAPLFWTH
        Include                                 LFWTHU03
        Row                                     144
        Module type                             (FUNCTION)
        Module Name                             FI_WT_COLLECT_KONTAB
    Source Code Extract
    Line  SourceCde
      114     h_tabix = sy-tabix.
      115     WHILE sy-subrc = 0.
      116       APPEND wa_with_item TO x_with_item.
      117       APPEND h_tabix.
      118       h_tabix = h_tabix + 1.
      119       READ TABLE <x_with_item> INDEX h_tabix
      120                                INTO wa_with_item.
      121       IF wa_with_item-bukrs NE i_bukrs OR
      122          wa_with_item-belnr NE i_belnr OR
      123          wa_with_item-gjahr NE i_gjahr OR
      124          wa_with_item-buzei NE i_buzei.
      125         EXIT.
      126       ENDIF.
      127     ENDWHILE.
      128   ENDIF.
      129   DESCRIBE TABLE x_with_item.
      130   IF sy-tfill < 1.
      131
      132     move-corresponding I_KONTAB_KEY to lv_kontab_with.
      133     lv_kontab_with-lines = 0.
      134     collect lv_kontab_with.
      135     export lv_kontab_with to memory id i_wt_kontab_id.
      136     exit.
      137   endif.
      138
      139 *--- init highest group
      140   CLEAR MAX_GROUP.
      141
      142 *----
    get highest group number
      143   LOOP AT X_KONTAB_WITH.
    >>>>>     MOVE X_KONTAB_WITH-QSSKZ TO H_COUNTER0.
      145     IF H_COUNTER0 > MAX_GROUP.
      146       MAX_GROUP = H_COUNTER0.
      147     ENDIF.
      148     READ TABLE wt_types WITH KEY witht = x_kontab_with-witht.
      149     IF sy-subrc <> 0.
      150       wt_types-witht = x_kontab_with-witht.
      151       APPEND wt_types.
      152     ENDIF.
      153   ENDLOOP.
      154
      155   MOVE-CORRESPONDING i_kontab_key TO lv_kontab_with.
      156   READ TABLE lv_kontab_with WITH KEY koart = lv_kontab_with-koart
      157                                      bukrs = lv_kontab_with-bukrs
      158                                      konko = lv_kontab_with-konko.
      159   IF sy-subrc <> 0.
      160     CALL FUNCTION 'FI_WT_DETERM_RELEVANT_TYPES'
    161          EXPORTING
    162               i_bukrs          = lv_kontab_with-bukrs
    163               i_acct           = lv_kontab_with-konko
    I am getting this dump how do we rectify the same.
    Regards,
    Teja

    Refer SAP notes : 427366 , 442304, 174604

  • CX_SY_CONVERSION_NO_NUMBER

    Hi,
    I´m trying to prin a Form and it throws the following dump:
    An exception occurred that is explained in detail below.          
    The exception, which is assigned to class 'CX_SY_CONVERSION_NO_NUMB
      caught in                                                        
    procedure "OBTENER_COD_BARRA" "(FORM)", nor was it propagated by a
      clause.                                                          
    Since the caller of the procedure could not have anticipated that t
    exception would occur, the current program is terminated.         
    The reason for the exception is:                                  
    The program attempted to interpret the value "X" as a number, but 
    since the value contravenes the rules for correct number formats, 
    this was not possible.                                            
    data
    w_sum_impar  type i,
    w_sum_par type i,
    w_nro,
    w_barra_aux(39)  TYPE c,
    wa_barra39(39)   TYPE c,
    271   MOVE: j_1apacd-j_1apac TO wa_pracd,             
    272         j_1apacd-j_1apacvd TO wa_ent-value.       
    273                                                   
    274                                                   
    275   MOVE wa_ent-value TO wa_vdpcd.                  
    276                                                   
    277 *concatenamos los valores necesarios              
    278   CONCATENATE wa_cuit wa_j_1aoftp wa_xblnr+0(4)   
    279               wa_pracd wa_vdpcd                   
    280          INTO wa_barra39.                         
    281                                                   
    282 * Obtener el dígito verificador.                  
    283   CLEAR:  w_pos,                                  
    284           w_nro,                                  
    285           w_sum_impar,                            
    286           w_sum_par,                              
    287           w_sum_total,                            
    288           w_ultimo,                               
    289           w_dig_ver.                              
    290                                                   
    291   w_barra_aux = wa_barra39.                       
    292                                                   
    293   DO 39 TIMES.                                    
    294                                                   
    295     w_nro = w_barra_aux+0(1).                     
    296     w_pos = sy-index.                             
    297     w_pos = w_pos MOD 2.                          
    298                                                   
    299     IF w_pos = 1.                                 
    300 *Acumulamos los valores de las posiciones impares.
    >>>>       w_sum_impar = w_sum_impar + w_nro.          
    302 *Acumulamos los valores de las posiciones pares.  
    303     ELSE.

    Ciao Lucila,
    you can  avoid the dump using a try catch statment.
    data ex type ref to CX_SY_CONVERSION_NO_NUMB.
    try.
    w_sum_impar = w_sum_impar + w_nro.
    catch CX_SY_CONVERSION_NO_NUMB into ex.
    catch.
    **Put here some code to manage the error. For example a write, or a pop-up or exit
    ** from the program.
    endtry.
    The reason because you have an 'X' in your field w_nro (I think it is this one) depend on the initial concatenate.
    I hope this can help u.
    Bye

  • CX_SY_CONVERSION_NO_NUMBE

    Hi All,
    we are getting a short dump, can you please help me with this:
    Runtime Errors         CONVT_NO_NUMBER
    Exception              CX_SY_CONVERSION_NO_NUMBER
    An exception occurred that is explained in detail below.
    The exception, which is assigned to class 'CX_SY_CONVERSION_NO_NUMBER', w
    caught in
    procedure "SEL_BINPUT" "(FORM)", nor was it propagated by a RAISING clause.
    Since the caller of the procedure could not have anticipated that the
    exception would occur, the current program is terminated.
    The reason for the exception is:
    The program attempted to interpret the value "1,131.64 " as a number, but
    since the value contravenes the rules for correct number formats,
    this was not possible.
    Whole numbers are represented in ABAP as a sequence of numbers, possibly
    with an algebraic sign.
    The following are the possibilities for the representation of floating
    point numbers:
      [algebraic sign][mantissa]E[algebraic sign][exponent]
      [algebraic sign][whole number part].[fraction part]
    For example, -12E+34, +12E-34, 12E34, 12.34
    If the error occurred in your own ABAP program or in an SAP
    program you modified, try to remove the error.
    If the error occures in a non-modified SAP program, you may be able to
    find an interim solution in an SAP Note.
    If you have access to SAP Notes, carry out a search with the following
    keywords:
    "CONVT_NO_NUMBER" "CX_SY_CONVERSION_NO_NUMBER"
    "SAPMF05B" or "MF05BFS0"
    "SEL_BINPUT"
    I looked into the notes but couldn't find any.
    any help will be really appreciated.
    Thank you.
    Rajeev Gupta

    Hi Rajeev,
    1,131.64 looks like the external (US-english) representation of a number. This cannot be implicitly converted to a numeric fomat.
    You can convert the value before moving it to the target. We do this as follows (generic solution). Usulayy we use it for generic handling of editable grid input, but it could help in your context:
    DATA:
        lv_type       TYPE string,
        lr_dat        TYPE REF TO data,
        ls_tabfield   TYPE tabfield,
        lv_tabname    TYPE tabname,
        lv_fieldname  TYPE fieldname,
        lv_field TYPE scrfname.
      FIELD-SYMBOLS:
        <dat> TYPE ANY.
    * find any structure or table field with characteristics for the internal value
        ls_tabfield-tabname = <table or structure of target field>.
        ls_tabfield-fieldname = <fieldname in above structure or table>.
        CONCATENATE <tbn> <col>
          INTO lv_type SEPARATED BY '-'.
    * create a data object of the required type
        CREATE DATA lr_dat TYPE (lv_type).
        ASSIGN lr_dat->* TO <dat>.
        CALL FUNCTION 'RS_CONV_EX_2_IN'
          EXPORTING
             input_external                     = <Input value in external representation>
             table_field                        = ls_tabfield
    *       CURRENCY                           = CURRENCY
          IMPORTING
            output_internal                    = <dat>
          EXCEPTIONS
    * handle any error
    Regards,
    Clemens

  • Dump problem while remote FM call

    Hello Experts,
    In R3 system there is a RFC Fm Z_SALESORDER_CREATE which is wrapper of standard FM SD_SALESDOCUMENT_CREATE. When we do remote call from CRM system for Z_SALESORDER_CREATE. Its given dump as follows:
    Short text                                                                        
        "Unable to interpret 2,00 as a number."                                                                               
    What happened?                                                                    
        Error in the ABAP Application Program                                                                               
    The current ABAP program "Z_CREATE_ORDER_WITH_JOB_VRNT" had to be terminated  
         because it has                                                               
        come across a statement that unfortunately cannot be executed.                                                                               
    The error occurred during an RFC call to another system.                      
        In the target system, a short dump has been written as well.                  
        More detailed information on the error cause can be found there.                                                                               
    Error analysis                                                                    
        An error occurred when executing a REMOTE FUNCTION CALL.                      
        It was logged under the name "CONVT_NO_NUMBER"                                
        on the called page.                                                                               
    We are not using 2,00 anymore...it is something changed format while compiling..
    It cause dump in R3  also..dump desc in r3 as follows
    Unable to interpret " 2,00" as a number.                                                                               
    What happened?                                                                               
    Error in ABAP application program.                                                                               
    The current ABAP program "SAPLSTS4" had to be terminated because one of the
    statements could not be executed.                                                                               
    This is probably due to an error in the ABAP program.                                                                               
    Error analysis                                                                               
    An exception occurred. This exception is dealt with in more detail bel
    . The exception, which is assigned to the class 'CX_SY_CONVERSION_NO_NUMBER
    was neither                                                         
    caught nor passed along using a RAISING clause, in the procedure     
    "CONVERSION_EXIT_TSTRG_OUTPUT" "(FUNCTION)"                         
    Since the caller of the procedure could not have expected this excepti
    to occur, the running program was terminated.                       
    The reason for the exception is:                                     
    The program attempted to interpret the value " 2,00" as a number, but
    since the value contravenes the rules for correct number formats,    
    this was not possible.                                                                               
    How to correct the error                                                                               
    The exception must either be prevented, caught within the procedure  
    "CONVERSION_EXIT_TSTRG_OUTPUT"                                      
    "(FUNCTION)", or declared in the procedure's RAISING clause.         
    To prevent the exception, note the following:                        
    Integers are represented in ABAP using a sequence of digits and, in so
    cases, a preceding sign.                                            
    The system offers the following options for displaying floating point
    numbers:                                                             
      [sign][mantissa]E[sign][exponent]                                  
      [sign][whole number part].[fractional part]                        
    e.g. -12E+34, +12E-34, 12E34, 12.34                                                                               
    If the error occurred in one of your own programs or in an SAP program          
    that you modified, try to correct it yourself.                                                                               
    You may able to find an interim solution to the problem                         
    in the SAP note system. If you have access to the note system yourself,         
    use the following search criteria:                                                                               
    "CONVT_NO_NUMBER" CX_SY_CONVERSION_NO_NUMBERC                                   
    "SAPLSTS4" or "LSTS4U01"                                                        
    "CONVERSION_EXIT_TSTRG_OUTPUT"                                                  
    Please help me to solve ths problem as soon as possible..
    thanks in advance for you quick response.
    Anutosh

    Hi
    Check your defined data types which you are passing to FM and exact FM data types.
    I hope that's the problem .
    Regards,
    Sree

  • FM SO_NEW_DOCUMENT_SEND_API1 short dump

    hello experts,
    im using the FM SO_NEW_DOCUMENT_SEND_API1 to send email. my program encounters short dump.
    here is my code:
    * p_text_alert = The Maximum Blocked Time limit has been exceeded for DL13LT. in 0082
    * lt_receptores-rec_id = AVISOLOG0082
    * text-006 = doesnt matter
    Data: lv_obj_desc TYPE SODOCCHGI1.
      Data: lt_receptores TYPE somlreci1 OCCURS 0 WITH HEADER LINE,
               lt_cuerpo     TYPE solisti1  OCCURS 0 WITH HEADER LINE.
      REFRESH lt_receptores.
      concatenate 'AVISOLOG' p_werks Into lt_receptores-receiver.
      lt_receptores-rec_id   = lt_receptores-receiver.
      lt_receptores-rec_type = 'U'.
      APPEND lt_receptores.
      REFRESH lt_cuerpo.
      lt_cuerpo-line = ( p_text_alert ).
      APPEND lt_cuerpo.
      Clear lv_obj_desc.
      lv_obj_desc-obj_descr = text-006.
      CALL FUNCTION 'SO_NEW_DOCUMENT_SEND_API1'
        EXPORTING
          document_data           = lv_obj_desc
          commit_work             = 'X'
        TABLES
          object_content          = lt_cuerpo
          receivers               = lt_receptores.
    this is the description of the dump:
    "    Unable to interpret "The Maximum Blocked Time limit has been " as a number.    "
    error analysis:
    "  An exception occurred that is explained in detail below.                            
      The exception, which is assigned to class 'CX_SY_CONVERSION_NO_NUMBER', was not     
       caught in                                                                          
      procedure "F_SEND_VIOLATION_MAIL" "(FORM)", nor was it propagated by a RAISING      
       clause.                                                                               
    Since the caller of the procedure could not have anticipated that the               
      exception would occur, the current program is terminated.                           
      The reason for the exception is:                                                    
      The program attempted to interpret the value "The Maximum Blocked Time limit        
       has been " as a number, but                                                        
      since the value contravenes the rules for correct number formats,                   
      this was not possible.  "
    what canbe the cause of the dump?
    thanks a lot for future replies.

    Hi,
    This code might be helpful...
    CLEAR: gs_packing_list,
             gs_reclist.
      REFRESH: gt_packing_list[],
               gt_reclist[].
    * Fill the document data.
      DESCRIBE TABLE gt_message LINES gv_cnt.
      READ TABLE gt_message INTO gs_message
                                    INDEX gv_cnt.
      gs_doc_chng-doc_size   = ( gv_cnt - 1 ) * 255 + STRLEN( gs_message ).
      gs_doc_chng-obj_langu  = sy-langu.
      gs_doc_chng-obj_name   = 'CONJOB'.
      gs_doc_chng-obj_descr  = text-017.
      gs_doc_chng-sensitivty = 'F'.
    * Fill the receiver list
      gs_reclist-rec_date    = sy-datum.
      gs_reclist-rec_type    = 'U' .         " For Internet Address
      gs_reclist-com_type    = 'INT'.
      gs_reclist-notif_ndel  = c_x.
      gs_reclist-receiver    = p_email.       "Email addr of Recip
      APPEND gs_reclist TO gt_reclist.
      CLEAR gs_reclist.
      gs_packing_list-transf_bin = space.
      gs_packing_list-head_start = 1.
      gs_packing_list-head_num   = 0.
      gs_packing_list-body_start = 1.
      DESCRIBE TABLE gt_message LINES gs_packing_list-body_num.
      gs_packing_list-doc_type   = 'RAW'.
      APPEND gs_packing_list TO gt_packing_list.
      gs_packing_list-transf_bin = c_x.
      gs_packing_list-head_start = 1.
      gs_packing_list-head_num   = 0.
      gs_packing_list-body_start = 1.
      DESCRIBE TABLE pt_attachment LINES gs_packing_list-body_num.
      gs_packing_list-doc_type   = 'RAW'.
      gs_packing_list-obj_descr  = gv_atch_name.
      gs_packing_list-obj_name   = gv_atch_name.
      gs_packing_list-doc_size   = gs_packing_list-body_num * 255.
      APPEND gs_packing_list TO gt_packing_list.
    * Send the document
      CALL FUNCTION 'SO_NEW_DOCUMENT_ATT_SEND_API1'
           EXPORTING
                document_data              = gs_doc_chng
                put_in_outbox              = c_x
           TABLES
                packing_list               = gt_packing_list
                contents_txt               = gt_message
                contents_bin               = pt_attachment
                receivers                  = gt_reclist
           EXCEPTIONS
                too_many_receivers         = 1
                document_not_sent          = 2
                document_type_not_exist    = 3
                operation_no_authorization = 4
                parameter_error            = 5
                x_error                    = 6
                enqueue_error              = 7
                OTHERS                     = 8.
    Regards
    Milan

  • Dump in source system?

    Hi all ,
    i am loading the master data attributes full load , i got the short dump error in source system
    says that ,
    Job termination in source system
    Diagnosis
    The background job for data selection in the source system has been terminated. It is very likely that a short dump has been logged in the source system
    Procedure
    Read the job log in the source system. Additional information is displayed here.
    To access the job log, use the monitor wizard (step-by-step analysis)  or the menu path <LS>Environment -> Job Overview -> In Source System
    Error correction:
    Follow the instructions in the job log messages.
    in the ST22  the error message is
    unable to interpret  "99.79 kg " as a number .
    my questions is how to identify  that particular record in source system , and how to correct it .
    Thanks ,

    Error analysis                                                                                |
    An exception occurred that is explained in detail below.
    The exception, which is assigned to class 'CX_SY_CONVERSION_NO_NUMBER', was not
    caught in
    procedure "PUT_INTO_DATA" "(FORM)", nor was it propagated by a RAISING clause.
    Since the caller of the procedure could not have anticipated that the
    exception would occur, the current program is terminated.
    The reason for the exception is:
    The program attempted to interpret the value "99.79 kg " as a number, but
    since the value contravenes the rules for correct number formats,
    |    this was not possible. 
    Thanks

  • Short dump on calculating percentage

    hi experts,
       i'm trying to calculate for the total salary based on the reference value.
    but when i'm retrieving the PTOT(totalsalary) for calculation ,i got into short dump CONVT_NO_NUMBER or CX_SY_CONVERSION_NO_NUMBER.
    It's unable to interpret "PTOT(ASSUME  '134,475.81')" as a number.
    HERE i've given my logic what i used.
    if anyone knows plz help me.
    Table for collection of data. Used in hr_basic_display_list.
    DATA: BEGIN OF DATA_TAB OCCURS 20,
            PERNR(8), WGTYP(10), WTEXT LIKE T512T-LGTXT,
            APR(12), MAY(12), JUN(12), JUL(12),AUG(12), SEP(12),
            OCT(12), NOV(12), DEC(12),JAN(12), FEB(12), MAR(12), ptot(15),
            LANGTEXT1(60), LANGTEXT2(60), LANGTEXT3(60), LANGTEXT4(60),
            SORTEXT(250),
    END OF DATA_TAB.
    DATA:BEGIN OF ITAB_PER OCCURS 0,
         PERCENT(15),         “The field to be added in the output ALV screen                                                                                END OF ITAB_PER.              to calulate percentage                     
    .”enhanced fields in            .                                              selection screen of report HINCANN0
    PARAMETERS : P_PERCEN(15) , “the reference field
      LOOP AT DATA_TAB.                                       "changes
    ITAB_PER-PERCENT = ( DATA_TAB-PTOT / P_PERCEN ) * 100.
        APPEND ITAB_PER.
        CLEAR ITAB_PER.
        ENDLOOP.

    Hi Siva
    Change the type of PERCENT to dec instead of Char.
    ~BiSu

  • Lock ups and dumping psyical memory!!!

    Hi i have just installed a new pc most of the stuff im useing is from my old computer so i know they work fine im running a:
    P4 3GHZ Prescot 800MHz, HT-Enabled
    865PE Neo2-P
    512 DDR-400 Twin moss
    ATI Radeon 9000 pro
    PSU-400
    XP Pro
    My computer locks up alot when running intense games (games have worked before no problem) i also get a error saying dumping pysical memory, i have looked about and tried to solve this myself, i found that someone was haveing the exact same problem as me and he fixed it by turning the FSB down as his memory wasnt compatable with his motherboard if doing that works how do i do it ?
    Many thanks Jonathan

    Flappa, Your memory " clock" is fine and there is no need to "underclock it" as long as you did not mess with the Bios.
    I had the same problems. I could not even get thru a Clean install of windows as it would Blue Screen
    1- are you running in " Dual Channel Mode"?
    2- If so is your memory a " match Set"?
    some times memory even thought it has the same markings is not matched . Dual channel sets are matched and made to run together in "Dual Channel Mode"{
    ( Even though I had the same manufacturer memory my set would not run in Dual Channel without " Blue Screening" I bought a Matched Set of Kingston Valueram and have not had a problem since
    3- If it is not a matched set, pull one stick out and run it for a while , if it still bluescreens try the other stick
    4- raise your memory voltage to 2.7 or 2.8 ( which ever is the lowest that it runs stable)
    5- If all this does not work , run MEMTEST to see if there is a problem with both sticks
    6- you are running a Bios Version that supports the " Prescott Microcode" right?
    Let us know what your findings are
    Good Luck  
    Dave

  • Report J_1IEWT_CERT getting cancelled, generating ABAP dump!

    A long running report J_1IEWT_CERT in background mode is getting cancelled after running for a while and generating the following dump :
    Error analysis
        When changing or deleting one or more lines of the internal table
        "\PROGRAM=J_1IEWT_CERT\DATA=PRINTTAB[]" or when inserting in the table
         "\PROGRAM=J_1IEWT_CERT\DATA=PRINTTAB[]", 0 was used as
        the line index. An index less than or equal to zero is not
        allowed.
        The error can occur when using the following options:
        1. "INDEX idx" for specifying the line number in the table
         "\PROGRAM=J_1IEWT_CERT\DATA=PRINTTAB[]"
           where you want to change, insert or delete.
        2. "FROM idx" for specifying the start index when deleting a line
           area from or inserting a line area into the table
         "\PROGRAM=J_1IEWT_CERT\DATA=PRINTTAB[]".
        3. "TO idx" for specifying the end index when deleting a line
           area from or inserting a line area into the table
         "\PROGRAM=J_1IEWT_CERT\DATA=PRINTTAB[]".
        At the time of the termination, the table contained 17008 lines.
    How to correct the error
        If the error occurred in your own ABAP program or in an SAP
        program you modified, try to remove the error.
        If the error occures in a non-modified SAP program, you may be able to
        find an interim solution in an SAP Note.
        If you have access to SAP Notes, carry out a search with the following
        keywords:
        "TABLE_INVALID_INDEX" " "
        "J_1IEWT_CERT" or "J_1IEWT_CERT_F01"
        "FILTER_DATA"
        If you cannot solve the problem yourself and want to send an error
        notification to SAP, include the following information:
        1. The description of the current problem (short dump)
           To save the description, choose "System->List->Save->Local File
        (Unconverted)".
        2. Corresponding system log
           Display the system log by calling transaction SM21.
           Restrict the time interval to 10 minutes before and five minutes
        after the short dump. Then choose "System->List->Save->Local File
        (Unconverted)".
        3. If the problem occurs in a problem of your own or a modified SAP
        program: The source code of the program
           In the editor, choose "Utilities->More
        Utilities->Upload/Download->Download".
    Tried searching for some SAP Notes to fix the issue, no success as of now, Please help me out...

    Have you checked these notes ?
    363107 Short dump occurs during TDS certificate printing.
      803806  Error while genrating TDS certificate 03.01.2005
      1066049  J1INCERT - Error while generating TDS certificate
    Regards,
    Subhash

  • Short dump 'Table does not exist in database'

    Hello All,
    When a report is executing it is going to short dump by saying 'Table does not exist in database'. As per the short dump analysis this issue is happening because of the following   Native SQL statement statement :
    Program :  %_T050N0 (This is a dynamic  program generating by SAP )
    Form Name :  DYN_LIC_SEL_TOT
    exec sql performing LOOP_MOVE_WRITE_ISAP.
    select single_plate, itm_num, ctry_code, model_lot,
    lic_hold_flg, qty into :dcat-lplate, :dcat-matnr,
    :dcat-werks, :dcat-charg, :dcat-holdflag,
    :dcat-qty from ZLICENSE_R2 where itm_num   = :p_matnr and
                    model_lot = :p_charg
    endexec.
    As per the customer this issue occurring since they migrated the SAP  back-end data base from Oralce to DB6. Here I felt that ZLICENSE_R2 is not migrated from the  Oracle to DB6. But as per the BASIS Team, even this table was not maintained in Oracle also. If the table was not maintained in the Oracle, this issue should have been there even before migration also.
    Following is the short dump details:
    Short text
        Table does not exist in database.
    What happened?
        The table or view name used does not
        exist in the database.
        The error occurred in the current database connection "DEFAULT".
    What can you do?
        Check the spelling of the table names in your report.
        Note down which actions and inputs caused the error.
        To process the problem further, contact you SAP system
        administrator.
        Using Transaction ST22 for ABAP Dump Analysis, you can look
        at and manage termination messages, and you can also
        keep them for a long time.
    Error analysis
        An exception occurred that is explained in detail below.
        The exception, which is assigned to class 'CX_SY_NATIVE_SQL_ERROR', was not
         caught in
       procedure "DYN_LIC_SEL_TOT" "(FORM)", nor was it propagated by a RAISING
    clause.
    Since the caller of the procedure could not have anticipated that the
    exception would occur, the current program is terminated.
    The reason for the exception is:
    Triggering SQL statement: "select single_plate, itm_num, ctry_code, model_lot,
    lic_hold_flg, qty from ZLICENSE_R2 where itm_num = ? and model_lot = ? "
    Database error code: "-204"
    Could you please  let me know what might be the reason for this issue.
    Many Thanks in Advance.

    Transaction SE11, input ZLICENSE_R2 for table name, and display the table. Did the table display? If not, that is the main problem.
    If the table displays, go to menu item Utilities -> Database Object -> Database Utility
    In the resulting screen, under the "Status" fields, you should see text "Exists in the database." If you don't, then the table exists in the dictionary, but doesn't exist in the database system. Click the "Create database table" button and then you should be able to run the program.
    You may need basis team's help to carryout some of these actions.

Maybe you are looking for