Assign field symbols in infotype 0021 BADI implementation (HRPAD00INFTY )

Hi there,
In PA30 infotype 0021, i have to change the value of T_VIEW_REPID by implementing BADI HRPAD00INFTY [Program MP002100->screen 2000->MODULE BEFORE_OUTPUT->PERFORM badi_before_output(sapfp50m)]. I'm trying to use field symbols (as below) to change the value of T_VIEW_REPID and getting SY-SUBRC = 4 after the Assign (LV_WA) To <FS_REPID>. Can somebody please help.
method IF_EX_HRPAD00INFTY~BEFORE_OUTPUT.
  Data: LV_WA(20) Type C Value '(MPPDAT02)VIEW_REPID'.
  Types: T_VIEW_REPID Type T582V-REPID.
  Field-Symbols: <FS_REPID> Type T_VIEW_REPID.
  Assign (LV_WA) To <FS_REPID>.
endmethod.
Thanks.

Try like this
method IF_EX_HRPAD00INFTY~BEFORE_OUTPUT.
  Data: LV_WA(20) Type C Value '(MP002100)VIEW_REPID'.
Types: T_VIEW_REPID Type T582V-REPID.
  Field-Symbols: <FS_REPID> Type T_VIEW_REPID.
  Assign (LV_WA) To <FS_REPID>.
endmethod.

Similar Messages

  • Problem in assigning field symbol to a nested internal table

    Hi All,
    I have searched the forum but could not find a solution to this problem. I have a requirement where I need to define an internal table within an internal table, so I have used pointer within the outer internal table(itab2) which point to the inner table. However, I am facing problem while assigning the pointer.
    data: begin of struct1 occurs 0,
            fld3(10) type C,
           end of struct1.
    data: begin of itab2 occurs 0,
            fld1(10) type C,
            fld2(10) type C,
            p_inner like ref to struct1,
          end of itab2.
    field-symbols <inner_table> type any.
    I want to assign "itab2->p_inner->* " to "<inner_table>".
    However, the following statement is Not working:
    assign itab2->p_inner->* to <inner_table>.
    I want to fill the values within fields fld1, fld2 and fld3 and append it in itab2.
    The final table should be like:
    ITAB2:
    fld1    fld2    fld3
    aa      bb      cc
                     dd
                     ee
    11      22      33
                     44
                     55
    I have tried many other ways too but could not suceed, please help.
    Thanks,
    Vishal.

    Thanks Matt,
    But how do I append the values within this internal table ??
    When I am using the following code:
    ls_wa-fld3 = 'A'.
    ls_wa-t_in-fld1 = 'B'.
    ls_wa-t_in-fld2 = 'C'.
    ls_wa-t_in-fld1 = 'D'.
    ls_wa-t_in-fld2 = 'E'.
    append ls_wa to lt_tab.
    Its giving an error that:
    The data object "LS_WA" does not have a component called "T_IN-FLD1".
    I wanted the values to be appended in the following way in lt_tab:
    fld3     fld1     fld2
    A     B     C
         D     E
    Please help.

  • Problem after assigning  field-symbol in read statement...

    Hello Experts,
    I want to use a universal field-symbol in reading my internal tables so
    I can avoid declaring multiple work areas. Here is my code:
    FIELD-SYMBOLS: <fs_any> type any.
    READ TABLE lt_orderadm_h INDEX 1 ASSIGNING <fs_any>.
    Now when I try to insert this code:
    IF NOT <fs_any>-object_id IS INITIAL.
    ENDIF.
    It says that <fs_any> has no structure and therefore no component called object_id.
    I think that I need to use assign component for this but I don't know the code.
    Thank you guys and take care!

    Hi
    DATA : WA_ITORDERADM_H LIKE LINE OF IT_ORDERADM_H.
    **Try to assign the work area rather type any**
    FIELD-SYMBOLS: <fs_any> type WA_ITORDERADM_H.
    READ TABLE lt_orderadm_h INDEX 1 ASSIGNING <fs_any>.
    Now when I try to insert this code:
    IF NOT <fs_any>-object_id IS INITIAL.
    ENDIF.
    Check this program
    This works for me
    Simple program.
    TYPES: BEGIN OF NAME,
    NEXTNAME(10),
    FIRSTNAME(10),
    LASTNAME(10),
    END OF NAME.
    FIELD-SYMBOLS <F> TYPE NAME.
    DATA: LINE(30).
    LINE = 'JOHN SMITH SHRI'.
    ASSIGN LINE TO <F> CASTING.
    WRITE: / 'Lastname:', <F>-LASTNAME,
    'Firstname:', <F>-FIRSTNAME,
    'Nextname :', <F>-NEXTNAME
    Award points if helpful
    Thanks
    VENKI

  • Using ASSIGN - Field Symbol

    I have used
      import <GT_POS_DATA> from memory id 'lines'.
    and have the same{<GT_POS_DATA>} in my zreport. Now I have to sum
    up one field and move it to a variable to be displayed in my report
    output.
    How shld I proceed.
    Thanks in advance.

    Hi,
    Am facing problem over here :
    ASSIGN COMPONENT wkgbtr OF STRUCTURE <WA> TO <FIELD>.
    This is the part of code I used :
    FIELD-SYMBOLS: <gt_pos_data>  TYPE table,
                     <WA> type any,
                     <field> type any.
    LOOP AT <GT_POS_DATA> ASSIGNING <WA>.
    ASSIGN COMPONENT <wa>-wkgbtr OF STRUCTURE <WA> TO <FIELD>.
    lV_tot = lV_tot + <FIELD>.
    ENDLOOP.

  • UrGENT-DUMP while querying database table into itab(Assigned field Symbol)

    Hi,
    __I am getting a dump whose description is as follows__-
    "" In an SQL array select, the internal table used to hold the
    selected records must be at least as wide as the database table
    from which the records are being read.
    In this particular case, the database table is 820 bytes wide,
    but the internal table is only 814 bytes wide.""
    The following code had been written:
    SELECTION-SCREEN BEGIN OF BLOCK b1 WITH FRAME TITLE text-001.
    PARAMETERS: p_tabl TYPE dd02l-tabname.                                      "Table Name
    SELECTION-SCREEN END OF BLOCK b1.
    FIELD-SYMBOLS: <fs_itab> TYPE STANDARD TABLE,
                   <fs_wa> TYPE ANY,
                   <fs_itab1> TYPE STANDARD TABLE,
                   <fs_wa1> TYPE ANY.
    FORM generate_internal_tab .
      DATA: o_itab TYPE REF TO data,
            o_wa TYPE REF TO data,
            o_itab1 TYPE REF TO data,
            o_wa1 TYPE REF TO data.
      CALL FUNCTION 'LVC_FIELDCATALOG_MERGE'
        EXPORTING
          i_structure_name       = p_tabl
        CHANGING
          ct_fieldcat            = it_fcat
        EXCEPTIONS
          inconsistent_interface = 1
          program_error          = 2
          OTHERS                 = 3.
    *Create Dynamic Table for it_fcat
      CALL METHOD cl_alv_table_create=>create_dynamic_table
        EXPORTING
          it_fieldcatalog           = it_fcat
        IMPORTING
          ep_table                  = o_itab
        EXCEPTIONS
          generate_subpool_dir_full = 1
          OTHERS                    = 2.
      IF sy-subrc EQ 0 OR o_itab IS NOT INITIAL.
        ASSIGN o_itab->* TO <fs_itab>.
        CREATE DATA o_wa LIKE LINE OF <fs_itab>.
        ASSIGN o_wa->* TO <fs_wa>.
      ENDIF.
    *Download the file to Application server
        SELECT *
          FROM (p_tabl)
          INTO TABLE <fs_itab>.
    So i am geting a dump in placing contents of table(p_tabl) into <fs_itab>.Should the type declarations be changed???
    Please give me an solution to resolve this dump.
    Thanks and regards-
    Sumita

    You are trying to put more fields in the internal table than what is declared presently for itab. Check if one of the fields is selected but not being passed on to a internal table field.

  • Assign Field Symbol

    Hi,
    The below code is giving dump.plz let me know wats wrong?
    TABLES : y28m_prot_eina.
    DATA : g_t_mara TYPE TABLE OF mara.
    FIELD-SYMBOLS : <fs> TYPE STANDARD TABLE,
                    <fl> TYPE ANY.
    SELECTION-SCREEN BEGIN OF BLOCK blk1.
    SELECT-OPTIONS s_tabnam FOR y28m_prot_eina-tabname OBLIGATORY.
    SELECT-OPTIONS s_projkt FOR y28m_prot_eina-projekt. "OBLIGATORY.
    SELECT-OPTIONS s_datum FOR sy-datum.
    SELECT-OPTIONS s_time FOR sy-uzeit.
    SELECT-OPTIONS s_status FOR y28m_prot_eina-status.
    SELECTION-SCREEN END OF BLOCK blk1.
    select * from (s_tabnam-low) into table <fs>.
    LOOP AT <fs> INTO <fl>.
      WRITE : <fl>.
    ENDLOOP.

    I think u r getting dump because <fs> is not assigned yet.
    select * from (s_tabnam-low) into table <fs>.
    Try this code:
    REPORT z_demo_alv_jg.
    TYPE-POOLS                                                          *
    TYPE-POOLS: slis.
    INTERNAL TABLES/WORK AREAS/VARIABLES                                *
    DATA: i_fieldcat TYPE slis_t_fieldcat_alv,
          i_index TYPE STANDARD TABLE OF i WITH HEADER LINE,
          w_field TYPE slis_fieldcat_alv,
          p_table LIKE dd02l-tabname,
          dy_table TYPE REF TO data,
          dy_tab TYPE REF TO data,
          dy_line TYPE REF TO data.
    FIELD-SYMBOLS                                                       *
    FIELD-SYMBOLS: <dyn_table> TYPE STANDARD TABLE,
                   <dyn_wa> TYPE ANY,
                   <dyn_field> TYPE ANY,
                   <dyn_tab_temp> TYPE STANDARD TABLE.
    SELECTION SCREEN                                                    *
    SELECTION-SCREEN BEGIN OF BLOCK blk1.
    SELECT-OPTIONS s_tabnam FOR y28m_prot_eina-tabname OBLIGATORY.
    SELECT-OPTIONS s_projkt FOR y28m_prot_eina-projekt. "OBLIGATORY.
    SELECT-OPTIONS s_datum FOR sy-datum.
    SELECT-OPTIONS s_time FOR sy-uzeit.
    SELECT-OPTIONS s_status FOR y28m_prot_eina-status.
    SELECTION-SCREEN END OF BLOCK blk1.
    START-OF-SELECTION                                                  *
    START-OF-SELECTION.
    Storing table name
      p_table = s_tabnam-low.
    Create internal table dynamically with the stucture of table name
    entered in the selection screen
      CREATE DATA dy_table TYPE STANDARD TABLE OF (p_table).
      ASSIGN dy_table->* TO <dyn_table>.
      IF sy-subrc <> 0.
        MESSAGE i000(z_zzz_ca_messages) WITH ' No table found'.
        LEAVE TO LIST-PROCESSING.
      ENDIF.
    Create workarea for the table
      CREATE DATA dy_line LIKE LINE OF <dyn_table>.
      ASSIGN dy_line->* TO <dyn_wa>.
    Select data from table
      SELECT * FROM (p_table)
      INTO TABLE <dyn_table>
      UP TO lines ROWS.
    Display report
      CALL FUNCTION 'REUSE_ALV_LIST_DISPLAY'
        EXPORTING
          i_callback_program       = sy-repid
          i_structure_name         = p_table
        TABLES
          t_outtab                 = <dyn_table>
        EXCEPTIONS
          program_error            = 1
          OTHERS                   = 2.
      IF sy-subrc <> 0.
      ENDIF.
    Regards,
    Joy.

  • Assigning field symbol

    I want to assign member area of several fields to a <fs>. For example,
    TYPES: BEGIN OF ty_ex,
        header TYPE char150,
        item1   TYPE char20,
        value1  TYPE i,
        item2   TYPE char20,
        value2  TYPE i,
    END OF ty_ex,
    BEGIN OF ty_item,
        item TYPE char20,
        value TYPE i,
    END OF ty_item.
    DATA:
         l_ex TYPE ty_ex.
    FIELD-SYMBOLS <item> TYPE ty_item.
    I want to make <item> points to l_ex-item1 and l_ex-value1.
    In abap, we can use 'ASSIGN dobj[+off][(len)] TO <fs>'. But in my case, the header is char150 long which exceeds to limit of (off + len) 131.
    Please advice. Thanks.

    Hi,
    Please check these links....
    [Basic form of assign statement|http://help.sap.com/saphelp_nw04/helpdata/en/fc/eb38d5358411d1829f0000e829fbfe/content.htm]
    [Assigning components of a structure to a field symbol|http://help.sap.com/saphelp_nw04/Helpdata/EN/fc/eb3923358411d1829f0000e829fbfe/content.htm]
    Hope this would help you.
    Good luck
    Narin

  • Assigning field symbol to a form parameter

    Hello there.
    I got this huge string that concatenates several columns from a structure and I have to distribute these data into fields of a generic work area in a FORM.
    The thing is that I can't find the right way to pass this work area and when I try to assign my field symbol a dump occurs.
    Could anyone give me a tip?
    <b>Here is what I'm doing:</b>
    Form Nameform <how to pass?> p_workarea
    loop at it_tab
        CONCATENATE 'p_table-' it_tab-fieldname INTO campo.
        ASSIGN (campo) TO <fs>.
    endloop.
    When I debug it, the program sees p_workarea, but when I try to see a specific field like p_workarea-kunnr, it's like it doesn't exists.

    Thanks Matt,
    But how do I append the values within this internal table ??
    When I am using the following code:
    ls_wa-fld3 = 'A'.
    ls_wa-t_in-fld1 = 'B'.
    ls_wa-t_in-fld2 = 'C'.
    ls_wa-t_in-fld1 = 'D'.
    ls_wa-t_in-fld2 = 'E'.
    append ls_wa to lt_tab.
    Its giving an error that:
    The data object "LS_WA" does not have a component called "T_IN-FLD1".
    I wanted the values to be appended in the following way in lt_tab:
    fld3     fld1     fld2
    A     B     C
         D     E
    Please help.

  • Validate a field entered in infotype using BADI

    I am writing code in PAI method of BADI HRPAD00INFTY for implemetation class CL_PT_P2012_IF to capture the number the hours entered in infotype 2012 and validate that it is not more than 40. I am not able to field any field in the parameters which corresponds to number of hours entered by the user. Can anyone please suggest me a way to get them.
    Regards,
    Saurabh

    In The PAI
    FIELD <DATEFIELDNAME> MODULE CHECK_DATE ON INPUT.
    In Proram
    MODULE CHECK_DATE.
    <Your Check here>
    ENDMODULE.
    The above module will be triggered only on an entry or change in the date field
    Cheers

  • GETWA_NOT_ ASSIGNED, Field symbol not yet assigned yet.

    Hi,
    I am working in an Upgrade project,, from 4.6 version to ECC version.
    A program is going into a short dump.
    On debugging th program, I identified that there is a problem with a function module which triggers a standard include and this is where i am getting the error. the function module is supposed to populate a internal table is not populating it. the dump shows that the error is there in the assign statement shown below.
    <fm03> type any.
    <field> type any.
    assign <fm03> to <field>.
    can anyone help me out with this?

    if the program is a custom one then after assignment pl. check sy-subrc value
    like:
    assign <fm03> to <field>.
    if sy-subrc = 0.
    Normal processing
    else.
    Error handling here*
    endif.
    And for std. program search for notes if u think it is a bug in the program.
    Regards,
    Joy.

  • ASSIGN field-symbol doesn't throw exception?

    if <fs> is already assigned, and then assign it to a non-exist column. it seems that <fs> is still assign to the original column, no exception raised.
        i've no idea how could i detect the failure of assgin and raise exception by myself?
        thanks and Happy New Year.
    ASSIGN structure->('correct_column_name') TO <fs>.
    <fs> = ...
    ASSIGN structure->('nonexist_column_name') TO <fs>.
    <fs> = ... " this will still affect the 'correct_column', not second one.
    Edited by: Davin Wang on Jan 3, 2008 4:41 PM

    my ugly solution is following, so much code for 1 usage.
    ASSIGN structure->('correct_column_name') TO <fs>.
    <fs> = ...
    if <fs> is assigned.
        unassign <fs>.
    endif.
    ASSIGN structure->('nonexist_column_name') TO <fs>.
    if <fs> is not assigned.
        raise exception by my own here
    endif.
    <fs> = ...
    Edited by: Davin Wang on Jan 2, 2008 6:07 PM
    Edited by: Davin Wang on Jan 3, 2008 4:42 PM

  • Field-symbol not assigned

    Hello,
    I speak only a bit so I wait that you can understandme.
    I have a field-symbol that is assigned to a component of a structure but when I use the field-symbol I recived a error message that say me "field-symbol is not assigned".
    field-symbols <ubi> type any.
    campo = 'UBIORI'.
    assign component campo of structure
                          t_cuantos to <ubi>.
    Thank you very much.

    H,
    Put a check as follows:-
    field-symbols <ubi> type any.
    campo = 'UBIORI'.
    assign component campo of structure
    t_cuantos to <ubi>.
    if <ubi> is assigned.
    * do further processing here
    endif.
    How is the structure t_cuantos defined?
    Is it having a field named UBIORI?
    t_cuantos should be a workarea(structure) and not an internal table.
    Check the points and reply.
    Regards,
    Ankur Parab

  • The difference between FIELD-SYMBOL and normal DATA TYPE

    Dear experts,
    Please see the example below, both are output the same result.
    DATA: EXTERNAL_RECORD(4000),
          POSITION TYPE I,
          LENGTH TYPE N,
          ENTRY TYPE STRING.
    EXTERNAL_RECORD = '0005Smith0007Edwards0005Young'.
    DO.
      LENGTH = EXTERNAL_RECORD+POSITION(4).
      IF LENGTH = 0.
        EXIT.
      ENDIF.
      ADD 4 TO POSITION.
      MOVE EXTERNAL_RECORD+POSITION(LENGTH) TO ENTRY.
      WRITE ENTRY.
      ADD LENGTH TO POSITION.
      IF POSITION >= 4000.
        EXIT.
      ENDIF.
    ENDDO.
    --OR It can be written as--
    DATA: EXTERNAL_RECORD(4000),
          POSITION TYPE I,
          LENGTH TYPE N.
    FIELD-SYMBOLS <ENTRY>.
    EXTERNAL_RECORD = '0005Smith0007Edwards0005Young'.
    DO.
      LENGTH = EXTERNAL_RECORD+POSITION(4).
      IF LENGTH = 0.
        EXIT.
      ENDIF.
      ADD 4 TO POSITION.
      ASSIGN EXTERNAL_RECORD+POSITION(LENGTH) TO <ENTRY>.
      WRITE <ENTRY>.
      ADD LENGTH TO POSITION.
      IF POSITION >= 4000.
        EXIT.
      ENDIF.
    ENDDO.
    Is there any special circumstances we need to use FIELD-SYMBOL?
    Why is FIELD-SYMBOL is introduce in the first place?
    Kindly advice with example.
    Thanks in advance for those who can help me on this.

    HI,
    You can use field symbols to make the program more dynamic. In this example the name of a table control is substituted by a field symbol. Thus you cal call the form with any internal table, using the name of the table control as a parameter.
    Example
    form insert_row
    using p_tc_name.
    field-symbols <tc> type cxtab_control. "Table control
    assign (p_tc_name) to <tc>.
    insert 100 lines in table control
    <tc>-lines = 100.
    Field symbols allow you to:
    **     Assign an alias to a data object(for example, a shortened
            name for data objects structured through several hierarchies
            - <fs>-f instead of rec1-rec2-rec3-f)
    **     Set the offset and length for a string variably at runtime
    **     Set a pointer to a data object that you determine at runtime (dynamic ASSIGN)
    **     Adopt or change the type of a field dynamically at runtime
    **     Access components of a structure
    **     (from Release 4.5A) Point to lines of an internal table
            (process internal tables without a separate work area)
    Field symbols in ABAP are similar to pointers in other programming
    languages. However, pointers (as used in PASCAL or C) differ from ABAP
    field symbols in their reference syntax.
    The statement ASSIGN f to <fs> assigns the field f to field
    symbol <fs>. The field symbol <fs> then "points" to the
    contents of field f at runtime. This means that all changes to the
    contents of f are visible in <fs> and vice versa. You declare
    the field symbol <fs> using the statement FIELD-SYMBOLS: <fs>.
    Reference syntax
    Programming languages such as PASCAL and C use a dereferencing symbol
    to indicate the difference between a reference and the object to which
    it refers; so PASCAL would use p^ for a pointer instead of p, C would
    use *p instead of p. ABAP does not have any such dereferencing symbol.
    **     In PASCAL or C, if you assign a pointer p1 to a pointer p2,
    you force p1 to point to the object to which p2 refers (reference semantics).
    **     In ABAP, if you assign a field symbol <fs1> to a field
    symbol <fs2>, <fs1> takes the value of the data object to
    which <fs2> refers (value semantics).
    **     Field symbols in ABAP are always dereferenced, that is,
    they always access the referenced data object. If you want to
    change the reference yourself in ABAP, you can use the ASSIGN statement
    to assign field symbol <fs1> to field symbol <fs2>.
    Using field symbols
    You declare field symbols using the FIELD-SYMBOLS statement.
    They may be declared either with or without a specific type.
    At runtime you assign a field to the field symbol using the ASSIGN
    statement. All of the operations on the field symbol act on the field
    assigned to it.
    When you assign a field to an untyped field symbol, the field symbol
    adopts the type of the field. If, on the other hand, you want to assign
    a field to a typed field symbol, the type of the field and that of the
    field symbol must be compatible.
    A field symbol can point to any data object and from Release 4.5A,
    they can also point to lines of internal tables.
    The brackets (<>) are part of the syntax.
    Use the expression <fs> IS ASSIGNED to find out whether the field
    symbol <fs> is assigned to a field.
    The statement UNASSIGN <fs> sets the field symbol <fs> so
    that it points to nothing. The logical expression <fs>
    IS ASSIGNED is then false. The corresponding negative expression
    is IF NOT <fs> IS ASSIGNED.
    An unassigned field symbol <fs> behaves as a constant with
    type C(1) and initial value SPACE.
    MOVE <fs>
    TO dest     Transfers the initial value SPACE to the variable dest
    MOVE 'A' to <fs>     
    Not possible, since <fs> is a constant
    (runtime error).
    To lift a type restriction, use the CASTING addition in the
    ASSIGN statement. The data object is then interpreted as though
    it had the data type of the field symbol. You can also do this
    with untyped field symbols using the CASTING TYPE <type> addition.
    The danger with pointers is that they may point to invalid areas.
    This danger is not so acute in ABAP, because the language does not
    use address arithmetic (for example, in other languages, pointer p
    might point to address 1024. After the statement p = p + 10, it would
    point to the address 1034). However, the danger does still exist, and
    memory protection violations lead to runtime errors.
    A pointer in ABAP may not point beyond a segment boundary. ABAP does
    not have one large address space, but rather a set of segments.
    Each of the following has its own segment:
    *     All global data
    *     All local data
    *     Each table work area (TABLES)
    *     Each COMMON PART
    You should only let field symbols move within an elementary field or
    structure where ABAP allows you to assign both within the global data
    and beyond a field boundary.
    Rgds
    Umakanth

  • How to keep Field symbol reference

    HI ALL ,
    I have method with that assign field symbol on it and I want to keep the reference of it ,
    does it impossible ?
    For instance
    ASSIGN cs_structure TO <ls_structure>. "both are type any and are always structure with fields f1...fn
        assign_request(
          EXPORTING
            is_fields = ls_fields
            ev_out    = es_field "F2
          CHANGING
            cs_str  = <ls_structure>
    es_field = '1'
    Here I have method that in the method I always need to return  field from the structure  (es_field - I dont know how to define it
    type any or type ref to data )
    my question is assume in <ls_structure>  I have field called F2 and I want to receive it but to keep the reference i.e.
    if i do after the method call es_field = '1' the field F2 on structure <ls_structure>  will contain '1'.
    There is a way to do that ?
    Regards
    Joy

    HI Naimesh
    I already try to define es_field as type ref to data but the issue is that for instance
    field symbol  <lv_field> type any.
    ASSIGN cs_structure TO <ls_structure>.
    inside the method assign_request I am doing ...
    ASSIGN COMPONENT 'F2'  OF STRUCTURE cs_str TO <lv_field>.
    GET REFERENCE OF <lv_field> INTO ev_out.
    call to the method
        assign_request(
          EXPORTING
            is_fields = ls_fields
            ev_out    = es_field 
          CHANGING
            cs_str  = <ls_structure>
    and after the method assign_request
    ASSIGN es_field->* to <lv_field>.
    <lv_field> = '1.'
    Now I except that cs_structure and <ls_structure> that have field F2 you see that value '1' but its not working ,
    what i miss here ?
    Regards
    joy

  • Field Symbol Issue

    Hello Experts,
    I'm very new to field-symbols and having challenge when using them. Basically I'm only trying to use specific column value from one type of field symbol to another but keep having short dump. I tried to re-wirte my code using work area and it works though.
    Can somebody have a look at my code and tell me what is causing the problem and how to resolve it.
    DATA:
         lit_variables    TYPE STANDARD TABLE OF zut_variables INITIAL SIZE 0,
    FIELD-SYMBOLS:
          <fs_variables>     type  zut_variables,
          <fs_rang_var>     type  zus_variables.
        loop at lit_variables ASSIGNING <fs_variables>.
            if <fs_variables> is assigned.
               <fs_range_var>-high   = <fs_variables>-high.
               <fs_range_var>-low    = <fs_variables>-low.
               <fs_range_var>-sign   = <fs_variables>-sign.
               <fs_range_var>-option = <fs_variables>-zoption.
            endif.
        endloop.
    Many thanks in advance.

    Hi,
    As you are using same structure for field symbols , no need of using field symbols.
    You can use work area.
    If you doesnt no the structure , you can assign field symbol.
    field-symbols <fs> type any.                            
    Regards,
    Ravi

Maybe you are looking for

  • How to send out email in HTML format instead of Plain text?

    Can anyone help? Or any website with that information? I am trying to send out email using javamail. But i want it to be in HTML format so that i can set font size,coulor and so on. Thanks in advance if you have any clue or solution.

  • "Adobe Acrobat could not install correctly"

    Has a fix been found yet for this damn annoying problem. I get this message regularly on my Mac G5, Leopard 10.5.2. I must have reinstalled the program about 5 times by now. It works properly for a few days, then this- "Adobe Acrobat could not instal

  • Convert with iTunes without rename or refolder

    Hello guys. I've been using iTunes for a long time and always had a "problem": when I do convert a file (bitrate, kind...) it is renamed to "number+sound name" (for example, "The Beatles - 1963 (1) - Please Please Me - 01 - I Saw Her Standing There"

  • How to have a duplicate values for jtree components..

    i'm trying to create a swing application with jtree.i'm getting the data from database in a single stretch.plz have a look at the below tree structure. fint3 fint1 fint2 fint3 fint7 fint4 fint5 fint3 here the problem is i want to add a child under th

  • IPhoto slidshow keeps pausing and other IPhoto Problems

    We have created several slidshows with music and now they keep pausing every 15-20 seconds for a split second up to several seconds. Further, it seems whenever I try to do something in IPhoto, whether it is cut and paste a title or moving through pic