Return code for EXECUTE PROCEDURE (native SQL)

Hi Experts,
I've seen in the Note 364707 that the field %_ERRCODE is no longer supported since WAS 6.10 for stored procedures like this:
EXEC SQL.
  EXECUTE PROCEDURE proc [(parameter list)] %_ERRCODE INTO :rc
ENDEXEC.
So an Upgrade to WAS 7.00 gives this programms an error.
Has anybody an idea for an alternative?
Regards,
Stefan

Hello Peluka,
i have seen you have worked with 'execute procedure'.
I want to execute a procedure with two Parameters and one structure. Example:
EXECUTE PROCEDURE test.p_getdata ( in :i_ls_nr , in :vdatum , out :vtest ).
vtest has the simple structure with field lieferscheinnr (char25).
When i execute the procedure, i get the error <b>wrong number or types of arguments in call</b>.
Do you know, whether execute procedure with structures is not possible?
Thank you in advance.

Similar Messages

  • VB code for executing pl/sql procedure, and displaying TABLE OUT parameter

    Does anybody have any sample VB code (using OO4O) for executing a PL/SQL stored procedure, and then displaying (in Excel preferably) the following OUT parameters from the procedure:
    (1) variable(s) of TYPE PL/SQL RECORD
    (2) variable of TYPE PL/SQL TABLE defined as TABLE%ROWTYPE
    (3) n variables of TYPE PL/SQL TABLE'S defined as table.column%TYPE;
    Thanks.

    Here is what we use to bring in arrays of data from plsql. Here will be some sample vba code and plsql.
    What the plsql need to run in an array of input dates and an array of ids to lookup for the dates (also needs the number of values in the arrray.
    vba code...
    Sub Bull()
    Dim oDoc As Object
    Dim oTable As Object
    Dim oCell As Object
    Dim ArrCtr As Integer
    Dim iCount As Integer 'Counter
    Dim DataDynaset As Object 'Dynaset for retrieved values
    Dim DischDataDynaset As Object 'Dynaset for retrieved values
    Dim TWDataDynaset As Object 'Dynaset for retrieved values
    Dim PDDataDynaset As Object 'Dynaset for previous day retrieved values
    Dim MSTssCodes As Variant ' TS Codes Array
    Dim NumRows As Integer 'Number of rows in the table
    Dim NumColumns As Integer 'Number of columns in the table
    Dim NumArrayVals As Integer 'Number of array values (actual number - 1)
    OraLogin
    NumRows = 83
    NumColumns = 11
    'One less than number because we start at 0
    'NumArrayVals = 5
    NumArrayVals = 117
    ReDim DateArr(NumArrayVals)
    MSTssCodes = Array(3398, 3406, 3391, 3385, 3413, 3378, _
    2254, 2254, 2254, _
    3398, 3406, 3391, 3385, 3413, _
    3460, 3455, 3450, 3447, 3505, 3444, 2254, 2254, _
    4974, 2803, 4735, 4719, 2837)
    ****** NOW THIS WILL GET READY TO SEND TO PLSQLGetData MSTssCodes, DateArr, DataDynaset, NumArrayVals + 1
    .... more suff in the sub
    Sub GetData(Tssids, DateArray, TmpDataDynaset, NumRetVals)
    'Retrieves data from the Oracle database
    Dim I As Integer 'Counter
    Dim TssidDynaset As Object 'Temporary array for Tssids
    Dim DateDynaset As Object 'Temporary array for dates
    OraDatabase.Parameters.addTable "TSCODES", 1, 68, NumRetVals, 0
    OraDatabase.Parameters("TSCODES").ServerType = ORATYPE_UINT
    OraDatabase.Parameters.addTable "DATES", 1, 12, NumRetVals, 0
    OraDatabase.Parameters("DATES").ServerType = ORATYPE_DATE
    OraDatabase.Parameters.addTable "VALS", 3, 2, NumRetVals, 0
    OraDatabase.Parameters("VALS").ServerType = ORATYPE_NUMBER
    OraDatabase.Parameters.Add "NUM_VALS", NumRetVals, 3
    OraDatabase.Parameters("NUM_VALS").ServerType = ORATYPE_NUMBER
    OraDatabase.Parameters.Add "ERR_NUM", 0, 2
    OraDatabase.Parameters("ERR_NUM").ServerType = ORATYPE_NUMBER
    Set TssidDynaset = OraDatabase.Parameters("TSCODES")
    Set DateDynaset = OraDatabase.Parameters("DATES")
    'Fill the arrays
    For I = 0 To NumRetVals - 1
    TssidDynaset.Put_Value Tssids(I), I
    DateDynaset.Put_Value DateArray(I), I
    Next I
    OraDatabase.DbExecuteSQL ("Begin DBCALLS.SELECT_VALUES (:TSCODES, :DATES, :VALS, :NUM_VALS, :ERR_NUM); End;")
    If OraDatabase.LastServerErr <> 0 Or OraDatabase.LastServerErrText <> "" Then
    MsgBox "Error Getting Data"
    End If
    Set TmpDataDynaset = OraDatabase.Parameters("VALS")
    'MsgBox (OraDatabase.Parameters("NUM_VALS") & " " & OraDatabase.Parameters("ERR_NUM"))
    OraDatabase.Parameters.Remove "TSCODES"
    OraDatabase.Parameters.Remove "DATES"
    OraDatabase.Parameters.Remove "VALS"
    OraDatabase.Parameters.Remove "NUM_VALS"
    OraDatabase.Parameters.Remove "ERR_NUM"
    End Sub
    Now here is the plsql called from the DBCALL package......
    --Select time series values for give ts_codes.
    PROCEDURE select_values (
    ts_codes IN IntArrayTyp,
    dates IN DateArrayTyp,
    vals IN OUT NumArrayTypIB,
    --quality   IN  OUT RawArrayTyp,
    num_vals IN INTEGER,
    err_num OUT INTEGER) IS
    BEGIN
    --initialize variables
    err_num := 0;
    FOR i IN 1..num_vals LOOP
    BEGIN
    SELECT value INTO vals(i)
    FROM table_name
    WHERE ts_code = ts_codes(i)
    AND date_time = dates(i);
    EXCEPTION
    WHEN OTHERS THEN
    --dbms_output.put_line (ts_codes(i) || ' ' || SQLCODE);
    vals(i) := -1.0;
    err_num := SQLCODE;
    END;
    END LOOP;
    EXCEPTION
    WHEN OTHERS THEN
    --dbms_output.put_line (tssid || ' ' || SQLCODE);
    err_num := SQLCODE;
    END select_values;

  • Choosing the Return code for a scenario

    Hi,
    I execute an ODI scenario "AAA" from Unix with the command startscen.sh
    Can I control the return code of called screnario?
    IN the scenario "AAA" (=package) i have different path with ko/ok. I would like to choose a specific return code for each ko path. Is it possible ?
    Thank you very much.
    Best regards,

    How you creating this file? Why you couldn't create without enter?
    But, however, see solution in that case:
    File 1.sql:
    select 1 from dual;File 2.sql:
    select 2/0 from dual;File 3.sql:
    select 3 from dual;File exec_sql.sql:
    WHENEVER SQLERROR EXIT
    @&1
    @&2
    @&3And you need to generate file as this "test.sql":
    define f1 = 1.sql
    define f2 = 2.sql
    define f3 = 3.sql
    @exec_sql &f1 &f2 &f3Regards,
    Malakshinov Sayan

  • ALDSP 3.0 -- schema owner for stored procedure or SQL Statement

    Using ALDSP, I have a need to create a physical service based on a stored procedure or a SQL statement. I am wondering what will happen when I move to another deployment environment where the schema owner changes. In our QA and Prod environments, we have a different schema owner for all tables in the application (the DBAs believe this prevents unwanted updates to a prod environment). DSP elegantly supports this for normal table- and view-based physical services by mapping schemas through the DSP console after deployment. Will I get the same type of mapping capability for stored procedures and SQL statements? I noticed that I can add a SQL-based function to a physical service...is there a way to pass in the physical table name from that data service to the procedure or SQL statement?
    Thanks,
    Jeff

    Schema name substitution should work for stored procedures just like it does for tables. If it doesn't - report a bug.
    You don't get any help for sql-statement based data services - dsp doesn't parse the sql provided. One thing you could do is use the default schema (following the user of your connection pool), and not specify the schema in your sql-statement.

  • Very new to this: Cannot see code for a package in SQL Developer

    I know I'm doing something wrong but I certainly don't know what. I'm looking for the code to go along with a package. I can see the procedures the package calls and I can see a list of procedures but I cannot see the code for those procedures. I have tried using describe on the pop up and I just don't see anything but a window showing me the parameters the procedure will use. I want to see the code it will use.
    Can someone walk me through this or point me in the right direction?
    TIA

    I can only assume you're on 2.1 or 2.1.1 since you don't even say. If you click on the tree showing the various objects after establishing your connection, when you get to packages and you click the package you want, you'll see the spec. Now click on the plus sign and there should be 'package name' body. If you click that body icon, you say you still can't see the code?
    Evita
    Edited by: Evita on Mar 30, 2010 2:59 PM

  • Function code for execute button

    Hi,
    I have a requirement like this...
    there is a program for selective deletion from a data target by a transaction called delete_facts.
    this generates a program for selective deletion. when i run this report there comes one screen asks for selections fields and then again excute it then deletion will happen.
    But this program i need to modify for certain default values so as to avoid entering of the values in the selection screen.
    i will use default value this will solve my 1st purpose but since this program has to be scheduled from process chain, the 2nd execute funtionality( once the values appear in the screen) shud be automated.
    can anybody tell me how to do this that is after program runs values will be passed to selection screen and selection screen shud not be shown and execute shud happen automatically.
    this is the code generated by transaction delete_facts:
    *& Report  ZTEST_DELETE1
    REPORT  ZTEST_DELETE1.
    generated Header from i_sel_repid
    generated REPORT (RSDRD)
    (should be deleted after use)
    Generated by..: SALAGUN
    Date/Time.....: 20070322 / 051426
    *REPORT GP457FUV92GJS4663HYHXLYC9Q7 .
    generated Tables from i_t_tables
                     and  i_datatarget
    TABLES:
    SSCRFIELDS,
    /BIC/SZTESTBC
    ,/BI0/SCHNGID
    ,/BI0/SRECORDTP
    ,/BI0/SREQUID
    ,/BI0/SDATE
    ,/BI0/SUNIT
    generated DATA/TYPES
    TYPE-POOLS: RSDRD, RSDQ.
    DATA:
      L_INTERACTIVE      TYPE RS_BOOL,
      L_ANSWER(1)        TYPE C,
      L_TYPE(1)          TYPE C,
      L_PARALLEL         TYPE I,
      L_NO_OF_ROWS       TYPE I,
      L_NO_OF_ROWS_C(10) TYPE C,
      L_TITEL            TYPE RS_CHAR72,
      L_TEXT1            TYPE RS_CHAR72,
      L_TEXT2            TYPE RS_CHAR72,
      L_S_RANGE          TYPE RSDRD_S_RANGE,
      L_S_SELTXT         TYPE RSDQ_S_SELTEXT,
      L_SX_SEL           TYPE RSDRD_SX_SEL,
      L_T_MSG            TYPE RS_T_MSG,
      L_THX_SEL          TYPE RSDRD_THX_SEL,
      L_T_SELTXTS        TYPE RSDQ_T_SELTEXT
                              WITH HEADER LINE.
    generated SELECTION-SCREEN from i_t_selscr
    SELECTION-SCREEN BEGIN OF BLOCK B001 WITH FRAME TITLE T001 .
    SELECT-OPTIONS C001 FOR /BIC/SZTESTBC-/BIC/ZTESTBC
    default 'D' TO  'C'.
    SELECTION-SCREEN   END OF BLOCK B001 .
    SELECTION-SCREEN BEGIN OF BLOCK B002 WITH FRAME TITLE T002 .
    SELECT-OPTIONS C002 FOR /BI0/SCHNGID-SID .
    SELECT-OPTIONS C003 FOR /BI0/SRECORDTP-SID .
    SELECT-OPTIONS C004 FOR /BI0/SREQUID-SID .
    SELECTION-SCREEN   END OF BLOCK B002 .
    SELECTION-SCREEN BEGIN OF BLOCK B003 WITH FRAME TITLE T003 .
    SELECT-OPTIONS C005 FOR /BI0/SDATE-DATE0 .
    SELECTION-SCREEN   END OF BLOCK B003 .
    SELECTION-SCREEN BEGIN OF BLOCK B004 WITH FRAME TITLE T004 .
    SELECT-OPTIONS C006 FOR /BI0/SUNIT-UNIT .
    SELECTION-SCREEN   END OF BLOCK B004 .
    SELECTION-SCREEN BEGIN OF BLOCK B005 WITH FRAME TITLE T005 .
    PARAMETERS L_PA TYPE DBMAN_PARALLEL_DEGREE DEFAULT '01'.
    DATA L_P1(1) TYPE C.
    PARAMETERS L_NL TYPE DBMAN_NO_LOGGING AS CHECKBOX DEFAULT ' '.
    PARAMETERS L_SR TYPE DBMAN_SHOW_REPORT AS CHECKBOX DEFAULT ' '.
    SELECTION-SCREEN   END OF BLOCK B005 .
    generated body from i_t_body
    generated INITIALIZATION from i_t_init
                             and  i_t_seltexts
                             and  i_batch_allowed
                             and  i_datatarget
    INITIALIZATION.
    T001 = 'product'.
    T002 = 'Data Package'.
    T003 = 'Time'.
    T004 = 'Unit'.
    T005 = 'Options'.
    SELECTION-SCREEN FUNCTION KEY 1.
    MOVE 'Execute in Bckgrnd' TO SSCRFIELDS-FUNCTXT_01.
    PERFORM RESTRICT_SEL_OPTIONS(SAPLRSDRD).
    SET TITLEBAR 'SELECTION' OF PROGRAM 'SAPLRSDRD' WITH
    ' Delete selected entries from the data target DELETE '.
    L_S_SELTXT-NAME = 'C001'.
    L_S_SELTXT-KIND = 'S'.
    L_S_SELTXT-TEXT = 'Base Code'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'C002'.
    L_S_SELTXT-KIND = 'S'.
    L_S_SELTXT-TEXT = 'Change Run ID (SID)'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'C003'.
    L_S_SELTXT-KIND = 'S'.
    L_S_SELTXT-TEXT = 'Record type (SID)'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'C004'.
    L_S_SELTXT-KIND = 'S'.
    L_S_SELTXT-TEXT = 'Request ID (SID)'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'C005'.
    L_S_SELTXT-KIND = 'S'.
    L_S_SELTXT-TEXT = 'Calendar Day'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'C006'.
    L_S_SELTXT-KIND = 'S'.
    L_S_SELTXT-TEXT = 'Unit of measure'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'L_PA'.
    L_S_SELTXT-KIND = 'P'.
    L_S_SELTXT-TEXT = 'Parall. deg. during reconstruc'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'L_NL'.
    L_S_SELTXT-KIND = 'P'.
    L_S_SELTXT-TEXT = 'Switch off logging drng recons'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    L_S_SELTXT-NAME = 'L_SR'.
    L_S_SELTXT-KIND = 'P'.
    L_S_SELTXT-TEXT = 'Display generated report'.
    APPEND L_S_SELTXT TO L_T_SELTXTS.
    generated AT SELECTION-SCREEN OUTPUT from i_sel_repid
    AT SELECTION-SCREEN OUTPUT.
    CALL FUNCTION 'SELECTION_TEXTS_MODIFY'
         EXPORTING
              PROGRAM                     =  'GP457FUV92GJS4663HYHXLYC9Q7'
         TABLES
              SELTEXTS                    =  L_T_SELTXTS
         EXCEPTIONS
              PROGRAM_NOT_FOUND           = 1
              PROGRAM_CANNOT_BE_GENERATED = 2
              OTHERS                      = 3.
    generated AT SELECTION-SCREEN
    AT SELECTION-SCREEN.
    CASE SSCRFIELDS-UCOMM.
      WHEN 'ONLI'.
        L_INTERACTIVE = RS_C_TRUE.
      WHEN 'OPTI'.
      WHEN 'DELS'.
      WHEN 'FC01'.
        L_INTERACTIVE = RS_C_FALSE.
        SSCRFIELDS-UCOMM = 'ONLI'.
      WHEN 'OTHERS'.
    ENDCASE.
    generated END-OF-SELECTION from i_t_selopt
                               and  i_del_repid
                               and  i_datatarget
                               and  i_gen_mode
    END-OF-SELECTION.
    IF NOT C001[] IS INITIAL.
      CLEAR L_SX_SEL.
      L_SX_SEL-IOBJNM = 'ZTESTBC'.
      LOOP AT C001 .
        CLEAR L_S_RANGE.
        MOVE C001-SIGN TO L_S_RANGE-SIGN.
        MOVE C001-OPTION TO L_S_RANGE-OPTION.
        MOVE C001-LOW TO L_S_RANGE-LOW.
        MOVE C001-HIGH TO L_S_RANGE-HIGH.
        MOVE RS_C_TRUE TO L_S_RANGE-KEYFL.
        APPEND L_S_RANGE TO L_SX_SEL-T_RANGE.
      ENDLOOP.
      INSERT L_SX_SEL INTO TABLE L_THX_SEL.
    ENDIF.
    IF NOT C002[] IS INITIAL.
      CLEAR L_SX_SEL.
      L_SX_SEL-IOBJNM = '0CHNGID'.
      LOOP AT C002 .
        CLEAR L_S_RANGE.
        MOVE C002-SIGN TO L_S_RANGE-SIGN.
        MOVE C002-OPTION TO L_S_RANGE-OPTION.
        MOVE C002-LOW TO L_S_RANGE-SIDLOW.
        MOVE C002-HIGH TO L_S_RANGE-SIDHIGH.
        MOVE RS_C_FALSE TO L_S_RANGE-KEYFL.
    start change
        DESCRIBE FIELD C002-LOW TYPE l_type.
        IF l_type = 'I'.
          CONDENSE L_S_RANGE-LOW.
          CONDENSE L_S_RANGE-HIGH.
        ENDIF.
    stop change
        APPEND L_S_RANGE TO L_SX_SEL-T_RANGE.
      ENDLOOP.
      INSERT L_SX_SEL INTO TABLE L_THX_SEL.
    ENDIF.
    IF NOT C003[] IS INITIAL.
      CLEAR L_SX_SEL.
      L_SX_SEL-IOBJNM = '0RECORDTP'.
      LOOP AT C003 .
        CLEAR L_S_RANGE.
        MOVE C003-SIGN TO L_S_RANGE-SIGN.
        MOVE C003-OPTION TO L_S_RANGE-OPTION.
        MOVE C003-LOW TO L_S_RANGE-SIDLOW.
        MOVE C003-HIGH TO L_S_RANGE-SIDHIGH.
        MOVE RS_C_FALSE TO L_S_RANGE-KEYFL.
    start change
        DESCRIBE FIELD C003-LOW TYPE l_type.
        IF l_type = 'I'.
          CONDENSE L_S_RANGE-LOW.
          CONDENSE L_S_RANGE-HIGH.
        ENDIF.
    stop change
        APPEND L_S_RANGE TO L_SX_SEL-T_RANGE.
      ENDLOOP.
      INSERT L_SX_SEL INTO TABLE L_THX_SEL.
    ENDIF.
    IF NOT C004[] IS INITIAL.
      CLEAR L_SX_SEL.
      L_SX_SEL-IOBJNM = '0REQUID'.
      LOOP AT C004 .
        CLEAR L_S_RANGE.
        MOVE C004-SIGN TO L_S_RANGE-SIGN.
        MOVE C004-OPTION TO L_S_RANGE-OPTION.
        MOVE C004-LOW TO L_S_RANGE-SIDLOW.
        MOVE C004-HIGH TO L_S_RANGE-SIDHIGH.
        MOVE RS_C_FALSE TO L_S_RANGE-KEYFL.
    start change
        DESCRIBE FIELD C004-LOW TYPE l_type.
        IF l_type = 'I'.
          CONDENSE L_S_RANGE-LOW.
          CONDENSE L_S_RANGE-HIGH.
        ENDIF.
    stop change
        APPEND L_S_RANGE TO L_SX_SEL-T_RANGE.
      ENDLOOP.
      INSERT L_SX_SEL INTO TABLE L_THX_SEL.
    ENDIF.
    IF NOT C005[] IS INITIAL.
      CLEAR L_SX_SEL.
      L_SX_SEL-IOBJNM = '0CALDAY'.
      LOOP AT C005 .
        CLEAR L_S_RANGE.
        MOVE C005-SIGN TO L_S_RANGE-SIGN.
        MOVE C005-OPTION TO L_S_RANGE-OPTION.
        MOVE C005-LOW TO L_S_RANGE-LOW.
        MOVE C005-HIGH TO L_S_RANGE-HIGH.
        MOVE RS_C_TRUE TO L_S_RANGE-KEYFL.
        APPEND L_S_RANGE TO L_SX_SEL-T_RANGE.
      ENDLOOP.
      INSERT L_SX_SEL INTO TABLE L_THX_SEL.
    ENDIF.
    IF NOT C006[] IS INITIAL.
      CLEAR L_SX_SEL.
      L_SX_SEL-IOBJNM = '0UNIT'.
      LOOP AT C006 .
        CLEAR L_S_RANGE.
        MOVE C006-SIGN TO L_S_RANGE-SIGN.
        MOVE C006-OPTION TO L_S_RANGE-OPTION.
        MOVE C006-LOW TO L_S_RANGE-LOW.
        MOVE C006-HIGH TO L_S_RANGE-HIGH.
        MOVE RS_C_TRUE TO L_S_RANGE-KEYFL.
        APPEND L_S_RANGE TO L_SX_SEL-T_RANGE.
      ENDLOOP.
      INSERT L_SX_SEL INTO TABLE L_THX_SEL.
    ENDIF.
      L_PARALLEL = L_PA.
      IF L_INTERACTIVE EQ RS_C_TRUE.
      CALL FUNCTION 'RSDRD_SEL_DELETION'
           EXPORTING
                I_DATATARGET   = 'DELETE'
                I_THX_SEL           = L_THX_SEL
                I_AUTHORITY_CHECK   = RS_C_TRUE
                I_NO_LOGGING        = L_NL
                I_PARALLEL_DEGREE   = L_PARALLEL
                I_SHOW_REPORT       = L_SR
           CHANGING
                C_T_MSG             = L_T_MSG.
      ELSE.
        CALL FUNCTION 'RSDRD_BUILD_REPORT_FOR_BATCH'
             EXPORTING
              I_REPID        = 'GP457FWJUK1J1F3ZIZZOEH9U533'
              I_DATATARGET   = 'DELETE'
              I_GEN_ONLY          = RS_C_FALSE
              I_THX_SEL           = L_THX_SEL
              I_AUTHORITY_CHECK   = RS_C_TRUE
              I_NO_LOGGING        = L_NL
              I_PARALLEL_DEGREE   = L_PARALLEL
              I_SHOW_REPORT       = L_SR
         CHANGING
              C_T_MSG             = L_T_MSG.
      ENDIF.
    Thanks in advance,
    Vijaya

    hi!
    Function code for execute button is 'ONLI'.
    try ur code using it!!
    Reward points if it helps.
    Regards,
    Neha Bansal.
    Message was edited by:
            Neha Bansal

  • What is the function code for execute

    Hi,
    What is the function code for execute.
    I am using set pf-status under initialization.
    Thanks.
    Sai.

    Hi,
    If your adding a execute in pf-status then we can give the function code for execute as 'EXEC' - F8.
    Nyways it automatically comes no need to explicitly add in pf-status. The standard function code is 'ONLI'
    just we need to check the sy-ucomm value and perform what you want.
    i.e if sy-ucomm = 'EXEC'.
    endif.
    hope this help you.
    plz reward if useful.
    thanks,
    dhanashri.
    Edited by: Dhanashri Pawar on Jun 26, 2008 11:43 AM

  • Transaction code to find return code for transport request

    Hi,
    I want to see  the return code for transport requests after importing to QAS from DEV. What is the transaction code to find return code and can you explain in brief.
    Thx,
    Vasu

    you can check it out in STMS
    wht you can do is ,,
    Run Tcode STMS > Overview imports (F5) > you will find all import queues > then click on the import queue in which u want to see the status of transport (DEV , QAS , PRD )
    > then find out the transport no > click on that > then click on logs or press ( ctrl + f4)
    Return code
    Meaning
    0000
    Transport performed without errors
    0004
    Warnings were issued. All objects were transported successfully. There were special actions for individual objects that may not have been intentional, for example, a warning is issued during the export if the request contains an object deletion.
    Read the warnings.
    0008
    Individual objects could not be transported successfully. You must analyze and correct the errors. Examples of import errors: Original object was not overwritten, Repaired object was not overwritten
    0012 or higher
    A critical error has occurred, probably not caused by the contents of the request. You must inform your system administrator.
    http://help.sap.com/saphelp_nw70/helpdata/en/57/38e26c4eb711d182bf0000e829fbfe/content.htm
    Hope this information will help you ,,
    Cheers
    dEE

  • Error handling return code for Provide Statement

    Hi Experts,
    For select statement we have error handling return code sy-subrc.
    What is the error handling return code for provide.. end provide statement.
    Thanks,
    Ragu

    Ragu,
    Same thing.
    Check sy-subrc.
    sy-subrc is the return code for all ABAP statements as far as I know.
    Regards,
    Dilek

  • T.Code for Release Procedure for Purchase Order Type

    Hi Frd
    im working in ECC 6.0.
    OMGS is t.code for Release Procedure for Purchase Order Type in SAP 4.6.
    Can anyone tell me what is the t.code for Release Procedure for Purchase Order Type in ECC 6.0 .the OMGS t.code is not working in ECC.
    Thanks
    By
    Pari

    Hi Rajasekharan,
        Go to tcode ME22 and enter the Purchase order number.
    inside the Display screen,u can see a GREEN flag button on the Application Toolbar.
        Click on a item and press the Green Button.
    U will see the release code,provided the Purchase order is set to release strategy,after that Go to tocde ME28 enter the release code ,along with Document number and then release the Purchase order.
    Actually the tcode for releasing purchase order is ME28
    Reward points if useful.
    Cheers,
    Swamy Kunche

  • Getting Return Code for cl_gui_frontend_services= execute

    Hey,
    im using the static method cl_gui_frontend_services=>execute  to start a program locally. The program is openens synchronously and i need to get the return code of the program. I mean not the one from the method-call but from the external tool on OS-level.
    Is there a way to get that one ?
    Thanks and regards,
    oliver

    well seems there is no way...solved it now over a result-file which is get written by the called tool and later read by sap.

  • How to execute procedure in SQL Worksheet ?

    Hi, anybody know, how I can execute procedure here?
    I try EXEC sec_roles, EXEC security_admin.sec_roles, EXECUTE - there is a SQL statement error. When I use CALL - there is no such procedure (I have execute previleges).
    Although in SQLPlus EXEC works, but there are problems with standard SQL commands (all of them returns "2" no matter what content is).
    Any ideas?
    Regards
    Krzysztof

    exec procedure(parameters) is a sql plus (and a few others) shortcut for
    BEGIN
       procedure(parameters);
    END;So try that then pressing/clicking whatever it is in sql worksheet that makes a statement run.
    Note that if your procedure has parameters defined as OUT or IN OUT, you will need to supply a variable to accept the returned value(s).
    John

  • Alternative for EXEC command(Native SQL)

    Hi Friends,
             While Using the EXEC command in native sql it is showing the obselete Error  , Can  any one help  with giving the alternative for the commands for native SQl.
           Immediate

    In a Native SQL statement, data is passed between the ABAP program and the database using host variables. A host variable is an ABAP variable that is identified as such in the Native SQL statement by a preceding colon (:).
    Example
    Displaying an extract from the table AVERI_CLNT:
    DATA: F1(3), F2(3), F3(3).
    F3 = ' 1 '.
    EXEC SQL.
      SELECT CLIENT, ARG1 INTO :F1, :F2 FROM AVERI_CLNT
             WHERE ARG2 = :F3
    ENDEXEC.
    WRITE: / F1, F2.
    To simplify the form of the INTO lists in the SELECT statement, you can, as in Open SQL, specify a single structure as the target area.
    Example
    Displaying an Extract from the Table AVERI_CLNT:
    DATA: BEGIN OF WA,
            CLIENT(3), ARG1(3), ARG2(3),
          END OF WA.
    DATA  F3(3).
    F3 = ' 1 '.
    EXEC SQL.
      SELECT CLIENT, ARG1 INTO :WA FROM AVERI_CLNT
             WHERE ARG2 = :F3
    ENDEXEC.
    WRITE: / WA-CLIENT, WA-ARG1.
    Native SQL supports the directly-executable commands of your underlying database system. There are other special commands that you can use after the EXEC SQL statement for cursor handling, stored procedures (procedures stored in the database), and connections to other databases.
    Cursor Processing

  • Executing Procedure in SQL SERVER and Storing the results in Oracle 10g

    Hello,
    I am trying execute SQL SERVER procedure from Oracle 10g and store the results in a oracle table. When I tried executing the procedure i am getting errors.
    I am using Oracle Heteroeneous Services.
    Steps I followed.
    1. Created ODBC DSN on Oracle Server connecting to SQL SERVER database.
    2. Created Listner entry and TNSNAMES entries.
    3. Created Database link and able to select the data from the SQL SERVER tables.
    Here is the code i tried to execute the procedure.
    BEGIN
    "META"."extract"@abc;
    END;
    "META"."extract"@abc;
    ERROR at line 2:
    ORA-06550: line 2, column 1:
    PLS-00201: identifier 'META.extract@ABC' must be declared
    ORA-06550: line 2, column 1:
    PL/SQL: Statement ignored
    Please help me.
    Thank You,
    Seshadri Thope

    Hi thopevs,
    Can you please tell me the right syntax of calling procedures(on sql server) from oracle?
    I am getting following error:
    SQL> execute "GetdateSys"@oratosql;
    begin "GetdateSys"@oratosql; end;
    ORA-06550: line 2, column 7:
    PLS-00201: identifier 'GetdateSys@ORATOSQL' must be declared
    ORA-06550: line 2, column 7:
    PL/SQL: Statement ignored
    SQL>
    Your help will be highly appreciated.
    Thanks & Regards,
    M.U.N.A

  • Sqlloader return code for unix..

    Hi sir,
    i need to know the sqlloader load successfully or not,
    i have check this link http://download-east.oracle.com/docs/cd/B19306_01/server.102/b14215/ldr_params.htm#i1005781
    but this not help me much because,when its has error like unique constraint or its not full fill when clause then its returning '2' which is EX_WARN for unix,i only want thoose which have error like unique constraint ,how i know there is error
    please help me

    Try out this shell script..
    #! /usr/bin/sh
    sqlldr / control=/home/temp/prod.ctl log=/home/temp/prod.log BAD=/home/temp/prod.bad DISCARD=/home/temp/prod.dsc SILENT=HEADER DIRECT=TRUE PARALLEL=TRUE
    RC2=${?}
    if [ ${RC2} -ne 0 ]
    then
      echo " \n \
        Return code = ${RC2}, sql loader failed for the table $TABLE_NAME \n \n \
        Data file   : /home/temp/prod.dat       \n \
        Control file: /home/temp/prod.ctl       \n \
        Log file    : /home/temp/prod.log       \n \
        Bad file    : /home/temp/prod.bad       \n \
        Discard file: /home/temp/prod.dsc "
    else
      echo " \n \
        File loaded successfully            \n \
        Data file   : /home/temp/prod.dat   \n \
        Control file: /home/temp/prod.ctl   \n \
        Log file    : /home/temp/prod.log"
    fiLet me know if this is what you expect.
    Good luck!!!
    Bhagat
    null

Maybe you are looking for