Doubt in internal table record count

Hi,
i have an internal table with 5 fields. Last field is flag. In my internal table lot many records are there. i want to count only the records with flag 'E'. How to count the total records with 'E'.
Mohana

Try like this,
Data: c type i.
Loop at itab into wa.
if wa-flag = 'E'.
c = c + 1.
endif.
Endloop.
Write:/ 'Total records', c.
OR
LOOP AT itab WHERE flag = 'E'.
  c = c + 1.
ENDLOOP.
Edited by: Sap Fan on Apr 3, 2009 5:21 PM

Similar Messages

  • Doubt in internal table records

    Hi all,
       I have a one problem, in my internal table have 5 records. i did some correction in my progm after i execute the loop i need the correction in the records. In debug mode it showing in the header level. but it not changing the body records. give some soln.
    Thanks,
    gowri

    hi,
    chk the code below:
    loop at itab.
    modify itab index sy-tabix.
    endloop.
    regards,
    Navneeth K.

  • Refresh internal table records in web dynpro

    Hi Guru's
    I am facing an issue in web dynpro abap.
    in my application there is a button called OPEN.
    when i click on open button internal table records should be refreshed.
    so i have written code like this
    DATA lo_COMPONENTCONTROLLER TYPE REF TO IG_COMPONENTCONTROLLER .
      lo_COMPONENTCONTROLLER =   wd_this->get_componentcontroller_ctr( ).
      lo_componentcontroller->clear_info_refresh_visible( ).
    but iam getting an error message Method "CLEAR_INFO_REFRESH_VISIBLE" is unknown or PROTECTED or PRIVATE
    Could you please help me to how do i activate and refresh the things.
    Thanks
    Rajue

    wd.rajue wrote:
    Hi Guru's
    >
    > I am facing an issue in web dynpro abap.
    > in my application there is a button called OPEN.
    > when i click on open button internal table records should be refreshed.
    > so i have written code like this
    >
    > DATA lo_COMPONENTCONTROLLER TYPE REF TO IG_COMPONENTCONTROLLER .
    >
    >   lo_COMPONENTCONTROLLER =   wd_this->get_componentcontroller_ctr( ).
    >
    >   lo_componentcontroller->clear_info_refresh_visible( ).
    >
    >
    >
    > but iam getting an error message Method "CLEAR_INFO_REFRESH_VISIBLE" is unknown or PROTECTED or PRIVATE
    >
    >
    > Could you please help me to how do i activate and refresh the things.
    >
    > Thanks
    > Rajue
    Raju,
    Please clarify this.
    Do you have a method clear_info_refresh_visible  in your component controller. I think not.
    I am not able to relate your request and coding.
    You can simply clear the internal table like this
    clear lt_intern_tab[].
    If it is a context node then you can bind a empty table to the node to make it empty.
      lo_nd_data->bind_table(
         new_items            =   lt_intern_tab
         set_initial_elements = abap_true ).

  • How to display the Internal table records in table format?

    Hi Gurus,
    I want to display my print prg internal table records in d appropriate form in a table format, give some solution
    with regards
    Thambe

    There are lot many options to do that
    one way is create template  in the maikn window  and define the line types according to your data  cretae text and put your data in the text and go to output options and give  the line type to be used . You can also select details option to have lines in your output.
    similarly YOU CAN CREATE TABLE IN THE MAIN WINDOW FOR THIS YOU DONT NEED TO DEFINE THE LINE TYPES .
    WHEN YOU ARE IN MAIN WINDOW RIGHT CLICK ON TABLE AND GO TO PATH
    CREATE  -> TABLE
                  -> TEMPLATE
    REWARD IF USEFUL
    Regards,
    Nageswar

  • Function module for move internal table records into MSexcel file

    Hi all,
    Tell me the function module which is used to
    move internal table records in to MSexcel file.
    Give the sample program...

    Please search the forum for FM  "GUI_DOWNLOAD" You will get tons of threads with sample code.
    Also take a look into SAP_CONVERT_TO_XLS_FORMAT
    Thanks

  • Help on Delete Internal table records

    Hi,
    I have a internal table with some records in it.
    I need to delete the contents of this based on the condition as below.
    if product_search-Resp_product_company is not initial.
    SORT i_equi BY zzrefeng.
    DELETE i_equi WHERE zzrefeng <> product_search-Resp_product_company.
    endif.
    when i execute this all the records are getting deleted irrespective of the condition mentioned.
    Can anyone help me on this.
    Regards,
    Ram

    Hi,
    Need to delete the records if <b>ZZREFENG</b> does not have the value of <b>product_search-Resp_product_company</b> .
    Here I have product_search-Resp_product_company value as FI14. And also the internal table contains some records with ZZREFENG = FI14.
    I need to delete the internal table records if ZZREFENG <> FI14. But when i execute the statement it is deletng all the records even ZZREFENG = FI14 records also.
    Regards,
    Ram

  • Reg : Joining the all internal table records into a single internal table

    Hi all
    I am having 5 internal tables and i want to put all these entries in a single intrnal table and my requirement is for each and every record it has to go through all the internal tables and if an entry is missing meand.it has to go through the other internal tables and for missing entries i should leave it as blank and rest of the contents i have to display can any please gimme some logic how to do this??
    Thanks in advance

    Don't have time or will to deliver turnkey solutions, but here is a frame:
    LOOP AT itab1...
      READ TABLE itab2 WITH TABLE KEY... (fields linking itab1 and itab2)
      READ TABLE itab3 WITH TABLE KEY... (fields linking itab1 and itab3)
      LOOP AT itab4 WHERE... (fields linking itab1 and itab4)
        READ TABLE itab5 WITH TABLE KEY... (fields linking itab4 and itab5)
        MOVE-CORRESPONDING... (all five work areas to target work area)
        APPEND itabtarget...
      ENDLOOP.
    ENDLOOP.
    so use READ when there is a 1:1 relationship (e.g. check table entry), and LOOP when there is a 1:N relationship (e.g. items for a header)
    Thomas

  • How to send Internal table records to Idoc Inbound posting FM to create Ido

    Hello Experts,
    I have all the data necessary to create shipments in one internal table inside my ABAP program.
    I can use BAPI_SHIPMENT_CREATE to create shipments. But associated with this BAPi there is one ALE message type SHIPMENT_CREATEFROMDATA. Now my requirement is to use this message type to cretae my shipments via idocs for one scenario for some of the records in the internal table.
    For this message type, I got the inbound function module IDOC_INPUT_SHIPMENT_CREATEFROM from TBDBE table.
    Can anybody please let me know how to send the data from the internal table to this inbound function  module?
    Becasue it has mandatory parameters INPUT_METHOD, MASS_PROCESSING. What values should be passed to these parameters if the data has to be sent to this function module?
    Regards.

    Hi Ravikanth,
    Thankyou very much for your quick reply.
    So If I split my internal table data and populate IDOC_DATA and IDOC_CONTROL and pass to the inbound function module directly in my ABAP program, will that be going to create idocs and post shipments?
    I mean is it enough to call the Inbound posting function module directly in my ABAP program or any other FMs to be called to take care of ALE settings and shipment creation?
    Please confirm.
    REgards.

  • Doubt in internal table

    Hi,
    I have internal table with 5 records. I want to separate out the last record in the internal table.
    For ex : itab contains,
                 12,
                 10,
                 15,
                 09,
                 13 .  i need the last record '13' only. how to fetch the last record from the internal table, i no need the other records.
    point will be sure.
    Gowri

    Hi,
    try this simle code:
    DATA: BEGIN OF ITAB OCCURS 0,
            N2(2) TYPE N,
          END   OF ITAB.
    DATA: LINE_ITAB LIKE SY-TABIX.
    START-OF-SELECTION.
      ITAB-N2 = '12'. APPEND ITAB.
      ITAB-N2 = '10'. APPEND ITAB.
      ITAB-N2 = '15'. APPEND ITAB.
      ITAB-N2 = '09'. APPEND ITAB.
      ITAB-N2 = '13'. APPEND ITAB.
      CLEAR: ITAB.
      DESCRIBE TABLE ITAB LINES LINE_ITAB.
      READ TABLE ITAB INDEX LINE_ITAB.
      WRITE: / ITAB-N2.
    Regards, Dieter

  • Problem in Internal table Record Splitting

    Hi All,
    Plz look into my below requirement and me know your Suggestions.
    My Internal tables :
    1.*Internal table for Infotype 2002 (Attendances)
    DATA : BEGIN OF T_PA2002 OCCURS 0,
           PERNR LIKE PA2002-PERNR,
           BEGDA LIKE PA2002-BEGDA,
           ENDDA LIKE PA2002-ENDDA,
           BEGUZ LIKE PA2002-BEGUZ,
           ENDUZ LIKE PA2002-ENDUZ,
           SUBTY LIKE PA2002-SUBTY,
           END OF T_PA2002.
    1.*Internal table for Infotype 9003 (Custom Attendances)
    DATA : BEGIN OF T_PA9003HRABS OCCURS 0,
           PERNR LIKE PA9003-PERNR,
           BEGDA LIKE PA9003-BEGDA,
           ENDDA LIKE PA9003-ENDDA,
           SHIFT LIKE PA9003-SHIFT,
           OTHOURS LIKE PA9003-OTHOURS,
           BEGUZ LIKE PA2002-BEGUZ,
           ENDUZ LIKE PA2002-ENDUZ,
           NSA LIKE PA9003-NSA,     
           MA  LIKE PA9003-MA,     
           CA  LIKE PA9003-CA,
           END OF T_PA9003HRABS.
    Requirement :
    1.  Internal table T_PA2002
        PERNR     BEGDA          ENDDA          BEGUZ          ENDUZ
         5          27.12.2006     27.12.2006     10:00:00     14:30:00
    2.  Internal table T_PA9003HRABS
        PERNR     BEGDA          ENDDA          BEGUZ          ENDUZ          HRABS     OTHOURS     MA     CA     WA
         5          27.12.2006     27.12.2006     08:00:00     14:30:00     2     2     
    Iam doing comparision between T_PA2002 and T_PA9003HRABS.
    Iam doing some caluculation to get Hourly absence,OT Hours and else ( Fields)
    So my Hourly absence on 27.12.2006 was 2Hours.
    So i need to split my Final table as below how to do that....( It is like In infotypes COPY option i.e 1 record to 3 Record )
    I need the Output like this...
    3.  Final Internal table T_PA9003HRABS
        PERNR     BEGDA          ENDDA          BEGUZ          ENDUZ          HRABS     OTHOURS     MA     CA     WA
         5          25.12.2006     26.12.2006     08:00:00     14:30:00     0     0     
         5          27.12.2006     27.12.2006     08:00:00     14:30:00     2     2     
         5          25.12.2006     26.12.2006     08:00:00     14:30:00     0     0     
    Points will be rewarded.
    Thanks,
    Suresh.U

    you could:
    sort T_PA2002 by pernr.
    sort T_PA9003HRABS by pernr.
    loop at T_PA2002
    read table T_PA9003HRABS with key
    pernr = T_PA2002-pernr
    begda = T_PA2002-begda
    binary search.
    ***here you can specify how you calculate
    ***your absences and apply them to your
    ***final internal table.
    endloop.
    hope this helps.
    Warren

  • Internal table record checking (Urgent)

    Hi Experts,
    I have an internal table having records. I want to check each record of the table with every other record to find out if there exist same record for more then one key field.
    Can anybody help me to place the logic for how i can check the records with each record? Like
    lifnr     banks
    1         12
    2         34
    3         12
    4         12
    5          76
    I want to find out 1,3 and 4.
    Thanks a ton in advance

    Hi Moni,
    IF in my First Reply the Second technique was working then this should solve your Problem:
    DATA:
      w_index TYPE i,
      w_lines TYPE i,
      w_duplicate(10) TYPE c.
    DESCRIBE itab LINES w_lines.
    LOOP AT itab INTO wa.
      w_index = sy-tabix + 1.
      DO. 
      READ TABLE itab INTO wa1 INDEX w_index.
        IF w_index <= w_lines.
          IF wa-banks EQ wa1-banks.
            CONCATENATE w_duplicate wa1-lifnr INTO w_duplicate SEPARATED BY SPACE.
            wa-duplicate = w_duplicate.
            MODIFY itab FROM wa.
          ENDIF.
        ELSE.
          EXIT.
        ENDIF.
       ADD 1 TO w_index.
      ENDDO.
    ENDLOOP.
    LOOP AT itab INTO wa.
      write:
        / wa-lifnr,
          wa-banks,
          wa-duplicates.
    ENDLOOP.
    ELSE try the below code it is same as above except one more Internal Table is used:
    DATA:
      w_index        TYPE i,
      w_lines        TYPE i,
      jtab            LIKE itab,
      w_duplicate(10) TYPE c.
    DESCRIBE itab LINES w_lines.
    LOOP AT itab INTO wa.
      w_index = sy-tabix + 1.
      DO. 
      READ TABLE jtab INTO wa1 INDEX w_index.
        IF w_index <= w_lines.
          IF wa-banks EQ wa1-banks.
            CONCATENATE w_duplicate wa1-lifnr INTO w_duplicate SEPARATED BY SPACE.
            wa-duplicate = w_duplicate.
            MODIFY itab FROM wa.
          ENDIF.
        ELSE.
          EXIT.
        ENDIF.
       ADD 1 TO w_index.
      ENDDO.
    ENDLOOP.
    LOOP AT itab INTO wa.
      write:
        / wa-lifnr,
          wa-banks,
          wa-duplicates.
    ENDLOOP.
    Regards,
    Sunil.

  • Oracle 10g - Insert in to Temporary Table - Record count mismatch between s

    We are trying insert records from a select query in to temporary table, some of the records is missing in the temporary table. The select statement is having multiple joins and union all which it little complex query. In simple terms the script contains 2 part 1st Part Insert in to temporary table 2nd part Select query with multiple joins, inline sub queries, unions and group by classes and conditions
    Eg. If we execute select statement alone it returns some count for example => 60000 After inserting into the temp table, in temp table the count is around 42000 why is the difference?
    It is simple bulk inserts... insert in to temp table select from xxx. also, there is no commit in between. The problem is all the records populated by the select statement are not inserted in to temp table. some records are not inserted.*
    Also, we had some other observation. It only happens in its 2nd execution and not its first run. Hope there might be some cache problem
    Even, we also did not believe that. We are wondering. In TOAD, we tested however at times it happens. In application jar file, after "insert in to temp select * from xxx" we take the i. record count of temp table and ii. record count of "select * from xxx" separately but both doesn't match. Match only at 1st time.
    Thank you in advance for your efforts and help.
    Shiva.

    The code looks like
    sql = "insert in to temptable select x,y,z,.... from xxx,abc,pqr..where...."; (logial but not real is very complex around 700 lines with multiple joins, inline sub queries, group by etc. )
    stmt = conn.createStatement();
    rCount= stmt.executeUpdate(sql);
    Actual issue is
    rCount = xxxx = Count(temptable) < count(select x,y,z,.... from xxx,abc,pqr..where....)
    why this diffference ? some records populated in the select but not inserted in to temp table
    Anyone can explain?

  • Division of internal table records

    Dear all
    How can I observe that how many record my internal table got record and how can I divide into by lines
    for ex.
              SELECT SINGLE pvprs FROM ckmlcr INTO sum_pvprs-pvprs
                WHERE poper EQ s_poper AND
                   kalnr = itab2-kalnr AND
                   bdatj = itab2-bdatj AND
                   curtp = itab2-curtp.
              IF sy-subrc = 0.
                APPEND sum_pvprs.
    I want to get arithmetic range of this sum_pvprs-pvprs
    Actually I want to get number of lines and their summations
    pvprs1= 10 pvprs=20 pvprs=30 and then
    after I got this results 102030 = 60 /3 =20 I need this operation.
    All the best
    Message was edited by: yusuf tunay çilesiz

    I am not sure what do you mean by arithmetic range...if you mean min and max numbers you can use the below logic.
    SELECT SINGLE pvprs FROM ckmlcr INTO sum_pvprs-pvprs
    WHERE poper EQ s_poper AND
    kalnr = itab2-kalnr AND
    bdatj = itab2-bdatj AND
    curtp = itab2-curtp.
    IF sy-subrc = 0.
    APPEND sum_pvprs.
    1. you can simply sort the sum_pvprs internal table...on pvprs first ascending and than descending to get the min and max numbers by reading the first record of the internal table.
    REad table sum_pvprs index 1.
    2. you can have two variables lmin and lmax and initialise the same before you append statement.
    if sum_pvprs-pvprs > lmax.
      lmax  = sum_pvprs-pvprs.
    endif.
    if sum_pvprs-pvprs < lmin.
      lmin  = sum_pvprs-pvprs.
    endif.
    <u><b>Sum and Average.</b></u>
    SELECT SINGLE pvprs FROM ckmlcr INTO sum_pvprs-pvprs
    WHERE poper EQ s_poper AND
    kalnr = itab2-kalnr AND
    bdatj = itab2-bdatj AND
    curtp = itab2-curtp.
    IF sy-subrc = 0.
    <b>l_sum = sum_pvprs-pvprs + l_sum.</b>
    APPEND sum_pvprs.
    ENDSELECT.
    <b>DESCRIBE TABLE sum_pvprs LINES lrec.
    lavg = l_sum / lrec.</b>
    Message was edited by: Anurag Bankley

  • Internal table Records

    Hi all,
    Can anyone tell, after deletion the records from one internal table itab1 using specific condition  , that  how will insert the single record from another itab2
    into itab1 on the  same index.
    Regards
    Alok

    ok , please find whole  code as shown below for assigning role in su01.
    Code:
    FORM add_roles_user.
      Data: int_agr like bapiagr occurs 0 with header line,
            int_agr1 like bapiagr occurs 0 with header line,
            user_activitygroups like usagr occurs 0 with header line.
      loop at int_role where uname = bname or uname = ''.
         int_agr-agr_name = int_role-agr_name.
         int_agr-from_dat = int_role-begda.
         int_agr-to_dat = int_role-endda.
        append int_agr.
      endloop.
      if not int_agr[] is initial.
        CALL FUNCTION 'SUSR_USER_AGR_ACTIVITYGR_GET'
          EXPORTING
            USER_NAME           = bname
          TABLES
            USER_ACTIVITYGROUPS = user_activitygroups
          EXCEPTIONS
            USER_NAME_NOT_EXIST = 1
            OTHERS              = 2.
        IF SY-SUBRC <> 0.
        MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
           WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
        ENDIF.
        loop at user_activitygroups.
    Message 371365
          read table int_agr with key agr_name =
             user_activitygroups-agr_name from_dat =
             user_activitygroups-from_dat to_dat =
             user_activitygroups-to_dat org_flag =
             user_activitygroups-ORG_FLAG.
          if sy-subrc <> 0.
            int_agr-agr_name = user_activitygroups-agr_name.
            int_agr-from_dat = user_activitygroups-from_dat.
            int_agr-to_dat = user_activitygroups-to_dat.
            int_agr-ORG_FLAG = user_activitygroups-ORG_FLAG.
            append int_agr.
          endif.
    Message 371365
    Start of changes by P4TK900204
           sort int_agr by agr_name." FROM_DAT to_dat descending.
           delete adjacent duplicates from int_agr comparing agr_name.
    End of changes by P4TK900204
        endloop.
      endif.
    int_agr1[] = int_agr[].
    loop at int_agr1.
       delete int_role where agr_name = int_agr1-agr_name.
    endif.
    endloop.
    append lines of int_role to int_agr1.
    sort int_agr1 by agr_name." FROM_DAT to_dat descending.
      CALL FUNCTION 'SUSR_BAPI_USER_ACTGROUPS_ASSIG'
        EXPORTING
          USERNAME             = bname
          INCL_HR_ASSIGN       = 'X'
        TABLES
          ACTIVITYGROUPS       = int_agr1
          RETURN               = return_int2.
      loop at return_int2.
        case return_int2-number.
          when '048'.
          when others.
            message-msgty = return_int2-type.
            message-msgid = return_int2-id.
            message-msgno = return_int2-number.
            message-msgv1 = return_int2-message_v1.
            message-msgv2 = return_int2-message_v2.
            message-msgv3 = return_int2-message_v3.
            message-msgv4 = return_int2-message_v4.
            perform set_return_message using message changing return_int.
        endcase.
      endloop.
    ENDFORM.                    " add_roles_user

  • Doubt in internal tables

    hi experts
    could you please tell difference between linear search, binary search and hashed mechanism.
    above 3 which is faster and why.
    if  i use binary search in descending order it will search the records are not could please send why.

    Hi Sayeed,
    Standard table:
    The key access to a standard table uses a sequential search. The time required for an access is linearly dependent on the number of entries in the internal table.
    You should usually access a standard table with index operations.
    Sorted table:
    The table is always stored internally sorted by its key. Key access to a sorted table can therefore use a binary search. If the key is not unique, the entry with the lowest index is accessed. The time required for an access is logarithmically dependent on the number of entries in the internal table.
    Index accesses to sorted tables are also allowed. You should usually access a sorted table using its key.
    Hash table:
    The table is internally managed with a hash procedure. All the entries must have a unique key. The time required for a key access is constant, that is it does not depend on the number of entries in the internal table.
    You cannot access a hash table with an index. Accesses must use generic key operations (SORT, LOOP, etc.).
    Index table:
    The table can be a standard table or a sorted table.
    Index access is allowed to such an index table. Index tables can be used to define the type of generic parameters of a FORM (subroutine) or a function module.
    Just have a look at these links:
    http://help.sap.com/saphelp_nw04/helpdata/en/90/8d7304b1af11d194f600a0c929b3c3/frameset.htm
    http://help.sap.com/saphelp_nw04/helpdata/en/74/83015785d811d295a800a0c929b3c3/frameset.htm
    Also Go through the following Document
    1.1 STANDARD table
    Key access to a standard table uses a linear search. This means that the time required for a search is in linear relation to the number of table entries.
    You should use index operations to access standard tables.
    1.2 SORTED table
    Defines the table as one that is always saved correctly sorted.
    Key access to a sorted table uses a binary key. If the key is not unique, the system takes the entry with the lowest index. The runtime required for key access is logarithmically related to the number of table entries.
    1.3 HASHED table
    Defines the table as one that is managed with an internal hash procedure
    You can only access a hashed table using the generic key operations or other generic operations ( SORT, LOOP, and so on). Explicit or implicit index operations (such as LOOP ... FROM oe INSERT itab within a LOOP) are not allowed.
    1.4 INDEX table
    A table that can be accessed using an index.
    Index table is only used to specify the type of generic parameters in a FORM or FUNCTION. That means that you can't create a table of type INDEX.
    Standard tables and sorted tables are index tables.
    1.5 ANY table
    Any table is only used to specify the type of generic parameters in a FORM or FUNCTION. That means that you can't create a table of type ANY.
    Standard, sorted and hashed  tables belongs to ANY tables.
    2. Defining an internal table
    DATA itab TYPE table type of line type [WITH UNIQUE/NON-UNIQUE KEY <key>] [Iinitial size n]  [WITH HEADER LINE]
    Note: There are also other ways to define an internal table. Please refere to the documentation.
    2.1 The KEY option
    KEY key1,,keyn :
    key1..keyn are fields in the table.  The sequence in which you specify the key is significant.
    DEFAULT KEY :
    The key fields are the standard keys. Note that you can only specify an empty key for tables with access type STANDARD TABLE.  The standard key basically comprises all tables fields with character-like types (type ( C, STRING, D, T, N, X, XSTRING). In particular, components with a numeric type (also refer to ABAP numeric types) and table components usually do not belong to the standard key.
    Example:
    types:
      begin of t_makt,
        matnr like makt-matnr,
        maktx like makt-maktx,
      end of t_makt.
    data:
    Define the table
      gi_makt type sorted table of t_makt with unique key matnr.
    Define the work area for the table if necessary
      gi_makt type  t_makt.
    3. Reading internal tables
    READ TABLE itab WITH TABLE KEY k1 = v1 k2 = v2 [additions]
    Note: In case of more than one match, it is the first match that is selected.
    STANDARD TABLE: The system searches from the start of the table. The response time is in linear relation to the number of table entries.
         SORTED TABLE: The response time is in logarithmic relation to the number of table entries.
         HASHED TABLE: The response time is constant
    READ TABLE itab WITH KEY k1 = v1 k2 = v2  [BINARY SEARCH] [additions]
    Note: In case of more than one match, it is the first match that is selected.
    STANDARD TABLE: If you use the ... BINARY SEARCH addition, the system uses a binary search. Otherwise, the search is sequential. This assumes that the internal table is sorted in ascending order in the sequence of the specified key fields.
         SORTED TABLE: If the specified key fields form a left-justified extract of the table key, the search is binary, otherwise sequential.
         HASHED TABLE: Sequential search.
    READ TABLE itab INDEX i [additions]
    Accessing the table entry with the index i.
    Additions:
    INTO wa - wa is used as output area
         ASSIGNING <fs> - The field symbol <fs> is assigned to the entry. This saves the cost of copying the contents in comparison to the first addition. However, this addition does involve table administration costs, and it is therefore only worthwile for lines longer than around 300 bytes.
         COMPARING f1...fn - If the system find an entry, the system compares the subfields f1, f2, ... with the corresponding fields of the work area before they are transported into it.
         COMPARING ALL FIELDS
         TRANSPORTING f1 f2 - If the system finds an entry, it does not transfer all of the subfields (default) into the work area, but only the specified fields f1 f2 ...; the other subfields remain unchanged.
    TRANSPORTING NO FIELDS
    Example:
    loop at gi_mseg into g_mseg.
       read table gi_makt
         with table key matnr = g_mseg-matnr
         into g_makt.
    endloop.
    Regards
    Sreeni

Maybe you are looking for

  • Unable to recover Time Machine back-up because I "don't have permission"...

    Trying to recover an old version of my iPhoto library from a Time Machine backup. I get about 1/3 into the restore and I get the message "The operation can't be completed because you don't have permission to access iPhoto Library". Any suggestions? D

  • How to create an image of my system

    I want to create an image snapshot of my system as is What apps/programs do I need? Do I need an external hard drive to store the image? Do I need bootable media? On Windows, I use Acronis - do things work the same way in Mac world? Thanks Omar

  • ITunes Account with no Apple device

    Hi. I do NOT have any Apple products, but have signed up for an iTunes account. Am I allowed to purchase MP3s and VIDEOS available for my country (South Africa), even though I do not have a Apple product. Thanks, Willem Voigt

  • Problem in Synchronizing LDAP Password

    I have done every step as described in idm doc to synchronize LDAP password to IdM, but I encountered a problem when activeSync is fetching the idmpasswd attribute value from LDAP. In my activeSync log I have the message below: 2006-05-29T10:12:05.20

  • Migrating from 9i to 10g through exp/imp

    Hi, We need to migrate a database on 9i in HP-UNIX to 10g in IBM AIX. Can you please tell me whether i can export data in 9i with 9i export utility and import it into 10g using 10g data pump utility for faster import ? We don't have the 10g software