Dynamic selections with FBL1N transaction

Hello,
I want to add new fields to do dynamic selections using FBL1N transaction.
I have "House bank" field in the company code fields, but I want this field in the document fields.
How could I do it?
Thank you very much

Dear Beatriz
Yes this is possible. You need to extend the selection view for the logical database KDF using transaction SE36, to have more selection fields available in the dynamic selections of the line item display.
Call up Transaction SE36 and enter the logical database KDF.
Choose "Extras --> Selection views".
Select the origin of view.
Choose "Display" or "Change".
Vendors: logical database: KDF
Permitted tables:
LFA1, LFB1: All fields are permitted that are contained in the VF_KRED
            view. If necessary, you have to include additional fields in
            the view fields category using Transaction SE11.
BSIK: all fields
Change the source code in program SAPDBKDF, Form INIT as explained in the SAP note 310886.
If this helps please reward with points.
Best Regards
Kesav

Similar Messages

  • How to add into dynamic selection criteria (FBL1N) - custom field from LFB1

    Hello all,
    i have following problem. I added new customer field into table LFB1 (Z* field). And now i need to use this field as dynamic selection criteria in transaction FBL1N. I enhanced selection view for logical database KDF - i have created new customer view and I added my new field from LFB1. It is OK, i see this field in dynamic selection criteria in FBL1N but if i try to select according that Z* field, short dump occured.  
    open cursor with hold LC_KRED for select (VF_KRED_FIELDS)
            from <b>VF_KRED</b>
              where LIFNR in KD_LIFNR
              and   BUKRS in KD_BUKRS
              and   LAND1 in KD_LAND1
              and   KONZS in KD_KONZS
              and   VBUND in KD_VBUND
              and   AKONT in KD_AKONT
              and   BUSAB in KD_BUSAB
              and (VF_KRED_WHERE)
    Problem is in VF_KRED - this is database view (LFA1 joins LFB1). This view has no Z* fields and therefore it cannot be use in statement above -> dump.
    Is needed repature of standard - enhancement of view VF_KRED?
    Thank you very much.

    Hi guys,
    thanks so far. I managed to show prompts in the report. But still my problem is nor 100% solved
    I would like t achieve that the filtered criteria in the report title is separated through a comma like in the report filter summary - e.g.: {001, 002, 003, 004} followed by just 1chart/table that is including the whole information.
    When I however just drag a variable into the report it automatically created different sections, right? Like ........ table, chart, whatever... .......table chart whatever........
    Regards

  • Include new field in dynamic selection in fbl1n

    Hi Guys,
    I want to add a new field in dynamic selection in tcode FBL1N.
    Regards,
    H.Sathiskumar

    Hi Sathiskumar,
    Here are general instructions for adding new fields to the dynamic selection:
    1) Call Transaction SE36
    2) Enter logical database DDF, KDF or SDF (for FBL5N, FBL1N, FLB3N)
    3) Menu -> Extras -> selection views
    4) Here you can find 2 origins of the view (SAP and CUS).
       The standard view SAP is used. Create your own using view CUS. First copy the view SAP.
       On the left side are the functional groups.
       01  Customer master  => fields from table KNA1
       02  Company code     => fields from table KNB1
       03  Documents        => fields from table BSID
      Only those fields from these tables can be used for dynamic selection
    5) To get another field from e.g. table KNB1 for the dynamic    selection double click on the right side on
        table KNB1. The field in the lower area will be changed.  Search for the desired field and enter a 03
        in front of the field.  Save.
    6) Test in your report.
      Note: Not every table and field can be used as dynamic selection. It is also necessary that the report
               allows selection for that field."
    Furthermore I suggest You to have a look at the note number 310886 that can be useful.
    Customers: logical database: DDF
    Permitted tables:
    KNA1, KNB1: All fields are permitted that are contained in the VF_DEBI view. If necessary, you have to
                         include additional fields in the view fields category using Transaction SE11.
    I hope this information may help you in resolving the reported issue.
    Regards,
    Emoke

  • Adding new table dynamic selection screen of transaction FBL5N (LDB DDF).

    Hi,
    I have a requirement to add SEGMENT (CEPC-SEGMENT) field on the dynamic selection screen of transaction FBL5N (LDB DDF).
    Please let me know how can I meet this requirement
    Thanks

    I did not find any screen exits for this Tcode, may be you need to use enhancement spots.

  • Dynamic Selection for FBL1N and FBL5N reports

    Dear all,
    is it possible to show more fields in Dynamic Selection for FBL1N and FBL5N reports?
    Thanks in advance
    Alberto

    Dear Alberto,
    Please refer to the SAP note 310886. In the note you should be able
    to see how to add fields in to the dynamic selection , and the fields,
    which are available for this.
    I hope this can help You.
    Mauri

  • Dynamic Selection Screen In Transaction

    Hi all,
    My first post here, and i got a good problem.
    I try to create a specific transaction , At the top: I got a LISTBOX with a pushbutton.
    When you select datas into the listbox, i wish to create a dynamic selection screen dependant on the selected data, below the listbox. Does it clear?
    And i have no idea how to proceed.
    Thanks for answers
    Message was edited by:
            Gunther OLTRA

    Thanks Karthik  ,
    But it's not helpfull.
    The dynamic selection screen must be created from a transparent table.
    I draw you a schematic:
    I select data in the listbox, with this Key, i will select datas in the transparent table and create the dynamic selection-screen below the listbox.
    It's not a report, it's a transaction.
    I know how to create dynamic SS, but i don't know how to display it (subscreen? Custom control?)

  • Dynamic selections in FBL1N

    Hi.
    Is it possible certain selection fields from dynamic selections (such as clearing document)
    in report FBL1N to be always available in the dialog appeared in the right hand instead of choosing them every time of the dialog in the left hand?
    Thanks in advance

    further to the comments below, you can create a variant and in the variant you can define the layout, so you can move fields to the left, right or center.
    You can make the variant a global variant so all users will use it, or you can make it a user variant so only you can use it.
    Finally and something to consider you can define user specific layouts in t code FB00.
    This is best practise as creating a global variant will cause problems.
    Hope this helps award points if useful.

  • Dynamic select with select-opitons

    Hi all,
    i have a selction screen with a Select-options : S_monat for bkpf-monat.
    Depending on what the user has entered in that selection i need to select the field WOG001 to WOG016 from table COSP.
    for example if user has entered Period '01' to Period '12' , then i should do SELECT  ( WOG001 to WOG012) from COSP. How to program that dynamic select fields??
    Cann anyone help???
    Thanks!

    I hope this will solve your porblem.
    SELECt-OPTIONS: monat for bkpf-monat OBLIGATORY.
    DATA: BEGIN OF ITAB,
         WTG001 TYPE COSP-WTG001,
         WTG002 TYPE COSP-WTG002,
         WTG003 TYPE COSP-WTG003,
      END OF ITAB.
    BREAK-POINT.
    LOOP AT monat.
      if monat-LOW = '01'  AND MONAT-HIGH IS INITIAL.
        select SINGLE WTG001 FROM cosp INTO CORRESPONDING FIELDS OF ITAB where kstar = '0007110102' and vrgng eq 'COIN' AND BEKNZ = 'H'.
    elseif   monat-LOW = '01'  AND MONAT-HIGH eq '01'.
        select SINGLE WTG001 FROM cosp INTO CORRESPONDING FIELDS OF ITAB where kstar = '0007110102' and vrgng eq 'COIN' AND BEKNZ = 'H'.   
    ELSEIF MONAT-HIGH = '02'.
             select SINGLE WTG001 WTG002 INTO CORRESPONDING FIELDS OF ITAB FROM cosp where kstar = '0007110102' and vrgng eq 'COIN' AND BEKNZ = 'H'.
               ELSEIF MONAT-HIGH = '03'.
             select SINGLE WTG001 WTG002 WTG003 INTO CORRESPONDING FIELDS OF ITAB FROM cosp where kstar = '0007110102' and vrgng eq 'COIN' AND BEKNZ = 'H'.
    ENDIF.
    ENDLOOP.}
    Edited by: ZAHID HAMEED on Aug 9, 2011 12:35 AM
    Edited by: ZAHID HAMEED on Aug 9, 2011 12:38 AM

  • Add Z-fields in dynamic selection of FBL1N

    Hello experts,
    I'm trying to add some Z*-fields from table BKPF in the dynamic selections of logical database KDF.
    In fact, and referring to some hints posted in the forum, I copied the standard selection view 'SAP' to 'CUS' and then added a new functional group and then assign the fields (table BKPF) to this functional group.
    The Z-fields are also added in SM30 V_T021S.
    The fields are not available in BSIK, so maybe there is where the problem lies.
    Could you please advice?
    Kind regards,
    Isabel

    Hi,
    I already did this in SE36. The problem is that my Z-fields do not appear in BSIK. They appear only in BKPF... And in SE36 if I try to select the Z-fields in BKPF, they do not appear in the dynamic selections.
    Thanks for your answer. Kind regards,
    Isabel

  • Dynamic select with fieldsymbol

    Dear all,
    I wanted to write a dynamic select for this code.
    SELECT-OPTIONS: so_gjahr FOR bkpf-gjahr,
                    so_belnr FOR bkpf-belnr,
                    so_bukrs FOR bkpf-bukrs,
                    so_aufnr FOR aufk-aufnr,
                    so_vbeln FOR vbuk-vbeln.
    PARAMETERS: p_bkpf    RADIOBUTTON GROUP r1 DEFAULT 'X',
                p_bseg    RADIOBUTTON GROUP r1,
                p_vbak    RADIOBUTTON GROUP r1,
                p_vbap    RADIOBUTTON GROUP r1,
                p_bsad    RADIOBUTTON GROUP r1,
    CASE 'X'.
      WHEN p_bkpf.
        SELECT * INTO TABLE lt_bkpf  FROM bkpf WHERE bukrs IN so_bukrs[]
                                                  AND  gjahr IN so_gjahr[]
                                                  AND  belnr IN so_belnr[].
      WHEN p_bseg.
        SELECT * INTO TABLE lt_bseg  FROM bseg WHERE bukrs IN so_bukrs[]
                                                 AND   gjahr IN so_gjahr[]
                                                 AND   belnr IN so_belnr[].
      WHEN p_vbak.
        SELECT * INTO TABLE lt_vbak  FROM vbak WHERE vbeln    IN so_belnr[]
                                                 AND   erdat    IN so_gjahr[]
                                                 AND   bukrs_vf IN so_bukrs[].
      WHEN p_vbap.
        SELECT * INTO TABLE lt_vbap  FROM vbap WHERE vbeln IN so_vbeln[].
    ENDCASE.
    How can I do it?
    best regards

    Hi,
    If I am correct , u wanna reduce number of select statements. In such case try using MACROs.
    First define the macros . Then call the macro where ever applicable . Like I tried a bit of ur code. Give a try
    define m_macro.
    move &1 to source_table.
    move &2 to dest_table.
    SELECT * INTO TABLE dest_table FROM source_table WHERE bukrs IN so_bukrs[]
                                                  AND  gjahr IN so_gjahr[]
                                                  AND  belnr IN so_belnr[].
    end-of-defination.
    CASE 'X'.
      WHEN p_bkpf.
    m_macro: 'bkpf'   lt_bkpf.
      WHEN p_bseg.
    m_macro: bseg  it_bseg.
    // like wise define macros for the select queries which are similar..
    ENDCASE.
    All d best. Please tell whether it worked or not.
    regards,
    Vishal

  • Dynamic Select with different number of rows

    Hi all,
    I have a procedure who receives a table name and array of column names of that table.
    I need to create a specific select statement with this parameters. Of course, this could change because the number of column names may differ from each invocation the this procedure.
    Here's my procedure:
    PROCEDURE column_scramble (pv_table_name
    VARCHAR2,
    ptbl_col_names
    tbl_col_names)
    IS
    lv_query
    VARCHAR2 (32000);
    cur_handle   INTEGER;
    temp    
    NUMBER;
    BEGIN
    IF ptbl_col_names.COUNT > 0
    THEN
    lv_query := 'SELECT old.id, ';
    FOR i IN ptbl_col_names.FIRST .. ptbl_col_names.LAST
    LOOP
    lv_query :=
    lv_query
    || 'new.'
    || ptbl_col_names
    || ' as new_'
    || ptbl_col_names (i);
    IF i < ptbl_col_names.LAST
    THEN
    lv_query := lv_query || ',';
    END IF;
    END LOOP;
    lv_query :=
    lv_query
    || ' FROM (  SELECT ROWNUM rr, '
    || pv_table_name
    || '.* FROM '
    || pv_table_name
    || ' ORDER BY '
    || pv_table_name
    || '.id) old, (SELECT ROWNUM rr, a.* FROM (  SELECT id,';
    FOR j IN ptbl_col_names.FIRST .. ptbl_col_names.LAST
    LOOP
    lv_query := lv_query || ptbl_col_names (j);
    IF j < ptbl_col_names.LAST
    THEN
    lv_query := lv_query || ',';
    END IF;
    END LOOP;
    lv_query :=
    lv_query
    || ' FROM '
    || pv_table_name
    || ' ORDER BY DBMS_RANDOM.VALUE) a) new WHERE old.rr = new.rr';
    END IF;
    DBMS_OUTPUT.put_line ('LV_QUERY: ' || lv_query);
    cur_handle := DBMS_SQL.open_cursor;
    DBMS_SQL.parse (cur_handle, lv_query, DBMS_SQL.native);
    temp := DBMS_SQL.execute (cur_handle);
    LOOP
    IF DBMS_SQL.fetch_rows (cur_handle) = 0
    THEN
    EXIT;
    ELSE
    lv_query := 'UPDATE ' || pv_table_name || 'SET ';
    FOR s IN 1 .. ptbl_col_names.COUNT
    LOOP
    lv_query :=
    lv_query
    || ptbl_col_names (s)
    || '='
    || <return_value(s)>;
    IF s < ptbl_col_names.COUNT
    THEN
    lv_query := lv_query || ',';
    END IF;
    END LOOP;
    lv_query := lv_query || ' WHERE id = ' || <return_value_id>;
    END IF;
    END LOOP;
    DBMS_SQL.close_cursor (cur_handle);
    END column_scramble;
    Thanks in advance,
    Filipe

    Avoid using the "cumbersome" DBMS_SQL, try this:
    CREATE OR REPLACE TYPE tbl_col_names IS VARRAY (100) OF VARCHAR2 (40);
    CREATE OR REPLACE PROCEDURE column_scramble
        ( pv_table_name VARCHAR2, ptbl_col_names tbl_col_names
        , pmy_cursor OUT SYS_REFCURSOR)  --<<< NOTE: I added this parameter
    IS
      lv_query     VARCHAR2 (32000);
      cur_handle   INTEGER;
      temp         NUMBER;
    BEGIN
      IF ptbl_col_names.COUNT > 0
      THEN
        lv_query   := 'SELECT old.id, ';
        FOR i IN ptbl_col_names.FIRST .. ptbl_col_names.LAST
        LOOP
          lv_query      := lv_query || 'new.' ||  ptbl_col_names ( i)
                        ||  ' as new_' || ptbl_col_names ( i);
          IF i < ptbl_col_names.LAST
          THEN
            lv_query   := lv_query || ',';
          END IF;
        END LOOP;
        lv_query      := lv_query ||
          ' FROM (  SELECT ROWNUM rr, ' ||  pv_table_name || 
                  '.* FROM ' ||  pv_table_name ||
                   ' ORDER BY ' || pv_table_name ||'.id) old
                 , (SELECT ROWNUM rr, a.* FROM (  SELECT id,';
        FOR j IN ptbl_col_names.FIRST .. ptbl_col_names.LAST
        LOOP
          lv_query   := lv_query || ptbl_col_names ( j);
          IF j < ptbl_col_names.LAST
          THEN
            lv_query   := lv_query || ',';
          END IF;
        END LOOP;
        lv_query      := lv_query || ' FROM ' || pv_table_name ||
                       ' ORDER BY DBMS_RANDOM.VALUE) a) new WHERE old.rr = new.rr';
      END IF;
      DBMS_OUTPUT.put_line ( 'LV_QUERY: ' || lv_query);
      OPEN pmy_cursor FOR lv_query;
    END;
    -- And to execute do this:
    VAR my_cursor REFCURSOR;
    DECLARE
      emp_col   tbl_col_names;
    BEGIN
      emp_col      :=
        tbl_col_names (
                       'DEPTNO'
                     , 'MGR'
                     , 'EMPNO'
                     , 'ENAME'
      column_scramble ( 'EMP3', emp_col, :my_cursor);
    END;
    PRINT my_cursor;
    PL/SQL procedure successfully completed.
            ID NEW_DEPTNO    NEW_MGR  NEW_EMPNO NEW_ENAME
             1         10                  7839 KING     
             2         20       7566       7788 TIGER    
             3         30       7698       7499 ALLEN    
             4         10       7839       7782 CLARK    
             5         20       7566       7502 TIGER    
             6         30       7698       7654 MARTIN   
             7         30       7839       7698 BLAKE    
             8         20       7839       7566 JONES    
             9         20       7566       7788 SCOTT    
            10         20       7788       7876 ADAMS    
            11         30       7698       7521 WARD     
            12         20       7902       7369 SMITH    
            13         30       7698       7844 TURNER   
            14         30       7698       7501 BRWN     
    14 rows selected.

  • Dynamic SELECT with FOR ALL ENTRIES IN: take 2

    Hello Xperts,
    we are now having a bit of new trouble with the following SELECT ... special thanks to Raul and Suhas for their previous contributions.
    FIELD-SYMBOLS:
            <itab1>      TYPE standard table.
      ASSIGN ATTR_T_I->* TO <itab1>.
        select
          FIELD1
          FIELD2
        from DBTAB1
        into CORRESPONDING FIELDS OF table <itab1>
        FOR ALL ENTRIES IN <itab1>
        where
           (condition).
    ATTR_T_I is a static attibute of type table containing 10 records where all records have FIELD1 and FIELD2 empty.
    The select finds in DBTAB1 entries fulfilling the 'condition' for 8 of the above 10 records in ATTR_T_I.
    Hence, after the select 8 of the 10 records in ATTR_T_I have the fields FIELD1 and FIELD2 filled (ie not empty).
    So far so good!
    BUT: the 2 remaining records (i.e. those without entries in DBTAB1 fullfilling 'condition') have been deleted! Why? This is not what we want nor expected.
    Any ideas out there how to fix this?
    Thanx!

    Martin Helmstein wrote:
    > Yes, 'condition' contains all the key fields of DBTAB1.
    Hi Martin,
    It's not the Where condition fields i was talking about. I was referring to the Select fields, you have to SELECT all the keyfields when using FAE. Something like this:
    SELECT key1 key2 ... keyn "all the key fields of the table
    field1 field2 ... fieldn
    FROM table
    INTO CORRESPONDING FIELDS OF it_data
    FOR ALL ENTRIES IN <itab>
    WHERE (condition).
    You can search in the forums for further details. It has been discussed many a times.
    BR,
    Suhas

  • Dynamic SELECT with FOR ALL ENTRIES IN

    Hello Xperts,
    we are having a bit of trouble with the following SELECT
    FIELD-SYMBOLS:
            <itab1>      TYPE standard table.
      ASSIGN ATTR_T_I->* TO <itab1>.
        select
          FIELD1
          FIELD2
        from DBTAB1
        into CORRESPONDING FIELDS OF table <itab1>
        FOR ALL ENTRIES IN <itab1>
        where
          FIELD3     =   <itab1>-FIELD3    and
          FIELD4     =   <itab1>-FIELD4
    ATTR_T_I is a static attibute of type table.
    The syntax check throws the following message:
    The specified type has no structure and therefore no component  called FIELD3.
    Any ideas out there how to solve this issue?
    Thanx!

    Hi Martin,
    Change your code like this and try.
    DATA: itab2 TYPE TABLE OF string.
    FIELD-SYMBOLS:
            <itab1>      TYPE standard table.
      ASSIGN ATTR_T_I->* TO <itab1>.
    APPEND 'FIELD3     =   <itab1>-FIELD3    and' TO itab2.
    APPEND 'FIELD4     =   <itab1>-FIELD4' TO itab2.
        select
          FIELD1
          FIELD2
        from DBTAB1
        into CORRESPONDING FIELDS OF table <itab1>
        FOR ALL ENTRIES IN <itab1>
        where
          (itab2)
    Regards,
    Rahul Muraleedharan.

  • Dynamic select with field symbols

    Hi guys,
    I have 2 tables.
    First table is the popup fields using fm popup_get_values:
    tab1-tabname
    tab1-fieldname
    tab1-value
    Second table is the input fields to be displayed in the popup box:
    tab2-transactno
    tab2-docno
    tab2-customer
    tab2-postdate
    etc... (it has many fields)
    Let's say currently i loop at tab2 and assign each value of the individual fields to a variable each:
    loop at tab2
    v_transactno = tab2-transactno
    v_docno = tab2-docno
    etc...
    endloop.
    My question is how do i assign each variable to the popup fields according to the fieldname so that it can get its corresponding value correctly?
    How can this be done dynamically?
    Can the loop above be done dynamically as well coz it has alot of fields to cater for?
    Please help me solve this problem. Futher similar examples would be much appreciated as well.
    Thank you very much!

    Hi
    see the concept of field sysmbols and do accordingly
    Field Symbols
    Field symbols are placeholders or symbolic names for other fields. They do not physically reserve space for a field, but point to its contents. A field symbol cam point to any data object. The data object to which a field symbol points is assigned to it after it has been declared in the program.
    Whenever you address a field symbol in a program, you are addressing the field that is assigned to the field symbol. After successful assignment, there is no difference in ABAP whether you reference the field symbol or the field itself. You must assign a field to each field symbol before you can address the latter in programs.
    Field symbols are similar to dereferenced pointers in C (that is, pointers to which the content operator * is applied). However, the only real equivalent of pointers in ABAP, that is, variables that contain a memory address (reference) and that can be used without the contents operator, are reference variables in ABAP Objects.
    All operations programmed with field symbols are applied to the field assigned to it. For example, a MOVE statement between two field symbols moves the contents of the field assigned to the first field symbol to the field assigned to the second field symbol. The field symbols themselves point to the same fields after the MOVE statement as they did before.
    You can create field symbols either without or with type specifications. If you do not specify a type, the field symbol inherits all of the technical attributes of the field assigned to it. If you do specify a type, the system checks the compatibility of the field symbol and the field you are assigning to it during the ASSIGN statement.
    Field symbols provide greater flexibility when you address data objects:
    If you want to process sections of fields, you can specify the offset and length of the field dynamically.
    You can assign one field symbol to another, which allows you to address parts of fields.
    Assignments to field symbols may extend beyond field boundaries. This allows you to address regular sequences of fields in memory efficiently.
    You can also force a field symbol to take different technical attributes from those of the field assigned to it.
    The flexibility of field symbols provides elegant solutions to certain problems. On the other hand, it does mean that errors can easily occur. Since fields are not assigned to field symbols until runtime, the effectiveness of syntax and security checks is very limited for operations involving field symbols. This can lead to runtime errors or incorrect data assignments.
    While runtime errors indicate an obvious problem, incorrect data assignments are dangerous because they can be very difficult to detect. For this reason, you should only use field symbols if you cannot achieve the same result using other ABAP statements.
    For example, you may want to process part of a string where the offset and length depend on the contents of the field. You could use field symbols in this case. However, since the MOVE statement also supports variable offset and length specifications, you should use it instead. The MOVE statement (with your own auxiliary variables if required) is much safer than using field symbols, since it cannot address memory beyond the boundary of a field. However, field symbols may improve performance in some cases.
    check the below links u will get the answers for your questions
    http://help.sap.com/saphelp_nw04/helpdata/en/fc/eb3860358411d1829f0000e829fbfe/content.htm
    http://www.sts.tu-harburg.de/teaching/sap_r3/ABAP4/field_sy.htm
    http://searchsap.techtarget.com/tip/1,289483,sid21_gci920484,00.html
    Syntax Diagram
    FIELD-SYMBOLS
    Basic form
    FIELD-SYMBOLS <fs>.
    Extras:
    1. ... TYPE type
    2. ... TYPE REF TO cif
    3. ... TYPE REF TO DATA
    4. ... TYPE LINE OF type
    5. ... LIKE s
    6. ... LIKE LINE OF s
    7. ... TYPE tabkind
    8. ... STRUCTURE s DEFAULT wa
    The syntax check performed in an ABAP Objects context is stricter than in other ABAP areas. See Cannot Use Untyped Field Symbols ad Cannot Use Field Symbols as Components of Classes.
    Effect
    This statement declares a symbolic field called <fs>. At runtime, you can assign a concrete field to the field symbol using ASSIGN. All operations performed with the field symbol then directly affect the field assigned to it.
    You can only use one of the additions.
    Example
    Output aircraft type from the table SFLIGHT using a field symbol:
    FIELD-SYMBOLS <PT> TYPE ANY.
    DATA SFLIGHT_WA TYPE SFLIGHT.
    ASSIGN SFLIGHT_WA-PLANETYPE TO <PT>.
    WRITE <PT>.
    Addition 1
    ... TYPE type
    Addition 2
    ... TYPE REF TO cif
    Addition 3
    ... TYPE REF TO DATA
    Addition 4
    ... TYPE LINE OF type
    Addition 5
    ... LIKE s
    Addition 6
    ... LIKE LINE OF s
    Addition 7
    ... TYPE tabkind
    Effect
    You can define the type of the field symbol using additions 2 to 7 (just as you can for FORM parameters (compare Defining the Type of Subroutine Parameters). When you use the ASSIGN statement, the system carries out the same type checks as for USING parameters of FORMs.
    This addition is not allowed in an ABAP Objects context. See Cannot Use Obsolete Casting for FIELD SYMBOLS.
    In some cases, the syntax rules that apply to Unicode programs are different than those for non-Unicode programs. See Defining Types Using STRUCTURE.
    Effect
    Assigns any (internal) field string or structure to the field symbol from the ABAP Dictionary (s). All fields of the structure can be addressed by name: <fs>-fieldname. The structured field symbol points initially to the work area wa specified after DEFAULT.
    The work area wa must be at least as long as the structure s. If s contains fields of the type I or F, wa should have the structure s or at least begin in that way, since otherwise alignment problems may occur.
    Example
    Address components of the flight bookings table SBOOK using a field symbol:
    DATA SBOOK_WA LIKE SBOOK.
    FIELD-SYMBOLS <SB> STRUCTURE SBOOK
    DEFAULT SBOOK_WA.
    WRITE: <SB>-BOOKID, <SB>-FLDATE.
    Regards
    Anji

  • Dynamic Selection screen in FDK43 transaction

    HI,
    The transaction FDK43 has a dynamic selection screen used from LDB DDF .It does not show all selections views in the dynamic selection but when I test the LDB from se36 its shows all the selections in dynamic selections.
    Any idea why it is not showind in the transaction FDK43 ??
    Regards,
    Shital

    Hi,
    LDB fields are nothing to do with Dynamic Selection. It is not necessary that all the field of LDB should be visible in Dynamic Selection. FDK43 is a standard screen and SAP has designed the dynamic selection with limited option. If you want additional fields, you need to do the enhancement with the help of ABAPer.
    Regards,
    Ravi

Maybe you are looking for

  • How to get the values of selection screen.

    Hi experts..                 Using call transaction i just called one screen where two input fields are there eid and ename...after giving the input i want to get the eid value using get parameter id..how it is possible... CALL TRANSACTION 'ZT11'. GE

  • HP Laserjet Pro 400 color printer M451dn Driver needed

    I need to install an HP Laserjet Pro 400 color printer.  When I plug in the USB - it provides a driver which I can open and get to the install process -  The process takes me to the point of plugging in the USB and starts to install. After 10 minutes

  • Runtime exception occurred during application mapping

    Hi All, Please find the error message which we are getting: <?xml version="1.0" encoding="UTF-8" standalone="yes" ?> - <!-- Request Message Mapping   --> - <SAP:Error SOAP:mustUnderstand="1" xmlns:SAP="http://sap.com/xi/XI/Message/30" xmlns:SOAP="htt

  • Different DOCUMENT PRICING PROCEDURES in SalesOrder and Billing

    Hi Experts, Can you please explain how system reacts and how it calculates PRICING if we maintain different DOCUMENT PRICING PROCEDURE in OR and different DOCUMENT PRICING PROCEDURE in F2? Thanks, Kanna. Edited by: kanna palle on Aug 29, 2008 3:17 PM

  • Partner role update to COPA

    Hello, I had implemented Note 36557 - Info SD/CO-PA: Transferring partner roles to CO-PA with related notes. The status now is that I have all partners that I need transferred to COPA from sales document, but I meet another problem. The problem is th