Diplay data in function module

Hi
I am extracting data for PLANT MAINTAINENCE application, it is in master data. Data contains in 8 tables .and display 12 fields in the report and i have to extract data in BW side.
So i am using function module to extract the data from R/3 to
BW side, I am not using appropriate function module.
Here how to link all the tables. Here we are using EQUNR key,based on this one we are diplaying the data.
Filed names Table names
EQUNR-euipment no.           J_3GSTLKOPF
LTEXT-Catalog text                /SAPCEM/KATTEXT
ATWRT-Capacity                AUSP
ATINN-Inetnal carecter no           AUSP
ANSDT-Purchase order date           EQUI
ANSWT-Purchase cost           EQUI
EQPCATLIFE-life in years           J_3GSTLKOPF
CDIFF-Working hours           IMRG
NAME1-Name                KNA1
J_3GEINEND -Date of relaese       J_3GBELP
J_3GPACHT -Leased           EQUZ
If display the LTEXT filed we want use two tables. in /SAPCEM/KATTEXT table take KATNR and if u want KATNR take EQUNR in J_3GSTLKOPF table.
If display CDIFF field's here condition is consider only measuring documents(MDOCM). and we want deletion records also. How should i specify this one.
Please tell me the code.
Thanks

go to se37 & give d fm name VC_I_GET_CONFIGURATION_IBASE
display
note: from EQUI table take 'CUOBJ' value  EX '9825'
DISPLAY THE FM GIVE UR CUOBJ NO IN INSTANCE  value textbox
in the end including zero 9825 press execute u can see in the bottom table
CONFIGURATION RESULT 53entries or whatever double click on that
unow u can see the all field name .
I HAVE DONE LIKE THIS IN SAMRT FORMS FOR PS
FOR that i written this code
*& FOR POLE , KW , CONST FIELDS
*break : abapdev.
SELECT SINGLE * FROM vbap INTO wa_vbap
         WHERE vbeln = wa_vbrp-aubel AND posnr = wa_vbrp-posnr .
IF sy-subrc = 0.
  CALL FUNCTION 'VC_I_GET_CONFIGURATION_IBASE'
  EXPORTING
    instance                  = wa_vbap-cuobj
  BUSINESS_OBJECT           =
     language                  = sy-langu
  IV_INVALID_POSSIBLE       = ' '
  IV_NEUTRAL                = ' '
   TABLES
     configuration             = gt_data
  ET_CONF_WITH_AUTHOR       =
   EXCEPTIONS
     instance_not_found        = 1
     OTHERS                    = 2.
ENDIF.          .
IF sy-subrc <> 0.
MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
        WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
ENDIF.
*& FOR POLARITY FRAMESIZE & KW
LOOP AT gt_data INTO wa_data.
  IF wa_data-atnam = 'KW1'.
    lv_kw1 = wa_data-atwrt.
  ENDIF.
if wa_data-atnam = 'KW2'.
  lv_kw2 = wa_data-atwrt.
  ENDIF.
  IF wa_data-atnam = 'POLARITY'.
    lv_polarity = wa_data-atwrt.
  ENDIF.
  IF wa_data-atnam = 'FRAMESIZE'.
    lv_framesize = wa_data-atwrt.
  ENDIF.
ENDLOOP.
*& FOR MACHINE NUMBER
*break : abapdev.
SELECT SINGLE * FROM ser01 INTO wa_ser01
       WHERE lief_nr = wa_likp-vbeln.
IF sy-subrc = 0.
  SELECT SINGLE * FROM objk INTO wa_objk
         WHERE obknr = wa_ser01-obknr.
ENDIF.
regrads
aniruddh singh

Similar Messages

  • URGENT : Error: Please create data processing function module

    Hi
    I am getting the folloiwng error
    "Please create data processing function module" in table maintainence.
    It is working fine in dev environment but not in QA and production.
    Pleae help.
    Regards
    Kalpesh

    Hi Kalpesh,
       I see it is something to do with the naming convention used in the quality and production system. These must have been setup differently compared to ur development system. So check with different naming conventions.
    Reward points if helpful.
    Cheers
    Shafiq

  • Error : J_2IRG1BAL, Create data processing Function module

    Sap Experts,
    when i go to se11 in which have given table name: J_2IRG1BAL, than i gone menu bar click on utilities select the table contents
    click on create entries button.
    1) Error Message : Create data processing function module
    2) This table Relevant to RG1 Updation
    3) Due to this error I am not able to upload the opening stock of finished material manuaaly
    4) What are the actions need to be done to rectify the above error.
    Regards,
    Prabhakar

    Hi
    Ask your ABAPER to create the maintainence view of the table
    regards
    Sanil Bhandari

  • Sql queries for retrieving setups data for functional modules

    Hi,
    Can anyone give me the sql queries for retrieving setups data for functional modules (GL, AP, AR, FA, and CM) from Database.

    Hi,
    Can anyone give me the sql queries for retrieving setups data for functional modules (GL, AP, AR, FA, and CM) from Database.

  • Not able to enter data in Function module

    Hi,
    I have created a function module with import parameter as a table.
    I have executed the function module from SE37 and tried to enter the data in the table.
    If I click the table...its not showing new line...its displaying a message that "THE OBJECT CAN ONLY BE DISPLAYED"
    I dont thinkso taht I have done a setting like this...
    please help me what might be the problem...

    Hi All,
    the issue has been resolved.
    data can be changed only if the internal table creation is not in the form of SORTED table.
    the internal table entries should not refer dataelement of type STRING.
    because of these two things, I was not able to edit the internal table in the function modul.
    thanks for ur replies.
    Sumithra

  • How to get data from function module in crystal report

    Hi,
    I installed Crystal Reports 2008 and BO SAP Integration kit for CR.
    I connected successfully to SAP system from CR but unable to get the data into Report ...
    But data is present in function module.
    Could you please tell me what may be the reason ...!!
    Thanks
    Raghavendra

    Hi,
    I connected successfully to SAP system from CR but unable to get the data into Report with all the Input parameters and data is present in function module.
    Note: - If we take Start date as input parameter in Crystal report data is coming for single parameter, whereas we take input parameters like Partner function, Region and Customer - we are not getting data. (These fields we created parameters in Crystal report)
    In Function Module IMPORT Parameters are below mentioned and Export parameter is Blank
                                                                                    Start Date (Mandatory field)
                                                                                    Partner Function (Mandatory)
                                                                                    Region
                                                                                    Customer
    Please let us know if required any information.
    Regards,
    Raghavendra

  • Error  while reading data using Function Module /sapapo/msdp_data_read

    In my report, function module /sapapo/msdp_data_read  is called to get the data from a planning area.
    The problem is that, the values returned by this FM are not correct.means its returning wrong Key_figure values.
    On checking it was observed that , in the import parameter is_read_options ,
    the field flg_aggregate = 'X'.
    In Debug mode i cleared this field and called the FM and it returned the correct values.
    Can anybody plz tell me what is the relevance of this field flg_aggregate .
    Kindly guide.
    Thnk you in advance.
    Regards ,
    Pranali

    Dear Pranali,
    FLG_AGGREGATE has following importance:
    if FLG_AGGREGATE = 'X' and the table ct_cols is empty then key figures for the time period defined through IS_PERIOD will be red aggrerated.
    I hope this helps.
    Regards,
    Tibor

  • Error while extracting data using function module

    Hello,
    I created one generic datasource and i want to extract data with the option "Extraction by Function Module".
    But when i specified function module name and was trying to save, it thrown a error message saying
    'The specified table does not exist'.
    What could be the reason?
    Please help me out.
    Thanks,
    Regards,
    Steve

    Hi Steve,
       Once you execute T.Code RSO2, you need to fill in the details and click Create, specify the Appl. Component and in Extraction by Function Module, give Function Module name and Extrct Structure in the given boxes.
    "This structure is used by a DataSource that was created using the transaction RSO2 (generic extraction) and selects data using a function module.
    The data must be transferred from this function module to an interface table E_T_DATA."
    I'll try to comeup with small piece of code to sort your issue.
    Hope it helps!!!!
    Amit

  • Dynamic programming: send data to function module, mapping...

    Hello abappers,
    I have a requirement to be able to send a the name of a table and a table-field to a function module, it can be a table of any type, so the function module should be generic in nature, the function module receives the table name and table-field name and then selects data for the field specified from the table specified (in the import parameter of the FM). Within the function module, I want to be able to determine the fields type? and then send this field to an internal table representing a a destination table (also specified in the import parameters).
    the idea is to be able to map a field from any table to a specified field in another table, the table(source and destination) and field names will only determined at run time as specified by the user.
    any assistance will be appreciated, I am not very familiar with dynamic\generic programming.

    Hello Bijo,
    Following are the steps to implement this requirement:
    1. Create import parameter for table name i.e. TABLE_NAME
    2. Create tables parameter for fields table
    3. Define table. DATA TABLE TYPE REF TO DATA. Also create single column internal table for fields and load all fields to select from database.
    Inside function module you can implement following steps:
    4. Load all the fields name into internal table. for this you can use DD03L for field details and use TABLE_NAME as key.
    5. Once you have all the fields ready in internal table then construct fieldcatlog using these fields
    loop at internal table with all the fields.
    move it to field catalog.
    append field catalog.
    endloop.
    6. Pass this field catalog table to static method create_dynamic_table
    call method cl_alv_table_create=>create_dynamic_table
    exporting
    it_fieldcatalog = fieldcatalog_tab
    importing
    ep_table = table.
    Here table is defined with data object type.
    now assign table reference to field symbol of type table.
    ASSIGN table->* to <field-tab>.
    Also create work area <field-wa> using refrence of table.
    create data object wa LIKE LINE OF <field-tab>.
    ASSIGN wa->* to <field-wa>.
    Also define field symbol for field name.
    for e.g. <field_name>
    7. Dynamic internal table is ready
        Now using can use select as follows:
        SELECT (fields)  "--> fields is single column internal table to hold fields need to be selected
             INTO CORRESPONDING FIELDS OF TABLE <itab> "--> itab created dynamically at runtime
            FROM (TABLE_NAME) --> Table name imported
         WHERE (where_clause). --> where_clause is single column internal table with data type CHAR72.
    Select data into <itab> and use ASSIGN COMPONENT to move data from one table to another as follows:
    8. To fill this dynamic internal table using ASSIGN COMPONENT <Comp_number> OF STRUCTURE <field-wa> TO <field-name>
    So in this case if first field of structure STRUCT1 is user_id then sudo-code will be
    loop at internal table containing list of fields into field_wa
    ASSIGN COMPONENT field_wa OF STRUCTURE <field-wa> TO <field>. "Here field_wa is wa area for single column internal table holding all the fieldnames.
    Now <field-name> points to user_id field. Move some value into it as nornally we do with variables.
    move '001' to <field-name>.
    or
    <field-name> = '001'.
    endloop.
    after completing all the fields one row will be ready in <field_wa>.
    APPEND <field_wa> to <field_tab>.
    Let me know incase you face any issues!
    Hope this helps you.
    Thanks,
    Augustin.
    Edited by: Augustarian on Aug 23, 2009 7:02 PM
    Edited by: Augustarian on Aug 23, 2009 7:08 PM
    Edited by: Augustarian on Aug 23, 2009 7:09 PM

  • Initialization of data in function module (module PP)

    I developed a transaction to maintain production orders (similar to transaction CO02).
    I use the function module CMOC_COMP_READ to read the component data into a resbd-structure (this works fine).
    My transaction creates a purchase order to one component and then I want to read the actual component data again - it should show that the component has now a purchase order (field RESBD-FLG_PURS). But the field is still empty.
    Intresting effect: When I start the transaction in another screen with the same production order SAP shows the updated value. This means the purchase order is really booked and the function module finds this data.
    So I am looing for a way to clear all data before using CMOC_COMP_READ. I did not found any helpful initialising FM.
    Thanks for your help
    Brigitte

    go to se37 & give d fm name VC_I_GET_CONFIGURATION_IBASE
    display
    note: from EQUI table take 'CUOBJ' value  EX '9825'
    DISPLAY THE FM GIVE UR CUOBJ NO IN INSTANCE  value textbox
    in the end including zero 9825 press execute u can see in the bottom table
    CONFIGURATION RESULT 53entries or whatever double click on that
    unow u can see the all field name .
    I HAVE DONE LIKE THIS IN SAMRT FORMS FOR PS
    FOR that i written this code
    *& FOR POLE , KW , CONST FIELDS
    *break : abapdev.
    SELECT SINGLE * FROM vbap INTO wa_vbap
             WHERE vbeln = wa_vbrp-aubel AND posnr = wa_vbrp-posnr .
    IF sy-subrc = 0.
      CALL FUNCTION 'VC_I_GET_CONFIGURATION_IBASE'
      EXPORTING
        instance                  = wa_vbap-cuobj
      BUSINESS_OBJECT           =
         language                  = sy-langu
      IV_INVALID_POSSIBLE       = ' '
      IV_NEUTRAL                = ' '
       TABLES
         configuration             = gt_data
      ET_CONF_WITH_AUTHOR       =
       EXCEPTIONS
         instance_not_found        = 1
         OTHERS                    = 2.
    ENDIF.          .
    IF sy-subrc <> 0.
    MESSAGE ID SY-MSGID TYPE SY-MSGTY NUMBER SY-MSGNO
            WITH SY-MSGV1 SY-MSGV2 SY-MSGV3 SY-MSGV4.
    ENDIF.
    *& FOR POLARITY FRAMESIZE & KW
    LOOP AT gt_data INTO wa_data.
      IF wa_data-atnam = 'KW1'.
        lv_kw1 = wa_data-atwrt.
      ENDIF.
    if wa_data-atnam = 'KW2'.
      lv_kw2 = wa_data-atwrt.
      ENDIF.
      IF wa_data-atnam = 'POLARITY'.
        lv_polarity = wa_data-atwrt.
      ENDIF.
      IF wa_data-atnam = 'FRAMESIZE'.
        lv_framesize = wa_data-atwrt.
      ENDIF.
    ENDLOOP.
    *& FOR MACHINE NUMBER
    *break : abapdev.
    SELECT SINGLE * FROM ser01 INTO wa_ser01
           WHERE lief_nr = wa_likp-vbeln.
    IF sy-subrc = 0.
      SELECT SINGLE * FROM objk INTO wa_objk
             WHERE obknr = wa_ser01-obknr.
    ENDIF.
    regrads
    aniruddh singh

  • How to update eket data by function module or BAPI?

    Dear All :
    I have to update all PO's vendor batch data .
    I want  to find a function module to execute the change , but I can't find a proper one to do the modification.
    I have try to use ME_CONFIRMATION_EKET_UPD , but it seems  PO need have ekbe data in advance.
    Hope someone can offer me a example to update mass eket data .
    I don't like to use BDC , I hope I can do the changes by functions.
    Thanks .

    Dear All :
    I have to update all PO's vendor batch data .
    I want  to find a function module to execute the change , but I can't find a proper one to do the modification.
    I have try to use ME_CONFIRMATION_EKET_UPD , but it seems  PO need have ekbe data in advance.
    Hope someone can offer me a example to update mass eket data .
    I don't like to use BDC , I hope I can do the changes by functions.
    Thanks .

  • How to calculate system date through function module date

    Hi friends!!
    i declare a variable "date like sy-datum".
    now i want to add 15 days to the system date,
    please give me the function module name which can do it.
    xample.
    date = sytem date. -> date= 13/08/2010
    i want                          date= 28/08/2010.
    please help.
    Edited by: sandeep08 on Aug 13, 2010 1:53 PM
    Moderator message: date calculation questions = FAQ, please search before posting.
    locked by: Thomas Zloch on Aug 13, 2010 2:03 PM

    Hi,
    You can directly add 15 to the date. It will give you appropriate results.
    Regards,
    Aparna Alashe.

  • Delta extraction(date) with Function module problem

    Hi All,
    FUNCTION zrsax_biw_get_data_pr_d.
    *"*"Local Interface:
    *"  IMPORTING
    *"     VALUE(I_REQUNR) TYPE  SBIWA_S_INTERFACE-REQUNR
    *"     VALUE(I_ISOURCE) TYPE  SBIWA_S_INTERFACE-ISOURCE OPTIONAL
    *"     VALUE(I_MAXSIZE) TYPE  SBIWA_S_INTERFACE-MAXSIZE OPTIONAL
    *"     VALUE(I_INITFLAG) TYPE  SBIWA_S_INTERFACE-INITFLAG OPTIONAL
    *"     VALUE(I_UPDMODE) TYPE  SBIWA_S_INTERFACE-UPDMODE OPTIONAL
    *"     VALUE(I_DATAPAKID) TYPE  SBIWA_S_INTERFACE-DATAPAKID OPTIONAL
    *"     VALUE(I_PRIVATE_MODE) OPTIONAL
    *"     VALUE(I_CALLMODE) LIKE  ROARCHD200-CALLMODE OPTIONAL
    *"     VALUE(I_REMOTE_CALL) TYPE  SBIWA_FLAG DEFAULT SBIWA_C_FLAG_OFF
    *"  TABLES
    *"      I_T_SELECT TYPE  SBIWA_T_SELECT OPTIONAL
    *"      I_T_FIELDS TYPE  SBIWA_T_FIELDS OPTIONAL
    *"      E_T_DATA STRUCTURE  ZPR_ST OPTIONAL
    *"  EXCEPTIONS
    *"      NO_MORE_DATA
    *"      ERROR_PASSED_TO_MESS_HANDLER
    * The input parameter I_DATAPAKID is not supported yet !
    * Example: InfoSource containing TADIR objects
    *  TABLES: tadir.
    *DATA: BEGIN OF zpr_st_copy,
    *        banfn TYPE zpr_st-banfn,
    *        bnfpo TYPE zpr_st-bnfpo,
    *        zebkn TYPE zpr_st-zebkn,
    *        knttp TYPE zpr_st-knttp,
    *        vbeln TYPE zpr_st-vbeln,
    *        ps_psp_pnr TYPE zpr_st-ps_psp_pnr,
    *        gsber TYPE zpr_st-gsber,
    *        werks TYPE zpr_st-werks,
    *        statu TYPE zpr_st-statu,
    *        ekgrp TYPE zpr_st-ekgrp,
    *        menge TYPE zpr_st-menge,
    *        frgdt TYPE zpr_st-frgdt,
    *        meins TYPE zpr_st-meins,
    *         loekz TYPE zpr_st-loekz,
    *      END OF zpr_st_copy.
    * Auxiliary Selection criteria structure
      DATA: l_s_select TYPE sbiwa_s_select.
    * Maximum number of lines for DB table
      STATICS: l_maxsize TYPE sbiwa_s_interface-maxsize.
    * Select ranges
    *  RANGES: l_r_pgmid  FOR tadir-pgmid,
    *          l_r_object FOR tadir-object,
        RANGES: PRNO for zpr_st-banfn,
                DATE1 FOR zpr_st-frgdt.
    * Parameter I_PRIVATE_MODE:
    * Some applications might want to use this function module for other
    * purposes as well (e.g. data supply for OLTP reporting tools). If the
    * processing logic has to be different in this case, use the optional
    * parameter I_PRIVATE_MODE (not supplied by BIW !) to distinguish
    * between BIW calls (I_PRIVATE_MODE = SPACE) and other calls
    * (I_PRIVATE_MODE = X).
    * If the message handling has to be different as well, define Your own
    * messaging macro which interprets parameter I_PRIVATE_MODE. When
    * called by BIW, it should use the LOG_WRITE macro, otherwise do what
    * You want.
    * Initialization mode (first call by SAPI) or data transfer mode
    * (following calls) ?
      IF i_initflag = sbiwa_c_flag_on.
    * Initialization: check input parameters
    *                 buffer input parameters
    *                 prepare data selection
    * The input parameter I_DATAPAKID is not supported yet !
    * Invalid second initialization call -> error exit
        IF NOT g_flag_interface_initialized IS INITIAL.
          IF 1 = 2. MESSAGE e008(r3). ENDIF.
          log_write 'E'                    "message type
                    'R3'                   "message class
                    '008'                  "message number
                    ' '                    "message variable 1
                    ' '.                   "message variable 2
          RAISE error_passed_to_mess_handler.
        ENDIF.
    * Check InfoSource validity
        CASE i_isource.
          WHEN 'ZPR_ST_DS_D' OR ''.
          WHEN OTHERS.
            IF 1 = 2. MESSAGE e009(r3). ENDIF.
            log_write 'E'                  "message type
                      'R3'                 "message class
                      '009'                "message number
                      i_isource            "message variable 1
                      ' '.                 "message variable 2
            RAISE error_passed_to_mess_handler.
        ENDCASE.
    * Check for supported update mode
        CASE i_updmode.
          WHEN 'F' OR ''.
          WHEN 'C'.
          WHEN 'R'.
          WHEN 'S'. " DELTA INITIALIZATION
          WHEN 'I'. "DELTA INITIALIZATION FOR NON CUMULATIVE
          WHEN 'D'. "DELTA
          WHEN OTHERS.
            IF 1 = 2. MESSAGE e011(r3). ENDIF.
            log_write 'E'                  "message type
                      'R3'                 "message class
                      '011'                "message number
                      i_updmode            "message variable 1
                      ' '.                 "message variable 2
            RAISE error_passed_to_mess_handler.
        ENDCASE.
    BREAK-POINT.
    * Check for obligatory selection criteria
    *    READ TABLE i_t_select INTO l_s_select WITH KEY fieldnm = 'ZPR_ST-FRGDT'.
    *    IF sy-subrc <> 0.
    *      IF 1 = 2. MESSAGE e010(r3). ENDIF.
    *      log_write 'E'                    "message type
    *                'R3'                   "message class
    *                '010'                  "message number
    *                'PGMID'                "message variable 1
    *                ' '.                   "message variable 2
    *      RAISE error_passed_to_mess_handler.
    *    ENDIF.
        APPEND LINES OF i_t_select TO g_t_select.
    * Fill parameter buffer for data extraction calls
        g_s_interface-requnr    = i_requnr.
        g_s_interface-isource   = i_isource.
        g_s_interface-maxsize   = i_maxsize.
        g_s_interface-initflag  = i_initflag.
        g_s_interface-updmode   = i_updmode.
        g_s_interface-datapakid = i_datapakid.
        g_flag_interface_initialized = sbiwa_c_flag_on.
    * Fill field list table for an optimized select statement
    * (in case that there is no 1:1 relation between InfoSource fields
    * and database table fields this may be far from beeing trivial)
        APPEND LINES OF i_t_fields TO g_t_segfields.
    *   Start tracing of extraction
    *    bice_trace_open g_r_tracer i_t_fields.
      ELSE.                 "Initialization mode or data extraction ?
    * Data transfer: First Call      OPEN CURSOR + FETCH
    *                Following Calls FETCH only
    * First data package -> OPEN CURSOR
        IF g_counter_datapakid = 0.
    * Fill range tables for fixed InfoSources. In the case of generated
    * InfoSources, the usage of a dynamical SELECT statement might be
    * more reasonable. BIW will only pass down simple selection criteria
    * of the type SIGN = 'I' and OPTION = 'EQ' or OPTION = 'BT'.
    *      LOOP AT g_t_select INTO l_s_select WHERE fieldnm = 'PGMID'.
    *        MOVE-CORRESPONDING l_s_select TO l_r_pgmid.
    *        APPEND l_r_pgmid.
    *      ENDLOOP.
    *      LOOP AT g_t_select INTO l_s_select WHERE fieldnm = 'OBJECT'.
    *        MOVE-CORRESPONDING l_s_select TO l_r_object.
    *        APPEND l_r_object.
    *      ENDLOOP.
    LOOP AT g_t_select INTO l_s_select WHERE fieldnm = 'ZPR_ST-FRGDT'.
                MOVE-CORRESPONDING l_s_select to DATE1.
                DATE1-sign = 'I'.
                DATE1-option = 'GE'.
                clear DATE1-high.
                APPEND DATE1.
          ENDLOOP.
    * Determine number of database records to be read per FETCH statement
    * from input parameter I_MAXSIZE. If there is a one to one relation
    * between InfoSource table lines and database entries, this is trivial.
    * In other cases, it may be impossible and some estimated value has to
    * be determined.
          l_maxsize = g_s_interface-maxsize.
          OPEN CURSOR WITH HOLD g_cursor FOR
    *      SELECT (g_t_fields) FROM tadir
    *                               WHERE pgmid  IN l_r_pgmid AND
    *                                     object IN l_r_object.    "#EC CI_GENBUFF
    *@ CODE FOR THE STRUCTURE TO FILL IN FROM EBAN AND EBKN@*
                SELECT a~banfn a~bnfpo k~zebkn a~knttp k~vbeln k~ps_psp_pnr k~gsber a~werks a~statu a~ekgrp a~menge a~menge a~frgdt a~meins
    * INTO CORRESPONDING FIELDS OF TABLE IT1
                FROM  eban AS a INNER JOIN ebkn AS k ON ( a~banfn = k~banfn AND a~bnfpo = k~bnfpo )
                WHERE a~banfn GE '2000000000' AND a~banfn LE '2999999999' and a~loekz eq ' ' and a~frgdt ge '20130401' and a~FRGKZ eq '2'.
    *BREAK-POINT.
        ENDIF.                             "First data package ?
    * Fetch records into interface table. There are two different options:
    * - fixed interface table structure for fixed InfoSources have to be
    *   named E_T_'Name of assigned source structure in table ROIS'.
    * - for generating applications like LIS and CO-PA, the generic table
    *   E_T_DATA has to be used.
    * Only one of these interface types should be implemented in one API !
        FETCH NEXT CURSOR g_cursor
                   APPENDING CORRESPONDING FIELDS
                   OF TABLE e_t_DATA
                   PACKAGE SIZE l_maxsize.
        IF sy-subrc <> 0.
          CLOSE CURSOR g_cursor.
    *      bice_trace_close g_r_tracer.
          RAISE no_more_data.
        ENDIF.
    *    bice_collect_table g_r_tracer e_t_data.
        g_counter_datapakid = g_counter_datapakid + 1.
      ENDIF.              "Initialization mode or data extraction ?
    ENDFUNCTION.
    in the above I_t_fields and I_T_select structures  are not getting data .....
    can any one pleasee let me know what mistake i hvae done with my code?
    and i m unbale to change data source value to F1 if i am trying to change my function module and extract structure are disappearing....
    i m not getting why it is happening .......
    thank you
    vijay

    Hi yasemin,
       I m bit confused here with the line below
                                     IF i_initflag = sbiwa_c_flag_on.(if we pass 'X' then it will enter loop and checks for F or D and then assigns values to I_T_SELECT and I_T_Fields structure)
          accordfing to my code i feel it will work for any one not both(F or D).
    one more doubt rsax_biw_get_data extraction method is F2 few of them are asking to change to F1.
    so tried running a code then in RSO2 extact structure and FM both dissapeared i did not get why it happened ?
    can you please let me know why it happend
    thanks
    vijay

  • Date Conversion Function Modules YYYYMMDD to MM/DD/YYYY

    Hi,
    I have a requirement to Conver the Dats from format: YYYYMMDD into the Format : MM/DD/YYYY. Can you  please suggest me a suitabble Standard Function Module if exists? If not please suggest me a solution for this data conversion.
    Thanks,
    Rajan.SA

    Hi,
    You can use WRITE FORMATING.
    Here the sample code:
    DATA: BEGDA       TYPE TEXT10,
          ENDDA       TYPE SY-DATUM.
      WRITE SY-DATUM TO BEGDA MM/DD/YYYY.
      WRITE SY-DATUM TO ENDDA MM/DD/YYYY.
    And of course you can use other format, like:
    ... DD/MM/YY
    ... MM/DD/YY
    ... DD/MM/YYYY
    ... MM/DD/YYYY
    ... DDMMYY
    ... MMDDYY
    ... YYMMDD
    Or you can use concatenate statement:
        concatenate SY-DATUM+4(2) SY-DATUM+6(2)
        SY-DATUM(4) INTO BEGDA separated by '/'.
    Regards,

  • Buffer table not up to date - BBP_PD_PO_SAVE Function Module

    Hi SRM Experts,
    I am trying to develop custom program for uploading POs into SRM and got struck at the time of BBP_PD_PO_SAVE function Module.
    I followed the follwoing steps:
    Step 1: Creating PO with BBP_PD_PO_CREATE - this step executed successfully.
    Step 2: Trying to save PO data into SRM with BBP_PD_PO_SAVE - this step I am getting error message "Buffer table not up to date". 
    CALL FUNCTION 'BBP_PD_PO_SAVE'
    EXPORTING
      IV_WORKITEM_ID               =
      IV_USERTYPE                  =
       IV_HEADER_GUID               = wa_header-guid
      IV_CREATE_HIST_VERSION       =
    wa_header-guid - PO GUID which is created in first step.
    Please let me know any suggestions or solution on this.
    Thanks,
    Koyya

    Hi Koyya ,
    I am also doing the same in our project . But i am able to save the PO using BBP_PD_PO_SAVE Function Module .
    If you are getting this error means , then you check the all guids mapping part .
    Check all item guids ...have mentioned same parent guid
    same to account deatils and partner data also.
    Thank you ,
    Bharathi

Maybe you are looking for

  • HT201276 Frozen computer

    What do I do if my comPuter is frozen and force quit doesn't work?

  • 18 itunes could not be synced see itunes for more information

    18 itunes could not be synced see itunes for more information ? ?

  • GRC AC 10 SPM Empty Logs

    Hello Experts , Strange thing that I am observing , while obtaining FF Logs in the UI , some logs are blank while some are populated in the session details .  What could be reason for this ? The logs under "Log Summary Reports"are empty for some sess

  • Launching Splash Screen on the click of a button

    Situation: I have an application running, and when the user clicks a button on the main menu, a new dialog opens. Problem: This dialog takes awhile to load as it is retreiving information from the database etc ... hence I would like to launch a splas

  • Setting an existing StringBuffer to String?

    I have an existing property that is a StringBuffer. I need to update it several times with a String value. Currently I have: protected void setDescription(String description) m_sDescription = new StringBuffer(description); Is this correct I don't see