PO reference in BSIK table

Hi ,
i want the PO detials for the vendor documents posted in BSIK table,
i could get in BSEG table but for perfoirmace reason i want to avoid it , then how to get the PO number from the BSIK tables
or any other tables are avaialable for the same
regards
afzal

Hi
While posting MIRO give in the Ref field as PO no.12345, It will autmatically updates

Similar Messages

  • Reference field and table for AUFK for F4 help in alv.

    Hi All,
       I need to put F4 help on ALV for order no (AUFK) what is the reference field and table for that?
      i tried giving field as aufk and table as ccss but its not working.
       ls_fcat-ref_field = 'AUFNR'.
        ls_fcat-ref_table = 'CCSS'.
    Thanks & Regards,
    Ruchi Tiwari

    Hi,
    Try this.
    Set the f4 help for the field in the fieldcatalog
      ls_fcat-f4availabl = 'X'.
    1. Create a event of ONF4 for the alv grid.
    2. Set the event handler.
    3. Append the field for the F4 help in the internal table and call the below method
        CALL METHOD g_mprn->register_f4_for_fields
        EXPORTING
          it_f4 = i_f4.
    4. create a class definition and implementation
        refer sample pgms (BCALV_F4, BCALV_GRID_EDIT_DELTA and BCALV_GRID_EDIT)
    Hope this may be helpful.
    Regards,
    Sharin.

  • BSIS and BSIK table Fields

    Dear Experts,
    I m coding a Vendor GL report and using bsik and bsis table.
    problem is when i check for a document ( say 1100000290 open document), i dont get any entry of prctr, bupla or secco in bsis and bsik tables. but when i chek same document in BSEG (which i don't want to use, because its a cluster table) , I get bupla, prctr and secco fields value.
    Do i need to use some other tables also ?????????
    Any suggestions.
    Regards,
    Maverick

    After selecting data from BSIS & BSIK you must be having the fields BUKRS, GJAHR, BELNR, BUZEI. Correct ?
    These fields are key fields of BSEG. You can select data from BSEG using FOR ALL ENTRIES and in the WHERE condition pass the fields BUKRS, GJAHR, BELNR, BUZEI. I don't think selecting data based on key fields from cluster tables will give any performance issues.
    Cheers,
    Suhas

  • How to find open item in bsik table

    anyone can tell me how to find open items for vendor in bsik table or it will store only open item.
    i debug the tcode fbl1n to see . but not able to find
    Kumar

    Hi
    There is no specific field name for open item in the table BSIK.Yes BSIK include a structure named ABSIK_PSO and which is a "IS-PS: Data appendix of open items vendors".
    Yes there is a field name
    BUZEI - Line Item
    EBELP - Item
    You check with your requirement again and try to use these fields,if you still facing some probs than write back to me,i will try to give the appropriate solutions.
    Thanks
    Mrutyunjaya Tripathy

  • GetPivotData with cell reference in a Table

    I was told that this might be a better place to post this question than Microsoft Answers for Office.
    I have a Table in which I need to use a GetPivotData function.  I need to use a cell reference in that GetPivotData function.  I have done this before with no problem in a normal cell range, but it seems like the syntax when using a Table screws
    things up.  Can anyone help me out here?
    The GetPivotTable function would normally look like this if not in a Table.
    =GETPIVOTDATA("[Measures].[Total Blocked Dollars]",'Sheet2'!$A$4,"[Dim Prod Ctrl No].[By Prod Ctrl No]","[Dim Prod Ctrl No].[By Prod Ctrl No].&[18418]")
    That formula sits in a column called "Block" in my Table.  The 18418 sits in a column called "ID" in my table.  So what I have tried is:
    =GETPIVOTDATA("[Measures].[Total Blocked Dollars]",'--Report Blocks--'!$A$4,"[Dim Prod Ctrl No].[By Prod Ctrl No]",concatenate("[Dim Prod Ctrl No].[By Prod Ctrl No].&[",[@[ID]],"]"))
    I have tried a few combinations like this but I can't seem to use a cell reference from a table (which requires the [@[field]] syntax) to work with the GetPivotData.
    Any ideas?
    Thanks!

    That's not the issue.  The GETPIVOTDATA function is actually IN a table.  The arguments for the GETPIVOTDATA function need to reference a cell/column in the table, and it's only PART of the argument that needs to be replaced.  In the example
    below the 18418 needs to be replaced with the data in the same row of the table in a column named ID.
    =GETPIVOTDATA("[Measures].[Total Blocked Dollars]",'Sheet2'!$A$4,"[Dim Prod Ctrl No].[By Prod Ctrl No]","[Dim Prod Ctrl No].[By Prod Ctrl No].&[18418]")
    Does that clarify any?
    Thanks for the response!

  • Create data reference to a table that is known at runtime

    Hi,
    I am trying to create a data reference to a table that is known only at runtime. In system 4.6C, I am not able to insert this coding
    data: lr_data type ref to data.
    CREATE DATA lr_data type table of (structure_name).
    In hihger releases, I am able to do so.
    Could you please tell me how to solve this problem in 4.6C?
    Best regards,
    Fabian

    Hi fabian,
    If i understood,
    u want to create a dynamic internal table.
    1.
      For this purpose,
      in my program,
      there is an INDEPENDENT FORM
      whose inputs are
      TABLE NAME / STRUCTURE NAME
      and from those, it consructs dynamic table.
    2. Here is the program.
    the dynamic table name will be
    <DYNTABLE>.
    3. U can use this program (FORM in this program)
    to generate any kind of internal table
    by specifying TABLE NAME .
    4.
    REPORT abc.
    COMPULSORY
    FIELD-SYMBOLS: <dyntable> TYPE ANY TABLE.
    FIELD-SYMBOLS: <dynline> TYPE ANY.
    DATA: lt TYPE lvc_t_fcat.
    DATA: ls TYPE lvc_s_fcat.
    FIELD-SYMBOLS: <fld> TYPE ANY.
    DATA : fldname(50) TYPE c.
    parameters : iname LIKE dd02l-tabname.
    START-OF-SELECTION.
    PERFORM
    PERFORM mydyntable USING lt.
    BREAK-POINT.
    INDEPENDENT FORM
    FORM mydyntable USING ptabname.
    Create Dyn Table From FC
    FIELD-SYMBOLS: <fs_data> TYPE REF TO data.
    FIELD-SYMBOLS: <fs_1>.
    FIELD-SYMBOLS: <fs_2> TYPE ANY TABLE.
    DATA: lt_data TYPE REF TO data.
    data : lt TYPE lvc_t_fcat .
    DATA : ddfields LIKE ddfield OCCURS 0 WITH HEADER LINE.
    CALL FUNCTION 'DD_NAMETAB_TO_DDFIELDS'
    EXPORTING
    tabname = iname
    TABLES
    ddfields = ddfields.
    CONSTRUCT FIELD LIST
    LOOP AT ddfields.
    ls-fieldname = ddfields-fieldname.
    APPEND ls TO lt.
    ENDLOOP.
    ASSIGN lt_data TO <fs_data>.
    CALL METHOD cl_alv_table_create=>create_dynamic_table
    EXPORTING
    it_fieldcatalog = lt
    IMPORTING
    ep_table = <fs_data>
    EXCEPTIONS
    generate_subpool_dir_full = 1
    OTHERS = 2.
    IF sy-subrc <> 0.
    ENDIF.
    Assign Dyn Table To Field Sumbol
    ASSIGN <fs_data>->* TO <fs_1>.
    ASSIGN <fs_1> TO <fs_2>.
    ASSIGN <fs_1> TO <dyntable>.
    ENDFORM. "MYDYNTABLE
    regards,
    amit m.

  • Reference to a table in formula

    Before updating to the new numbers, I was able to reference to an entire table in different formulas. So I could add new data to a table and the formula still worked. See example below:
    In the new numbers though, I am not able to select a table without also selecting rows or coloums:
    So the question is:
    Are there a way to make a raference to an entire table in a formula in the new numbers?
    Additional info
    I use the function when working with statistics, when I want to be able to add more observations to my data.

    The ability to reference an entire table was removed in Numbers 3. 
    =SUM(Table 1::B:C) would be the equivalent function in your case.
    =SUM(Table 1::2:7) would also work
    The first formula will include newly added rows but not new columns added to the right.
    The second formula will include new columns but not new rows added to the bottom.

  • Reference a Derived table in another Derived Table

    Is it possible to reference a derived table from another derived table? I am using Business Object XI 3.0.

    This is not possible as the Designer wants physical tables...
    What you could do is create the second derived table as follows:
    SELECT     table1.col1,
         table1.col2,
         table2.col1,
         table2.col2
    FROM     table1,
         (SELECT col1,
              col2
         FROM     atable) table2
    Regards
    Jacques

  • Can a subquery hosted within a table reference that hosting table?

    I have a large table that tracks Orders and Deliveries ("OrderAssign"). The OrderID column has a dropdown with a query that references some other tables that cover order details, like when each Order is due.
    I'd like the dropdown query to only display order details for Orders that haven't been filled ("OrderAssign.Filled = 0"). The problem, I think, is that this would mean the query would reference the table that hosts it. Is this possible? I tried
    to set up a test case, and got a generic syntax error I've seen many times before when the syntax is correct, but I'm using a SQL structure that Access doesn't like. 
    This table is linked to SQL, so I could also write a SQL view or function if that makes a difference.
    I'm using Access 2010. Thanks!
    EDIT: Huh, so I figured out a way, I think. I created a SQL view that filtered the records the way I wanted; then used the Linked Table Manager to create a linked view; then used that linked view in my dropdown subquery.
    So I guess my follow up question to this is: is there any reason I SHOULDN'T do this? Will there be any issues with existing records in the table whose values will no longer show up in the constraining dropdown subquery?
    EDIT 2: And I think I found the deal breaker. The field doesn't display the first column with the "real" info, the ID#. It displays the second. Once you add a query that doesn't display every row in the table, that query no longer has results to
    display for the filtered records. So some of the records display the "real" info, which the users don't want to see, and the open records show the second field. Messy.
    hydrogonium

    I might not be using the right terminology. I have a lot of experience with SQL Server, relatively little with Access. I am doing this for a client who is used to entering data directly into the table, and wants minimal changes. However, the dropdown literally
    has thousands of entries, which could be pruned by ~80% if filled orders are filtered out.
    The table has "dropdown subqueries" (probably not the right term), which were created like so:
    - Go to the Design tab.
    - Click on the field you want to modify.
    - Go to the lookup tab.
    - Change the Display Control to 'Combo Box'
    - Change the Row Source to a query, in my case, 'SELECT * FROM LinkedSQLView'
    - Format the list as you want it displayed; in my case, the actual ID# is hidden in the first column, and the other ten columns are displayed.
    The fields in question are:
    - OrderRequestID (Number on Access / Int on SQL Server) - has a dropdown.
    - OrderFillID (Number on Access / Int on SQL Server) - has a dropdown.
    - OrderFilled (Yes/No on Access / Bit on SQL Server).
    Purpose / Background: This table is basically a clearinghouse for entities making orders and other entities filling them. My client sits in the middle and matches everything up. It can get very complicated, because different products qualify for different
    orders, and the amount supplied can be smaller or greater than an individual order.
    hydrogonium

  • Bsik table

    Hi All,
    From bsik table i have to fetch only vendor open items .
    what are the fields to be considered so that i can eliminate the other items like parked , deleted......etc
    and get only the open items for that vendor..
    Thanks.

    Hi,
    to select open items for vendor you should read from table BSIK.
    After this you can read table BSEG with BSIK-BUKRS, BSIK-BELNR, BSIK-GJAHR.
    ( Bseg is a cluster table and selections for vendor are slower than bsik)
    for example:
    code
    select * from bsik
    where bukrs = company_code
    and lifnr = vendor_no
    select * from bseg
    where bukrs = bsik-bukrs
    and belnr = bsik-belnr
    and gjahr = bsik-gjahr
    [/code]
    https://forums.sdn.sap.com/click.jspa?searchID=11218980&messageID=853238
    BestRegards,
    Ramesh.

  • When bsik table profit center will be populated?

    can any one tell me when bsik table profit center will get populated?.
    we r doing fb60, miro?.
    so we want to see the profit center value in bsik table.
    Thanks in advance

    Hi Suresh,
    The actual table updated will be BSEG only but you will find the same document # in BSIK table if it is a open vendor items else if it is closed (i.e. payment for the invoice has been done to vendor), you will find it in BSAK table.
    Basically, BSIK(Open items) and BSAK(Closed items) are a secondary index tables for BSEG table. Whenever you update the profit center(PRCTR) in an accounting doc, you will find it in BSEG table. But its index will also be in BSIK table if it is still an open item.
    Cheers,
    Vikram
    Pls reward for helpful replies!!

  • The reference to the table, view or sequence is not allowed in this context

    Hi,
    I'm triying to execute the SP that I describe below and the OS give me an error:
    CREATE OR REPLACE PROCEDURE DWARE.P_CSCV_AGR_MONTH_REVENUE
        TBL_NAME VARCHAR2,
        START_DATE DATE,
        RESULT_ OUT NUMBER
      ) AS
      BEGIN
      DECLARE
        v_tbl_name VARCHAR2(30);
        v_start_date DATE;
        v_result NUMBER := 0;
        v_select_aux VARCHAR2(32767) := ' ';
        v_temp_table VARCHAR2(30);
        v_exists NUMBER;
      BEGIN
        v_tbl_name := TBL_NAME;
        v_start_date := START_DATE;
        v_temp_table := 'temp_' || v_tbl_name;
        SELECT count(*) INTO v_exists FROM tab WHERE lower(tname) = lower(v_temp_table);
        IF (v_exists = 1) THEN
          v_select_aux := '
            DROP TABLE ' || v_temp_table || ' CASCADE CONSTRAINTS PURGE
          EXECUTE IMMEDIATE (v_select_aux);
          COMMIT;
        END IF;
        v_select_aux := 'CREATE TABLE ' || v_temp_table || ' AS
                                  SELECT ch.date_ month_revenue,
                                       s.date_sub month_sub,
                                       s.codpromoter,
                                       u.OPERATOR,
                                       SUM (ch.total) AS TOTAL_OK
                                       FROM cscv_sub_charges_' || to_char(v_start_date, 'YYYY_MM')|| ' ch
                                       INNER JOIN cscv_subs s
                                       ON ch.id_sub = s.ID
                                       INNER JOIN cscv_users u
                                       ON s.id_user    = u.ID
                                WHERE ch.STATUS = 0
                                GROUP BY ch.date_, s.date_sub, s.codpromoter, u.OPERATOR';
        EXECUTE IMMEDIATE (v_select_aux);
        COMMIT; 
         v_select_aux := '
    INSERT INTO ' || v_tbl_name || ' (
             month_revenue,
             month_sub,
             codpromoter,
             operator,
             TOTAL_0,
             TOTAL_1,
             TOTAL_2,
             TOTAL_3,
             TOTAL_4,
             TOTAL_5,
             TOTAL_6,
             TOTAL_7,
             TOTAL_8,
             TOTAL_9,
             TOTAL_10,
             TOTAL_11
            SELECT
             month_revenue,
             month_sub,
             codpromoter,
             operator,
             TOTAL_0,
             TOTAL_1,
             TOTAL_2,
             TOTAL_3,
             TOTAL_4,
             TOTAL_5,
             TOTAL_6,
             TOTAL_7,
             TOTAL_8,
             TOTAL_9,
             TOTAL_10,
             TOTAL_11
            FROM
               SELECT
                  month_revenue,
                  month_sub,
                  codpromoter,
                  operator,
                  sum(total_ok) total_0,
                  0 total_1,
                  0 total_2,
                  0 total_3,
                  0 total_4,
                  0 total_5,
                  0 total_6,
                  0 total_7,
                  0 total_8,
                  0 total_9,
                  0 total_10,
                  0 total_11
                 FROM '|| v_temp_table ||'
              WHERE to_char(month_sub,''mm/yyyy'') = to_char(sysdate,''mm/yyyy'')
              GROUP BY month_revenue,month_sub,codpromoter, operator
              UNION ALL
              SELECT
                  month_revenue,
                  month_sub,
                  codpromoter,
                  operator,
                  0,
                  sum(total_ok),
                  0,
                  0,
                  0,
                  0,
                  0,
                  0,
                  0,
                  0,
                  0,
                  0
                 FROM '|| v_temp_table ||'
              WHERE to_char(month_sub,''mm/yyyy'') = to_char((to_date(sysdate,''dd/mm/yy'') - INTERVAL ''1'' MONTH),''mm/yyyy'')
              GROUP BY month_revenue,month_sub,codpromoter, operator
            GROUP BY month_revenue,
             month_sub,
             codpromoter,
             operator
        EXECUTE IMMEDIATE (v_select_aux);
        v_result := v_result + SQL%ROWCOUNT;
        COMMIT;
        v_select_aux := '
          DROP TABLE ' || v_temp_table || ' CASCADE CONSTRAINTS PURGE
        EXECUTE IMMEDIATE (v_select_aux);
        COMMIT;
        RESULT_ := v_result;
      END;
      END P_CSCV_AGR_MONTH_REVENUE;
    BEGIN
    DWARE.P_CSCV_AGR_MONTH_REVENUE(CSCV_AGR_MONTH_REVENUE,'01/01/2010');
    END;
    /and the output is:
    Error at line 1
    ORA-06550: líne 2, column 32:
    PLS-00357: The reference to the table, view or sequence 'CSCV_AGR_MONTH_REVENUE'  is not allowed in this context
    ORA-06550: líne 2, column 1:
    PL/SQL: Statement ignoredwhat could I do to resove the problem??
    Thanks in advance...

    Hi,
    Your procedure's signature is
    CREATE OR REPLACE PROCEDURE DWARE.P_CSCV_AGR_MONTH_REVENUE
    TBL_NAME VARCHAR2,
    START_DATE DATE,
    RESULT_ OUT NUMBER
    ) i.e. it is expecting two input parameters, TBL_NAME in VARCHAR2 format and the other START_DATE in DATE format. Also you need a variable with data type as NUMBER to hold the value of OUT parameter RESULT_
    Now look at the way you are calling this procedure
    BEGIN
    DWARE.P_CSCV_AGR_MONTH_REVENUE(CSCV_AGR_MONTH_REVENUE,'01/01/2010');
    END;
    /first parameter has to be a VARCHAR2, so enclose CSCV_AGR_MONTH_REVENUE into single quotes.
    second parameter should be a date, so use to_date() function.
    Lastly declare a variable with data type as Number for holding value of out parameter RESULT_
    Something like this :
    declare
    t_num number;
    begin
    a('CSCV_AGR_MONTH_REVENUE',to_date('01/01/2010','MM/DD/YYYY'),t_num);
    dbms_output.put_line(t_num);
    end;Vivek L

  • How to export a reference to a table line from a method?

    Hello,
    I have a class which has a hashed table as an attribute. I want to retrieve a line from the table using the key and return a reference to the table line. I want changes to the return value of the method to be directly reflected in the table, as if using a local field symbol. I have tried to approaches, neither of which works.
    First, I returned a reference to the local field symbol. This dumps, because after returning from the method call, the target of this reference no longer resides on the stack.
    Second, I have tried using an export parameter marked as "pass by reference", i. e. without VALUE(). Strangely, this still seems to give me only a copy of the data.
    What is the correct way to proceed?
    Illustrative pseudo-code follows.
    Thanks, Sebastian
    *==============================================================
    *Possibility 1: (using references)
    DATA mt_key_map TYPE zt_entity. " member variable (hash table of zs_entity)
    METHODS get
        IMPORTING
          !is_key TYPE zs_key
        EXPORTING
          !er_vt TYPE REF TO zs_entity.
    METHOD get.
      FIELD-SYMBOLS: <fs_vt> TYPE zs_entity. 
      READ TABLE mt_key_value WITH KEY key = is_key ASSIGNING <fs_vt>.
      GET REFERENCE OF <fs_vt> INTO er_vt.
    ENDMETHOD.     
    " Client Code:
      FIELD-SYMBOLS: <fs_vt> TYPE zs_entity. 
      CALL METHOD get
        EXPORTING
          is_key        = is_key
        IMPORTING
          er_vt         = lr_vt.
      ASSIGN lr_vt->* TO <fs_vt>.  " will dump, because the local field symbol
                                   " to which lr_vt points is no longer on the stack
      <fs_vt>-value = 'newdata'.       
    *==============================================================
    *Possibility 2:  (using a structure passed by reference)
    DATA mt_key_map TYPE zt_entity. " member variable (hash table of zs_entity)
    METHODS get
        IMPORTING
          !is_key TYPE zs_key
        EXPORTING
          !es_vt TYPE zs_entity.  
    METHOD get.
      FIELD-SYMBOLS: <fs_vt> TYPE zs_entity. 
      READ TABLE mt_key_map WITH KEY key = is_key ASSIGNING <fs_vt>.
      es_vt = <fs_vt>.
    ENDMETHOD.   
    " Client Code:
      DATA: ls_vt TYPE zs_entity.
      CALL METHOD get
        EXPORTING
          is_key        = is_key
        IMPORTING
          es_vt         = ls_vt.
      ls_vt-value = 'newdata'.   " will not change the contents of the
                                 " table mt_key_value       

    In the first approch, try to change the exporting parameter type REF TO DATA.
    Try like:
    CLASS lcl_test DEFINITION.
      PUBLIC SECTION.
        DATA: t_mara TYPE HASHED TABLE OF mara WITH UNIQUE KEY matnr.
        METHODS:
          constructor,
          get
            IMPORTING
              if_matnr TYPE matnr
            EXPORTING
              ea_mara  TYPE REF TO data.
    ENDCLASS.                    "lcl_test DEFINITION
    START-OF-SELECTION.
      DATA: lo_test TYPE REF TO lcl_test,
            lr_data TYPE REF TO data.
      FIELD-SYMBOLS: <fa_mara> TYPE ANY,
                     <f_field> TYPE ANY.
      CREATE OBJECT lo_test.
      lo_test->get(
        EXPORTING
          if_matnr = '000000000077000000'   " << Replace Your Material
        IMPORTING
          ea_mara  = lr_data ).
      ASSIGN lr_data->* TO <fa_mara>.
      ASSIGN COMPONENT 'ERSDA' OF STRUCTURE <fa_mara> TO <f_field>.
      <f_field> = space.
      WRITE: 'Done'.
    CLASS lcl_test IMPLEMENTATION.
      METHOD constructor.
        SELECT * INTO TABLE t_mara
               FROM mara
               UP TO 10 ROWS.
      ENDMETHOD.                    "constructor
      METHOD get.
        FIELD-SYMBOLS: <lfs_mara> LIKE LINE OF me->t_mara.
        READ TABLE me->t_mara ASSIGNING <lfs_mara> WITH KEY matnr = if_matnr.
        GET REFERENCE OF <lfs_mara> INTO ea_mara.
      ENDMETHOD.                    "get
    ENDCLASS.                    "lcl_test IMPLEMENTATION
    Regards,
    Naimesh Patel

  • References between source tables and mappings

    Hi,
    I'm looking for a table, view etc. in the repository which shows me references between source table and mappings?
    cheers,
    Bernhard

    Here's another one:
    http://www.nicholasgoodman.com/bt/blog/2005/04/01/owb-sources-and-targets-sql/
    select
    distinct 'TARGET',
    comp.map_name,
    comp.data_entity_name,
    comp.operator_type
    from
    all_iv_xform_map_components comp,
    all_iv_xform_map_parameters param
    where
    lower(operator_type)
    in ('table', 'view', 'dimension', 'cube')
    and param.map_component_id = comp.map_component_id
    and param.source_parameter_id is not null
    UNION
    select
    distinct 'SOURCE',
    t1.c1,
    t1.c2,
    t1.c3
    from
    (select
    comp.map_name c1,
    comp.data_entity_name c2,
    comp.operator_type c3,
    max(param.source_parameter_id) c4
    from
    all_iv_xform_map_components comp,
    all_iv_xform_map_parameters param
    where
    lower(operator_type) in
    ('table', 'view', 'dimension', 'cube')
    and param.map_component_id = comp.map_component_id
    group by
    comp.map_name, comp.data_entity_name, comp.operator_type) t1
    where t1.c4 is null
    order by 2,1

  • Help on finding a reference to a table

    Hi ,
    my oracle verion : oracle 10G
    if i fire a query something like :
    select * from user_source where text like '%CLASSIFICATION%'
    it will return me rows and help me narrow my search onto a mere 100 rows to find a reference for a table called 'WC_CLASSIFICATION_D' and tells me lets say which all packages are having a reference for this table. But the thing is its letting me know for a particular user , Now lets say if i have around 20 users in my database , with every single user writing a few packages that contains reference to the same table , How do i find that out.
    PS : I hope I am clear with my question , what i am having a feeling is that there would be a table tht could contain the user code for the entire database ..please help
    Regards
    Rahul

    Better yet, DBA_SOURCE (if you have access).
    USER_SOURCE contains source for all PL/SQL objects owned by the current user.
    ALL_SOURCE contains source for all PL/SQL objects for which the current user has at least some privileges. (Well, there is a privilege requriement for it to be seen here; it may be more subtle than my statement of 'at least some privileges'.)
    DBA_SOURCE contains source for all PL/SQL objects in the database.
    This naming/privilege convention is used for many of the SYS catalog views (USER_TABLES, USER_OBJECTS, etc.)
    Every user has access to the USER_ views and the ALL_ views, but different users may see different content. The DBA_ views are generally not public; you need a privilege such as SELECT ANY DICTIONARY to see them.
    By the way, USER_SOURCE does not have the source for views or materialized views. Use USER_VIEWS and USER_MVIEWS if you need those.

Maybe you are looking for

  • How do I install on this MacBook ver. ?

    I have a white MacBook, version unknown. Disk repair complete, Contents erased. It says Tiger install not compatible. It says 10.3 incompatible.   What to do? Target mode from MacPro. If I do not use target mode, the macBook only gives me ? screen, w

  • New meeting in my BB Calendar not visible in Novell Groupwise

    Hello, I have a little problem with my BB 8900 Curve. When i want to create a new "meeting" in the calendar and check the "all the day" option, i can't see it in my Novell Groupwise client. It's registered as a "Note", but not as a "Meeting". Do you

  • How can i get logic pro x on my n ew imac i have it on my macbook pro

    how can i get logic pro x on my n ew imac i have it on macbook pro

  • Packages, classpath in xcode

    hello, I've recently started using xcode (on Mac OS X) to develop java apps. I want to include a package or just some indiviudal classes, but don't know how. How do you specify the CLASSPATH in xcode? I've tried putting them in ~/Library/Java/Extensi

  • Flash Player doesn't work after upgrade

    I have Windows 7 Home Premium and I'm using IE 11.  I have tried uninstalling/installing, deleting all files mentioned in multiple posts, used Firefox in attempt to install--all leave me at step 1.  At best, the files appears to download and install