Regarding currency comaprison in select statement

Hi,
     I am tring to compare currency field in the selct statement with GT, LT symbols. Its going for dump.
My selct statement is
SELECT SINGLE * FROM ZMM_SIGN_AUTH INTO
          itab WHERE AMOUNT1 LT ITAB_IN-VALUE
         AND AMOUNT2 GT  ITAB_IN-VALUE AND
         PLANT = L_WERKS.
where amount1, amount2, itab_in-value are curr (15 , 2 decimals).
above selct is going for dump by giving the message that unable to interpret trhe value as number.
Please tell me how compare.
thanks,
kishore

Hi,
Refer this sample code it is working
DATA: itab LIKE STANDARD TABLE OF EKPO.
DATA: value(15) TYPE c value '2999.00'.
DATA: val LIKE ekpo-netpr.
<b>val = value.</b>
SELECT * FROM EKPO INTO
         table itab
         WHERE NETWR LT val
         AND BRTWR GT val
         AND werks = 'IT01'.

Similar Messages

  • Regarding Logical database and  select statement..

    Hi
    Experts.
    i would  like to  know the  diff b/w logical data base & select statement  while using report.
    wt is the use of logical databases in R/3. is there   any   advantage  used in the  reports.
    Thanks & Regards..
    Spandana.

    Dear Spandana,
      Go through the below description of LDB. I hope you wil get a fair amount of idea.
    SAP comes loaded with all the extras. Among the extras that are most helpful to IT managers are all the access routines needed to pull any business object that managers can think of out of SAP databases. However, SAP has not thought of everything where your particular applications are concerned. SAP organizes its standard database tables to service business units based on conventional business applications. Itu2019s likely your business requires something new, perhaps even something exotic. In that case, you will need to create a new database, using information from different places. Basically, you need a logical database. You need to create a virtual business data object repository consisting of a new kind of record or table that suits your purposes. In addition, the repository should be composed of information that is actually stored in a number of different locations, none of them necessarily logically associated with one another. Letu2019s take a closer look at creating logical databases.
    A case for a logical database
    Suppose my company manufactures widgets of the most obscure variety, and they are components of other widgets. I sell my widgets as raw material for the more sophisticated widgets built by others, but in some cases I actually partner with other manufacturers in creating yet another class of widget. Now, in my world, I consequently have customers who are also partners. I sell to them and I partner with them in manufacturing and distribution. Also, I need an application that uses both of these dual-use relationships.
    Essentially, I have a customer database and a partner database. Neither contains records that are structured to contain the identifying particulars of the other. Thus, I need a hybrid database that gives me tables detailing these hybrid relationships. What can I do? I can go the long way around and write a new database, pulling information from both and creating new objects with a customized program that I write by hand. However, this process is cumbersome and contains maintenance issues. On the other hand, I can use SAPu2019s logical database facility, create my logical database in a couple of minutes, and have no maintenance issues at all.
    Logical database structures
    There are three defining entities in an SAP logical database. You must be clear on all three in order to create and use one.
    u2022     Table structure: Your logical database includes data from specified tables in SAP. There is a hierarchy among these tables defined by their foreign keys (all known to SAP), and you are going to define a customized relationship between select tables. This structure is unique and must be defined and saved.
    u2022     Data selection: You may not want or need every item in the referenced tables that contributes to your customized database. There is a selection screen that permits you to pick and choose.
    u2022     Database access programming: Once youu2019ve defined your logical database, SAP will generate the access subroutines needed to pull the data in the way you want it pulled.
    Creating your own logical database
    ABAP/4 (Advanced Business Application Programming language, version 4) is the language created by SAP for implementation and customization of its R/3 system. ABAP/4 comes loaded with many predefined logical databases that can construct and table just about any conventional business objects you might need in any canned SAP application. However, you can also create your own logical databases to construct any custom objects you care to define, as your application requires in ABAP/4. Hereu2019s a step-by-step guide:
    1.     Call up transaction SLDB (or transaction SE36). The path you want is Tools | ABAP Workbench | Development | Programming Environment | Logical Databases. This screen is called Logical Database Builder.
    2.     Enter an appropriate name in the logical database name field. You have three options on this screen: Create, Display, and Change. Choose Create.
    3.     Youu2019ll be prompted for a short text description of your new logical database. Enter one. Youu2019ll then be prompted to specify a development class.
    4.     Now comes the fun part! You must specify a root node, or a parent table, as the basis of your logical database structure. You can now place subsequent tables under the root table as needed to assemble the data object you want. You can access this tree from this point forward, to add additional tables, by selecting that root node and following the path Edit | Node | Create. Once youu2019ve saved the structure you define in this step, the system will generate the programming necessary to access your logical database. The best part is you donu2019t have to write a single line of code.
    Watch out!
    The use of very large tables will degrade the performance of a logical database, so be aware of that trade-off. Remember that some tables in SAP are very complex, so they will be problematic in any user-defined logical database.
    Declaring a logical database
    Hereu2019s another surprising feature of logical databases: You do not assign them in your ABAP/4 Code. Instead, the system requires that you specify logical databases as attributes. So when you are creating a report, have your logical database identifier (the name you gave it) on hand when you are defining its attributes on the Program Attributes screen. The Attributes section of the screen (the lower half) will include a Logical database field, where you can declare your logical database.
    Logical databases for increasing efficiency
    Why else would you want to create a logical database? Consider that the logical databases already available to you begin with a root node and proceed downward from there. If the data object you wish to construct consists of items that are all below the root node, you can use an existing logical database program to extract the data, then trim away what you donu2019t want using SELECT statementsu2014or you can increase the speed of the logical database program considerably by redefining the logical database for your object and starting with a table down in the chain. Either way, youu2019ll eliminate a great deal of overhead.
    Regards
    Arindam

  • Using if the else logic in regards to a select statement for a report

    Hi all,
    I've a question regarding if then else logic in Oracle.
    I'm developing a report application which contains 3 selectlists
    - ProductGroup - SubGroup - Manufacturer
    Each one containing several values. And are based on eachother, meaning if you select an item from the PG list, you only get the SG items regarding the PG item you've choosen before. The process logic should be as the following:
    When a user selects one item from for example the PG list, the query will be:
    select * from x where PG = :P_PG
    and the report displays all the items in the PG category selected
    The other two bindvariables would be null as the user didn't pick them
    If he then proceeds and selects one item from the SG list, the query would be:
    select * from x where PG = :P_PG and SG = :P_SG
    and the report displays all the items in the PG and SG category selected
    If he then proceeds and selects one item from the MA list, the query would be:
    select * from x where PG = :P_PG and SG = :P_SG and MA =:P_MA
    and the report displays all the items in the PG and SG and MA category selected
    Now, I've read some documentation about the decode function, but I can't figure it out, please help.
    Peter

    Okay, Chet, have set it up on htmldb, so you can see my problem, will go in high detail, it is not producing what I want. Example on htmldb:
    DEMO/test
    http://htmldb.oracle.com/pls/otn/f?p=33229:6
    Defenitions:
    3 LOV's, namely:
    - LOVPG - select distinct productgroep, productgroep pg from plijst
    - LOVSG - select distinct subgroep, subgroep sg from plijst where productgroep = :P6_LOVPG
    - LOVLE- select distinct leverancier, leverancier le from plijst where productgroep = :P6_LOVPG and subgroep = :P6_LOVSG
    3 Selectitems with submit, namely:
    - :P6_LOVPG
    - :P6_LOVSG
    - :P6_LOVLE
    Report region select statement:
    select * from plijst where (productgroep = :P6_LOVPG or :P6_LOVPG IS NULL) and (subgroep = :P6_LOVSG or :P6_LOVSG IS NULL) and (leverancier = :P6_LOVLE or :P6_LOVLE IS NULL)
    Branch to:
    Branche to page on submit after processing
    What it should do is:
    When you select an item from the first selectlist, productgroep, the report should show all rows containing the specified productgroep.
    When the user selects the next item in the subgroep selectlist, the report should show all rows containing the previously selected prodctgroup and the just selected subgroep.
    When the user selects the final item , the report should show all rows based on all three selected itemvalues, productgroep, subgroep, leverancier.
    The problem is that with this setup the report is only generated after the final selectlist choice of the user. But the user should see a report before that, going deeper into the structure. Hope, you see my problem?
    Sincerely,
    Pete

  • Query regarding Oracle SQL select statement

    Hi,
    How does Oracle ensures a consistent snapshot with the select statement
    without locking the table. My question is summarized with an example below:
    1. At time T1, Oracle select statement is fired and is fetching the result.
    2. At time T2, some DML operation is performed on the same table on which
    the select was executed and a commit was fired.
    3. At time T3, The Oracle select statement (Step 1) completes.
    My question is whether the records of transaction at time T2 will be visible at time T3 or not?
    If "not", then does it mean that Oracle retrieves the rows from the time of last commit.
    I would also like to know if for the above mechanism, Oracle would make use of the rollback segemt to access the rows at a particular instant of time.
    TIA
    Regards,
    Raj

    This is called Read Consistency in the oracle. Its all about SCN before starting the transaction.
    Lets say
    1. T1 executs SELECT statement on EMP table.
    2. T2 made an update on the EMP and commited.
    But, T1 only still sees only old image of the data not the new one. This is called read consistency.
    You will be having two images in the buffer, one is consistent and changed image.
    When the T1 give SELECT statement it notes the SCN of the transaction. Read oracle document about read consistency.
    SJH.

  • Regarding select statement

    Hi Expert,
    Is this select statement is ok ?
    actually i have doubt in where clause when it mix both AND and OR without braces
    SELECT SINGLE * FROM vbfa WHERE
                 vbeln = s_bkpf-awkey AND
                   vbtyp_v = 'C'   OR
                   vbtyp_v = 'E'   OR
                   vbtyp_v = 'M'  OR
                   vbtyp_v = 'J'   OR
                   vbtyp_v = 'R' .
    thanks and regards
    abaper.

    SELECT SINGLE * FROM vbfa WHERE
    vbeln = s_bkpf-awkey AND ( vbtyp_v = 'C' OR
    vbtyp_v = 'E' OR
    vbtyp_v = 'M' OR
    vbtyp_v = 'J' OR
    vbtyp_v = 'R' ).
    OR YOU CAN USE
    SELECT SINGLE * FROM vbfa WHERE
    vbeln = s_bkpf-awkey AND
    vbtyp_v IN ('C', 'E', 'M', 'J', 'R') .
    CHECK THE SPACE NO SPACE BETWEEN  ('C' AFTER , ONE SPACE AND NO SPACE BETWEEN 'R'). GIVE THE SPACE CORRECTLY ...
    REGARDS
    SHIBA DUTTA

  • Regarding select statement on structure

    hi,
    can we write select on structure?.........i hav  to get condition record from konv(which is a structure) based on ekpo-ebeln.
    for this i hav written code like this
    IF NOT it_ekpo IS INITIAL.
        SELECT knumv
               kposn
               kschl
               kbetr
               waers
               KWERT
          FROM konv
          INTO TABLE it_konv
           FOR ALL ENTRIES IN it_ekpo
          WHERE knumv = it_ekpo-ebeln
            and kposn = it_ekpo-ebelp
            AND ( kschl EQ 'ZPF3' OR kschl EQ 'ZVAT'
                OR kschl EQ 'ZCSR' OR kschl EQ 'ZFR3' ).
        IF sy-subrc EQ 0.
          SORT it_konv BY knumv kposn.
        ENDIF.
      ENDIF.

    Hi
    You cannot write the Select statement on Structures but yo have a table for that structure where you will get the same data.
    You can use komv & konp table instead of structure .
    IF NOT IT_EKPO IS INITIAL.
      SELECT KNUMV
             KPOSN
             KSCHL
             KBETR
             WAERS
             KWERT
             FROM KONV
             INTO TABLE IT_KONP
             FOR ALL ENTRIES IN IT_EKPO
             WHERE KNUMV = IT_EKPO-EBELN
             AND ( KSCHL EQ 'ZPF3' OR KSCHL EQ 'ZVAT'
             OR KSCHL EQ 'ZCSR' OR KSCHL EQ 'ZFR3' ).
    ENDIF.
    Thanks & regards,,
    Dileep .C

  • Urgent: regarding sub select statement

    I making a report in which i have to display the STOCK and i want to do the sum in a select statement of the value coming from the field AFRU-GMNGA so that i can do calculation of the value of 1st field to be subtracted from the last value of the same field .
    can anybody provide me example of it as i am currently using dis select statement:-
    SELECT AMATNR ALGORT BGMNGA BVORNR C~MEINS FROM AFPO AS A
      INNER JOIN AFRU AS B ON AAUFNR = BAUFNR
        INNER JOIN MARA AS C ON AMATNR = CMATNR
          INTO TABLE ITAB
          WHERE MTART IN MAT_TYPE AND A~MATNR IN P_MATNR .
    plzz help me out as it is really urgent to me.

    Hi,
    Go thr the below select query.
    select tvkwzwerks a350kschl a350vkorg konpkbetr
           from tvkwz inner join a350 on tvkwzvkorg = a350vkorg inner join konp
           on a350knumh = konpknumh into table itab where  tvkwz~werks = '1003'
           and a350~kschl = 'ZCPA'.
    Regards,
    vijay

  • Regarding max select statement.

    hi ,
        i m using max in select statement but its nt showing the o/p,cud u plz help me..thnx in advce.here i m giving the code....
    tables:s032.
    select-options:s_matnr for s032-matnr.
    data:begin of itab occurs 0,
         matnr like s032-matnr,
         letztzug like s032-letztzug,
         end of itab.
    select  matnr
    MAX( letztzug )
    into corresponding
    fields of
    table itab from s032 where matnr in s_matnr
    group by matnr
    order by
    matnr
    loop at itab.
    write:/ itab-matnr,itab-letztzug.
    endloop.

    select matnr
    MAX( letztzug )
    into
    table itab from s032 where matnr in s_matnr
    group by matnr
    order by
    matnr
    dont use corresponding fields of clause it is not matching the field name with max function.
    regards
    shiba dutta

  • Regarding this select statement

    hi,
    i am not getting value i write like this select statement
    plz check error in this code.
    TABLES: VBAK,
    vbrk.
    TYPES: BEGIN OF TYP_VBAK,
          VBELN TYPE VBELN_VA,
          VBTYP TYPE VBTYP,
          VGBEL TYPE VGBEL,
          END OF TYP_VBAK,
           BEGIN OF TYP_VBRK,
              VBELN TYPE VBELN,
              WAERK TYPE WAERK,
              VKORG TYPE VKORG,
              KNUMV TYPE KNUMV ,
              FKDAT TYPE FKDAT,
              LAND1 TYPE LLAND,
              NETWR TYPE NETWR,
              KUNRG TYPE KUNRG,
              EXNUM TYPE EXNUM,
              MWSBK TYPE MWSBP,
              END OF TYP_VBRK.
    DATA: GT_VBAK TYPE TABLE OF TYP_VBAK,
          IT_VBRK TYPE standard TABLE OF TYP_VBRK WITH HEADER LINE.
         LS_VBRK TYPE TYP_VBRK,
      SELECT VBELN
             WAERK
             VKORG
             KNUMV
             FKDAT
             LAND1
             NETWR
             KUNRG
             EXNUM
             FROM VBRK INTO CORRESPONDING FIELDS OF TABLE IT_VBRK
             WHERE VBELN = '0090060045'.

    Check from SE16 whether vbeln = 0090060045 is present in VBRK or not.
    Regards,
    Joy.

  • Regarding select statement for this requirement

    Hi................
    good evening
    here is a requirement.
    i want to retrieve data from the following table.but how to join these table is my dought.
    tables  fields
    t001w--werks " plant id
    t001w--name1 " pl;ant name
    t001w--regio " plant address
    ekko--ebeln " purchase  order
    ekko-erdat : creation date
    ekko-ernam "name of the person
    ekpo-ebelp " item
    ekpo-bstyp "purchase order type
    eket-erdat " delivery date
    mara-matnr " material number
    these are the tables and fields.now we want to retrive data from these tables
    how we have to code select statement.
    selection-screen is
    plant id
    order type
    delivery date
    please provide select statement for this requirement.
    thanks and regards.
    k.swaminath  reddy.

    Is this what you are looking for?
    SQL> CREATE OR REPLACE FUNCTION f_team
      2  RETURN VARCHAR2
      3  IS
      4    s_return VARCHAR2(500);
      5  BEGIN
      6    FOR i IN ( select team from t_team order by 1) LOOP
      7      s_return := s_return || i.team || ', ';
      8    END LOOP;
      9   
    10    RETURN substr(s_return, 1, length(s_return) - 2);
    11  END;
    12  /
    Function created.
    SQL>  SELECT f_team FROM dual;
    F_TEAM
    Australia, Bangladesh, England, India, Kenya, Pakistan, South Africa, UAE, USA, West Indies, Zimbabwe
    SQL>

  • Regarding error in select statement

    Hello CRM Gurus,
    i have 2 questions to ask from you all:-
    1. i am getting a problem of overlapping of values fetched by select statement.. so any idea what shall i do?
    2. practically when we use for all entries in select statement if possible explain through a buisness scenario?
    anhiyta ..

    HI Anhitya,
    1. for select statement are you using both the select statement in 1 loop or in 1 condition?
    2. we use for all entries when we require to compare on basis of all the entries present in a table
    for example if u have to fetch address of a bp partner then u wiill select bp from but000 into itab
    and den u will write select addr from  butadr for all entries in itab.
    i hope this may help
    saloni

  • Regarding a select statement

    hi,
    i got a select statement in my program as shown below
    select * from ce4e001 where bukrs eq s_bukrs-low.
    check s_kndnr.
    check s_prctr.
    move-corresponding ce4e001 to v_ce4e001.
    append v_ce4e001.
    endselect.
    now i want to rewrite this select statement with using  into table like
    select * from ce4e001 into table v_ce4e001 where bukrs eq s_bukrs-low.
    but my problem is
    in the initial select statement they have used two check statements before appending
    now how can i incorporate those two check statements in my new select statement
    thanks
    ram

    Hi Ram,
    Not sure why the check keywords where embedded within the select statments...it will have no impact if the selection variable where outside.
    You could rewrite your new code as:
    check s_kndnr.
    check s_prctr.
    select * from ce4e001 into table v_ce4e001 where bukrs eq s_bukrs-low.
    Assign points if it works.
    Thanks
    -Saif

  • Optimizing a Select Statement

    Hi,
    I have recently been asked to generate a program that reports of payroll postings to FI.  This involves creating a giant select statement from the ppoix table to gather all the postings.  My select statement is as follows:
      SELECT pernr                       "EE Number
             seqno                       "Sequential number
             actsign                     "Indicator: Status of record
             runid                       "Number of posting run
             postnum                     "Number
             tslin                       "Line number of data transfer
             lgart                       "Wage Type
             betrg                       "Amount
            waers                       "Currency
            anzhl                       "Number
            meins                       "Base unit of measure
             spprc         "Special processing of posting items
            momag         "Transfer to FI/CO:EE grouping for acct determi
            komok         "Transfer to FI/CO: Symbolic account
            mcode                       "Matchcode search term
            koart                       "Account assignment type
            auart                       "Expenditure type
            nofin         "Indicator: Expenditure type is not funded
               INTO CORRESPONDING FIELDS OF TABLE i_ppoix
               FROM ppoix
               FOR ALL ENTRIES IN run_doc_xref
               WHERE runid  = run_doc_xref-runid
                 AND tslin  = run_doc_xref-linum
                 AND spprc  <> 'A'
                 AND lgart IN s_lgart
                 AND pernr in s_pernr.
    where s_pernr is a select option that holds personnel nummbers and s_lgart is a select option that holds wagetypes.  This statement works fine for a certain amount of personnel numbers and a certain amount of wagetypes, but once you exceed a certain limit the Database does not allow you to perform a select statement this large.  Is there a better way to perform such a large select such as this one) ie: FM, or some other method I am not aware of.  This select statement comes from the standard SAP delivered cost center admin report and this report dumps as well when too much data is passed to it.
    any ideas would be much appreciated.
    thanks.

    The problem here is with the select-options.
    For a select statement, you cannot have more that certain amount of data.
    The problem with your select becomes complex because of the FOR ALL ENTRIES in and the huge s_pernr and the 40 million records :(.
    I am guessing that the s_lgart will be small.
    How many entries do you have in internal table "run_doc_xref"?
    If there are not that many, then I would suggest this:
    TYPES:
      BEGIN OF ty_temp_ppoix,
       pernr   TYPE ppoix-pernr,
       lgart   TYPE ppoix-lgart,
       seqno   TYPE ppoix-seqno,
       actsign TYPE ppoix-actsign,
       runid   TYPE ppoix-runid,
       postnum TYPE ppoix-postnum,
       tslin   TYPE ppoix-tslin,
       betrg   TYPE ppoix-betrg,
       spprc   TYPE ppoix-spprc,
      END OF ty_temp_ppoix.
    DATA:
    i_temp_ppoix TYPE SORTED TABLE OF ty_temp_ppoix
       WITH NON-UNIQUE KEY pernr lgart
       INITIAL SIZE 0
       WITH HEADER LINE.
    DATA:
      v_pernr_lines TYPE sy-tabix,
      v_lgart_lines TYPE sy-tabix.
    IF NOT run_doc_xref[] IS INITIAL.
      DESCRIBE TABLE s_pernr LINES v_pernr_lines.
      DESCRIBE TABLE s_lgart LINES v_lgart_lines.
      IF v_pernr_lines GT 800 OR
         v_lgart_lines GT 800.
    * There is an index on runid and tslin. This should be ok
    * ( still bad because of the huge table :(  )
        SELECT pernr lgart seqno actsign runid postnum tslin betrg spprc
    * Selecting into sorted TEMP table here
          INTO TABLE i_temp_ppoix
          FROM ppoix
          FOR ALL ENTRIES IN run_doc_xref
          WHERE runid = run_doc_xref-runid
          AND   tslin = run_doc_xref-linum
          AND   spprc <> 'A'.
    * The sorted table should make the delete faster
        DELETE i_temp_ppoix WHERE NOT pernr IN s_pernr
                            AND   NOT lgart IN s_lgart.
    * Now populate the actual target
        LOOP AT i_temp_ppoix.
          MOVE: i_temp_ppoix-pernr TO i_ppoix-pernr.
    *  and the rest of the fields
          APPEND i_ppoix.
          DELETE i_temp_ppoix.
        ENDLOOP.
      ELSE.
        SELECT pernr seqno actsign runid postnum tslin lgart betrg spprc
    * Selecting into your ACTUAL target here
          INTO TABLE i_ppoix
          FROM ppoix
          FOR ALL ENTRIES IN run_doc_xref
          WHERE runid = run_doc_xref-runid
          AND   tslin = run_doc_xref-linum
          AND   spprc <> 'A'
          AND   pernr IN s_pernr
          AND   lgart IN s_lgart.
      ENDIF.
    ELSE.
    * Error message because of no entries in run_doc_xref?
    * Please answer this so a new solution can be implemented here
    * if it is NOT an error
    ENDIF.
    Hope this helps.
    Regards,
    -Ramesh

  • Select statement dump

    Hi,
    Am getting dump with the below select statement in ECC 6.0,
    where as the same select works fine in 4.7C.
    SELECT distinct aebeln abukrs absart alifnr azterm aekorg aekgrp awaers awkurs akdatb akdate aunsez bebelp btxz01 bwerks blgort bbednr bmatkl bidnlf bmeins bbprme bnetpr bpeinh bknttp badrn2 csakto canln1 caufnr cgsber cps_psp_pnr detenr dlpein deindt dwemng dslfdt dmenge
    INTO CORRESPONDING FIELDS OF TABLE it_output FROM
    ( ( ( ekko AS a INNER JOIN ekpo AS b ON aebeln = bebeln )
    INNER JOIN ekkn AS c ON bebeln = cebeln and bebelp = cebelp )
    INNER JOIN eket AS d ON cebeln = debeln and cebelp = debelp )
    WHERE aebeln IN s_ebeln AND alifnr IN s_lifnr AND a~bukrs IN s_bukrs.
    Whether I've to add anything addition for select distinct statement in ecc 6.0 or is it obsolette?
    can oneone help in this regards?
    Thanks,
    Ponraj.s.

    Hi,
    This is only dev.server and it consists only few records.
    TYPES: BEGIN OF ty_output,
    *********Header data*****************************
            rectype_line1(1) TYPE c,
            rectype_line2(1) TYPE c,
            rectype_line3(1) TYPE c,
            rectype_line4(1) TYPE c,
            ebeln    TYPE ebeln,
            bukrs    TYPE bukrs,      "Company Code
            bsart    TYPE bsart,      "Documnet Type
            lifnr    TYPE lifnr,
            zterm    TYPE dzterm,
            ekorg    TYPE ekorg,      "Purchase Org
            ekgrp    TYPE ekgrp,      "Purchase grp
            waers    TYPE waers,      "Currency
            wkurs    TYPE wkurs,      "Exchange rate
            wkurs1(9) TYPE c,
            kdatb    TYPE kdatb,
            kdate    TYPE kdate,      "Validity end date
            unsez    TYPE unsez,      "Our Reference
    ********Line item data***************************
            ebelp   TYPE ebelp,      "po item
            txz01    TYPE txz01,      "Item Text
            werks    TYPE werks,      "Plant
            lgort    TYPE lgort_d,      "Storage Location
            bednr    TYPE bednr,      "Tracking No
            matkl    TYPE matkl,      "Material group
            idnlf    TYPE idnlf,      "Vendor Material No
            meins    TYPE meins,      "Order unit
            bprme    TYPE bprme,      "Order price unit
            netpr    TYPE netpr,      "Net price
            netpr1(11) TYPE c,
            peinh    TYPE peinh,      "Price unit
            peinh1(5) TYPE c,
            knttp    TYPE knttp,      "Acc Assgnment
            adrn2    TYPE adrn2,
    **************G/L Account data***********************
            menge2(13)   TYPE c,      "PO Quantity
            sakto    TYPE sakto,      "GL Acc No
            anln1    TYPE anln1,      "Main Asset number
            aufnr    TYPE aufnr,      "Order Number
            gsber    TYPE gsber,      "Business Area
            ps_psp_pnr(8) TYPE c,
    **********Item schedule data*******************************
            etenr    TYPE etenr,
            lpein    TYPE lpein,      "Delivery date category
            eindt    TYPE eindt,      "Delivery date
            menge   TYPE menge,      "Schedule Quantity
            menge1(13) TYPE c,
            wemng  TYPE wemng,
            wemng1(13)  TYPE c,
            slfdt    TYPE slfdt,      "Start of Delivery date
           END OF ty_output.
    DATA : it_output TYPE STANDARD TABLE OF ty_output.
    This is my table declaration,pls help me in resolving this issue.

  • Select statement operators in ecc 6.

    Hi Experts,
    I have a small doubt about the '>=' ( greater than or equal to ) operator usage in select statement. Is this operator by any chance perform not as desired in ECC 6.0. Is it a good option to use 'GE' instead of '>='. ?
    It may sound a bit awkward, but still I would like to know. I am facing a situation, which could be related to this. An early response would be highly appreciated.
    I would request,you NOT TO REPLY with links/explanations which says how to use select statement. Only answer if you have the  answers related to this query.
    Regards,
    Sandipan

    >
    Jaideep Sharma wrote:
    > Hi,
    > The only difference is GE will take a little more time than >= as system need to convert the keyword into actual operator when fetching data from Database.
    >
    > KR Jaideep,
    ????? Every Open SQL statements is translated to the SQL slang the underlying database is talking regardless if you type GE or >=
    If the result differs using >= or GE i would open a call at SAP instead of asking in SDN.

Maybe you are looking for