Conversion of routines to Ecc 6.0

hi all,
        i need to upload routings from legacy system to Ecc6.0 version,i have no clue of routings
  can i do it by Lsmw direct input method by using program RCPTRA02 or Bapi_routine_create,please suggest and i need to validate this with material,bom and workcenter before creating can it be done by any of the methods,please suggest.

Can you add more detail here ?
Is this a version upgrade from SAP R/3 4.6 to SAP ECC 6 ?

Similar Messages

  • Regarding form routines IN ECC 6.0

    Hi Abapers,
                       I am currently working in ECC 6.0. I have come through an error as
    se old_entry_xxx as a form routine if you use an own print program
    I have a form routine in my include program as follows...
    FORM ENTRY_NEU USING ENT_RETCO ENT_SCREEN.
      XSCREEN = ENT_SCREEN.
      IF NAST-AENDE EQ SPACE.
        XDRUVO = '1'.
      ELSE.
        XDRUVO = '2'.
      ENDIF.
      CLEAR: XFZ, XOFFEN, XLMAHN, XLPET.
      CLEAR ENT_RETCO.
      PERFORM LESEN USING NAST.
      MOVE RETCO TO ENT_RETCO.
    ENDFORM.   
    Can anyone give any hints regarding how to come out of this error, i guess its a unicode error but not sure.
    Frnds looking for ur help.
    thanks
    & regards,
    kamal

    Hi ,
           I have'nt come up with any solutions yet. But wht i consider is the perform doesnt exist for that form routine.I m wondering , Is that a form routine has any "perform". Frnds if anyone is having any clues plzz provide.
    Its basically a Upgrade task.
    thanking u all.
    regards,
    kamal

  • Conversion Exit/Routines for Project ID

    Hello All,
    I am from the BI forum.
    I would like to have conversion exit for Project ID, The Problem i am facing in BI is, that in my BI report , the project iD displays in internal format , but i need in External format.
    For Ex the Project ID in Master data is P000291 but it displays as 0002189, which is wrong.
    I have found routines like CONVERSION_EXIT_ABPRJ_OUPUT,.
    I have also written a code in my BI system, also, but it still it shows me the internal format.
    The Source field is PSPID coming from PROJ table.
    I need to know the list of conversion routines for Project ID,,(to Convert Internal to External format).
    Thanks and Regards

    use the below FM "CONVERSION_EXIT_ABPSN_OUTPUT"

  • Currency conversion via routine in transformation BI 7.0

    Hi,
    for an international data model we want to translate currencies via data load using a routine in the transformations. We are thinking about creating 2 key figures for local currency and group currency. Group currency is always EUR. We found to function modules but we are not sure about the differences and if we can us them at all: CONVERT_TO_LOCAL_CURRENCY and RSW_CURRENCY_TRANSLATION
    Does anyone of you implemented currency conversion in a transformation before using a routine. And does anyone have experience with those function modules and can explain the differences? Thanks a lot in advance! Any help is appreciated!
    Aline

    Hi,
    You can use the readily available functionality to convert the amounts from one currency to other.
    Use transaction RSCUR (maintain currency translation types) to create the currency translation type nad use it directly in the transformations.
    Regards,
    Yogesh

  • VOFM Routine Copy in ECC 6.0

    Hi,
    When I copy a VOFM routine in ECC 6.0 (say billing document routine 001 copied to 901) to a custom routine, I see some messages regarding the existing enahancement points & sections, which do not allow me to activate the copied routine. Can any one of you suggest a good practice to copy the routine in ECC 6.0 environment.
    Thanks
    BK

    Hi,
      When ever you are copying it from the standard routine. The enhancement points and sections available in the standard will also be copied into the custom. So, Place the cursor on Enhancement-pont or Enhancement-section and right click select the option enhancement-> undo. Once you do this the enhancements will be deleted from custom routine and then you can activate it.
    Thanks
    Indira.

  • Planned orders are not converted into process orders in ECC.

    Dear All,
    The issue is that Planned orders with conversion tick are not publishing in ECC as manufacturing orders. We did check the relevant master data consistency between APO and ECC and it seems fine.
    We have tried to send the conversion from APO to ECC,all the orders stuck in the R1P inbound queue with error - Order no. XXXX does not exist
    Message no. C/006.
    Based on above message and error we found SAP Note 515740 - Inconsistencies in table CIFORDMAP for this issue.
    Used the transaction SE38 and created RCFORDCH report and 'Checking inconsistencies in table CIFORDMAP'
    Here it shows order series stuck in queues no longer exists.
    But not sure how to reconcile the inconsistency in the CIFORDMAP table.
    Would appreciate your advice.
    Regards,
    Sajit SIngh

    Hi Sajit Singh,
    Could you take some sample items struck for order conversion and check
    whether active PPDS & SNP PPMs available. 
    In some cases, conversion will be affected for want of PPMs.  If it is the
    case with you, try generating the PPM first for that sample item and retry
    converting the orders.
    Could you please check and confirm this.
    Regards
    R. Senthil Mareeswaran.

  • RFC & Excel VBA  with ECC 6.0

    I use a routine like this to post movements in R/3 (This is an example for MB1A Transaction) based on information posted on a excel spreadsheet  + VBA and seudo-code created with SM35 transaction
    Public Sub updateRFC_BDC()
    'Set sheet specific variables / constants
    j = 0
    startRow = 3
    colStatus = 1
    colMsg = 1
    ' Cell information on the excel spreadsheet
    colMKPF_BLDAT = 2
    colMKPF_BUDAT = 3
    colMKPF_OIB_BLTIME = 4
    colRM07M_BWARTWA = 5
    colRM07M_WERKS = 6
    colRM07M_LGORT = 7
    colXFULL = 8
    colRM07M_WVERS3 = 9
    colMSEG_MATNR = 10
    colMSEG_ERFMG = 11
    colMSEG_ERFME = 12
    colMSEG_WERKS = 13
    colMSEG_LGORT = 14
    colMSEG_CHARG = 15
    colMSEG_OIHANTYP = 16
    colOIB_A08_TDICH = 17
    colOIB_A08_TDICHEH = 18
    colOIB_A08_MTTMP = 19
    colOIB_A08_MTTEH = 20
    colOIB_A08_TSTMP = 21
    colOIB_A08_TSTEH = 22
    colOIB_A08_MCF = 23
    colDKACB_FMORE = 24
    colCOBL_PRCTR = 25
    i = 0
    'Set debug mode
    If CheckBox1.Value = True Then
       DEBUG_MODE = True
    Else
       DEBUG_MODE = False
    End If
    'Reset status column
    Range(Cells(startRow, colMsg), Cells(60000, colMsg)).Value = ""
    'Login to SAP, if it fails, notify user and exit sub
    updateStatus "Logging into SAP...", colStatus, 1
    If Not login2SAP Then
       MsgBox "Login to SAP failed.  Remote Function Call NOT performed.", vbInformation, "Login Failed"
       updateStatus "", colStatus, 1
       Exit Sub
    End If
    'While the next row is not empty loop through BDC
    While Trim(Cells(startRow + i, 2).Value) <> ""
       firstTime = True
       updateStatus "Processing Row " & (startRow + i), colStatus, 1
       ' Retrieve the Function object (the Connection object must be set up before Function objects can be created):
       Set RfcCallTransaction = Functions.Add("RFC_CALL_TRANSACTION")
       'Set the export parameters
       RfcCallTransaction.exports("TRANCODE") = "MB1A                                                                                "
       RfcCallTransaction.exports("UPDMODE") = "S"
       Set BdcTable = RfcCallTransaction.Tables("BDCTABLE")
       'Highlight current row so user knows what is happening
       Cells(startRow + i, 2).Select
       'Screen SAPMM07M BDC code
       add_BDCData BdcTable, "SAPMM07M", "0400", "X", "", ""
       add_BDCData BdcTable, "", "", "", "BDC_CURSOR", "RM07M-LGORT"
       testForBlank_AddToBDC "MKPF-BLDAT", Cells(startRow + i, colMKPF_BLDAT).Value
       testForBlank_AddToBDC "MKPF-BUDAT", Cells(startRow + i, colMKPF_BUDAT).Value
       testForBlank_AddToBDC "MKPF-OIB_BLTIME", Cells(startRow + i, colMKPF_OIB_BLTIME).Value
       testForBlank_AddToBDC "RM07M-BWARTWA", Cells(startRow + i, colRM07M_BWARTWA).Value
       testForBlank_AddToBDC "RM07M-WERKS", Cells(startRow + i, colRM07M_WERKS).Value
       testForBlank_AddToBDC "RM07M-LGORT", Cells(startRow + i, colRM07M_LGORT).Value
       testForBlank_AddToBDC "XFULL", Cells(startRow + i, colXFULL).Value
       testForBlank_AddToBDC "RM07M-WVERS3", Cells(startRow + i, colRM07M_WVERS3).Value
       add_BDCData BdcTable, "", "", "", "BDC_OKCODE", "=NPE"
       'Screen SAPMM07M BDC code
       add_BDCData BdcTable, "SAPMM07M", "0410", "X", "", ""
       add_BDCData BdcTable, "", "", "", "BDC_CURSOR", "MSEG-OIHANTYP"
       testForBlank_AddToBDC "MSEG-MATNR", Cells(startRow + i, colMSEG_MATNR).Value
       testForBlank_AddToBDC "MSEG-ERFMG", Cells(startRow + i, colMSEG_ERFMG).Value
       testForBlank_AddToBDC "MSEG-ERFME", Cells(startRow + i, colMSEG_ERFME).Value
       testForBlank_AddToBDC "MSEG-WERKS", Cells(startRow + i, colMSEG_WERKS).Value
       testForBlank_AddToBDC "MSEG-LGORT", Cells(startRow + i, colMSEG_LGORT).Value
       testForBlank_AddToBDC "MSEG-CHARG", Cells(startRow + i, colMSEG_CHARG).Value
       testForBlank_AddToBDC "MSEG-OIHANTYP", Cells(startRow + i, colMSEG_OIHANTYP).Value
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPMM07M                                2400BLOCK1"
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPMM07M                                2400BLOCK2"
       add_BDCData BdcTable, "", "", "", "BDC_OKCODE", "/00"
       'Screen SAPLOIB_QCI BDC code
       add_BDCData BdcTable, "SAPLOIB_QCI", "0500", "X", "", ""
       add_BDCData BdcTable, "", "", "", "BDC_CURSOR", "OIB_A08-TDICH"
       testForBlank_AddToBDC "OIB_A08-TDICH", Cells(startRow + i, colOIB_A08_TDICH).Value
       testForBlank_AddToBDC "OIB_A08-TDICHEH", Cells(startRow + i, colOIB_A08_TDICHEH).Value
       testForBlank_AddToBDC "OIB_A08-MTTMP", Cells(startRow + i, colOIB_A08_MTTMP).Value
       testForBlank_AddToBDC "OIB_A08-MTTEH", Cells(startRow + i, colOIB_A08_MTTEH).Value
       testForBlank_AddToBDC "OIB_A08-TSTMP", Cells(startRow + i, colOIB_A08_TSTMP).Value
       testForBlank_AddToBDC "OIB_A08-TSTEH", Cells(startRow + i, colOIB_A08_TSTEH).Value
       testForBlank_AddToBDC "OIB_A08-MCF", Cells(startRow + i, colOIB_A08_MCF).Value
       add_BDCData BdcTable, "", "", "", "BDC_OKCODE", "=CONT"
       'Screen SAPMM07M BDC code
       add_BDCData BdcTable, "SAPMM07M", "0410", "X", "", ""
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPLKACB                                0001BLOCK"
       testForBlank_AddToBDC "DKACB-FMORE", Cells(startRow + i, colDKACB_FMORE).Value
       'Screen SAPLKACB BDC code
       add_BDCData BdcTable, "SAPLKACB", "0002", "X", "", ""
       add_BDCData BdcTable, "", "", "", "BDC_CURSOR", "COBL-AUFNR"
       testForBlank_AddToBDC "COBL-PRCTR", Cells(startRow + i, colCOBL_PRCTR).Value
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPLKACB                                9999BLOCK1"
       add_BDCData BdcTable, "", "", "", "BDC_OKCODE", "=ENTE"
       'Screen SAPMM07M BDC code
       add_BDCData BdcTable, "SAPMM07M", "0410", "X", "", ""
       add_BDCData BdcTable, "", "", "", "BDC_CURSOR", "MSEG-ERFMG"
       testForBlank_AddToBDC "MSEG-ERFMG", Cells(startRow + i, colMSEG_ERFMG).Value
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPMM07M                                2400BLOCK1"
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPMM07M                                2400BLOCK2"
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPLKACB                                0001BLOCK"
       testForBlank_AddToBDC "DKACB-FMORE", Cells(startRow + i, colDKACB_FMORE).Value
       add_BDCData BdcTable, "", "", "", "BDC_OKCODE", "=BU"
       'Screen SAPLKACB BDC code
       add_BDCData BdcTable, "SAPLKACB", "0002", "X", "", ""
       add_BDCData BdcTable, "", "", "", "BDC_CURSOR", "COBL-AUFNR"
       testForBlank_AddToBDC "COBL-PRCTR", Cells(startRow + i, colCOBL_PRCTR).Value
       add_BDCData BdcTable, "", "", "", "BDC_SUBSCR", "SAPLKACB                                9999BLOCK1"
       add_BDCData BdcTable, "", "", "", "BDC_OKCODE", "=ENTE"
       add_BDCData BdcTable, "TCDEMB1A                                                                                ", "", "", "", ""
       firstTime = False
       ' Call the function (if the result is false, then display a message):
       If RfcCallTransaction.CALL = True Then
           Set Messages = RfcCallTransaction.imports("MESSG")
           If DEBUG_MODE Then
               printBDCTable (startRow + i)
           End If
           Cells(startRow + i, colMsg).Value = Messages.Value("MSGTX")
       Else
           MsgBox " Call Failed! error: " + RfcCallTransaction.Exception
           updateStatus "Error!", colStatus, 1
       End If
       i = i + 1
       j = 0
       Messages.Value("MSGTX") = ""
    Wend
    logOffSAP
    If DEBUG_MODE Then
        MsgBox "BDC file written to : " & DEBUG_FILE
    End If
    updateStatus "Processing Done. Logged off of SAP", colStatus, 1
    End Sub
    Now I'm trying to use this routine for  ECC 6.0, but it looks like the export parameter changed and it is not working.
    Could you please help me to debug this routine to make it work with ECC 6.0
    Thanks

    Dear Javier Cantini,
    Welcome to SCN.
    Post your queries in relevant forum. Your query is technical in nature and should be posted in ABAP forums. Moving your thread to ABAP, General forum.
    Regards,
    Naveen

  • Raw conversion: open EOS 70D Raw files in Elements 8?

    I have a Windows 7 operating system, and Photoshop Elements 8. I have a new Canon EOS 70D and want to find
    an adobe Raw converter which will allow appropriate processing, and connecting finished results to Elements 8 for conversion  to routine JPeg or PSD? Any reccomendations?

    The EOS 70D was first supported in Adobe Camera Raw (ACR) 8.2
    http://helpx.adobe.com/creative-suite/kb/camera-raw-plug-supported-cameras.html
    ACR8.2 is only compatible with Elements 11 and 12. Not Elements 8 so you cannot open Raw files from the 70D in Elements 8.
    Your choices:
    Upgrade to Elements 12, OR
    Download the free Adobe DNG converter and convert all 70D Raw files to DNGs. That adds an extra step to your workflow each time you shoot more pictures. Then edit the DNGs in Elements 8.
    http://www.adobe.com/products/photoshop/extend.displayTab2.html

  • Print program failed in new ECC 5.0,need help

    Hi All,
    how are you doing,Please help me in how to proceed to the solution.
    We are
    My problem is We are upgrading SAP from 4.6C to ECC 5.0,
    In the print program we getting error saying the
    "Processing log for program SAPFM06P routine OLD_ENTRY_NEU"
    "Processing routine OLD_ENTRY_NEU in program SAPFM06P does not exist"
    Could please help me out how to do print program in new version.
    Thanks in advance
    Madhavi

    Hi Madhavi,
    It seems SAP does not support old_entry_neu routine from ECC 5.0 onwards. For more details, pls check SAP Note 324453. I think you need to change Form routine using OMFE txn in the Customizing of the message type .
    FYI:
    Symptom
    The print program does no longer work in purchasing.
    Other terms
    MEDRUCK, SAPLMEDRUCK, SAPFM06P, TNAPR, ENTRY_NEU, OLD_ENTRY_NEU, ENTRY_MAHN, OLD_ENTRY_MAHN, ENTRY_AUFB, OLD_ENTRY_AUFB, ME21N, ME21, ME22, ME22N, ME9A, ME9E, ME9F, ME9L, ME9K
    Reason and Prerequisites
    The print function was changed in purchasing.
    Solution
    With Release 4.6, new print program SAPLMEDRUCK is used.
    This program is called by SAPFM06P if FORM routine ENTRY_NEU is entered in Customizing of the message type (table TNAPR (transaction OMFE)).
    These settings are delivered in the SAP standard system.
    However, the old print logic is still available via FORM routine OLD_ENTRY_NEU. The print runs as in earlier releases.
    The same logic also applies to order acknowledgments OLD_ENTRY_AUFB and urgings OLD_ENTRY_MAHN.
    For scheduling agreements with release documentation with print operation 'A' and '9' (both for FAB and for LAB), you should continue to use Form routine ENTRY_LPHE.
    As of Release 4.6, only the print program delivered in the standard is maintained. Thus, the routines OLD_ENTRY_xyz are no longer supported.
    In Release 470, the routines OLD_ENTRY_xyz do no longer exist in
    program SAPFM06P.
    Cheers,
    Vikram
    Pls reward for helpful replies!!

  • IPC STEPS FLOW

    Hi ,
    How to developement in (IPC).Quote Pricing Routines. ECC is based on ABAP programming
    language and CRM on Java and ABAP programming Language. Please send one scenario step by step. I am new in IPC Development .....
    Moderation:
    1. Wrong space.
    2. Basic question. Please follow The SCN Rules of Engagement and do the search before posting.
    Message was edited by: Andrei Vishnevsky

    Open up the step properties window. Click on the Run Options tab. Unselect the Record Results checkbox near the bottom of the tab window. You can do this on any step that you do not want recorded in the report.
    - tbob
    Inventor of the WORM Global

  • Mail via Background job

    Dear All,
    We have a background job, which will execute a z program. The out put of Z program will be sent as a mail to the recipient listed in "Spool list recipient" (SM36).
    We did unicode conversion and upgrade to ecc 6.0.
    Even now background job send the out put to mail, but when we open the attached html file in the mail which contains the out put, it displaying with junk characters.
    Out put looks like  "  戼‾⼼㹢⼼潦瑮㰠   "
    Your help will be highly appriciated.
    Thanks and regards
    Joseph

    hi check this...
    Save Report Output to a PDF File
    This report takes another report as input, and captures the output of that report. The output is then converted to PDF and saved to a local file. This shows how to use some of the PDF function modules, as well as an easy way to create PDF files.
    One thing I am not thrilled about is how the spool number is retrieved. If anyone has any better method, please let me know! Until I actually have a production use for a program like this, I will not try to find a better way.
    Source Code Listing
    report zabap_2_pdf.
    *-- Enhancements: only allow to be run with variant.  Then called
    *-- program will be transparent to users
    *-- TABLES
    tables:
      tsp01.
    *-- STRUCTURES
    data:
      mstr_print_parms like pri_params,
      mc_valid(1)      type c,
      mi_bytecount     type i,
      mi_length        type i,
      mi_rqident       like tsp01-rqident.
    *-- INTERNAL TABLES
    data:
      mtab_pdf    like tline occurs 0 with header line,
      mc_filename like rlgrap-filename.
    *-- SELECTION SCREEN
    parameters:
      p_repid like sy-repid, " Report to execute
      p_linsz like sy-linsz default 132, " Line size
      p_paart like sy-paart default 'X_65_132'.  " Paper Format
    start-of-selection.
    concatenate 'c:\'
                p_repid
                '.pdf'
      into mc_filename.
    *-- Setup the Print Parmaters
      call function 'GET_PRINT_PARAMETERS'
       exporting
         authority= space
         copies   = '1'
         cover_page                   = space
         data_set = space
         department                   = space
         destination                  = space
         expiration                   = '1'
         immediately                  = space
         in_archive_parameters        = space
         in_parameters                = space
         layout   = space
         mode     = space
         new_list_id                  = 'X'
         no_dialog= 'X'
         user     = sy-uname
       importing
         out_parameters               = mstr_print_parms
         valid    = mc_valid
       exceptions
         archive_info_not_found       = 1
         invalid_print_params         = 2
         invalid_archive_params       = 3
         others   = 4.
    *-- Make sure that a printer destination has been set up
    *-- If this is not done the PDF function module ABENDS
      if mstr_print_parms-pdest = space.
        mstr_print_parms-pdest = 'LOCL'.
      endif.
    *-- Explicitly set line width, and output format so that
    *-- the PDF conversion comes out OK
      mstr_print_parms-linsz = p_linsz.
      mstr_print_parms-paart = p_paart.
      submit (p_repid) to sap-spool without spool dynpro
                       spool parameters mstr_print_parms
                       via selection-screen
                       and return.
    *-- Find out what the spool number is that was just created
      perform get_spool_number using sy-repid
                 sy-uname
        changing mi_rqident.
    *-- Convert Spool to PDF
      call function 'CONVERT_ABAPSPOOLJOB_2_PDF'
        exporting
          src_spoolid= mi_rqident
          no_dialog  = space
          dst_device = mstr_print_parms-pdest
        importing
          pdf_bytecount                  = mi_bytecount
        tables
          pdf        = mtab_pdf
        exceptions
          err_no_abap_spooljob           = 1
          err_no_spooljob                = 2
          err_no_permission              = 3
          err_conv_not_possible          = 4
          err_bad_destdevice             = 5
          user_cancelled                 = 6
          err_spoolerror                 = 7
          err_temseerror                 = 8
          err_btcjob_open_failed         = 9
          err_btcjob_submit_failed       = 10
          err_btcjob_close_failed        = 11
          others     = 12.
    call function 'DOWNLOAD'
         exporting
              bin_filesize            = mi_bytecount
              filename                = mc_filename
              filetype                = 'BIN'
         importing
              act_filename            = mc_filename
         tables
              data_tab                = mtab_pdf.
          FORM get_spool_number *
          Get the most recent spool created by user/report              *
    -->  F_REPID               *
    -->  F_UNAME               *
    -->  F_RQIDENT             *
    form get_spool_number using f_repid
         f_uname
                    changing f_rqident.
      data:
        lc_rq2name like tsp01-rq2name.
      concatenate f_repid+0(8)
                  f_uname+0(3)
        into lc_rq2name separated by '_'.
      select * from tsp01 where  rq2name = lc_rq2name
      order by rqcretime descending.
        f_rqident = tsp01-rqident.
        exit.
      endselect.
      if sy-subrc ne 0.
        clear f_rqident.
      endif.
    endform." get_spool_number
    regards,
    venkat .

  • Discrepancy in the table payr, need urgent help

    Dear All,
    i have one table payr in logical database.
    2 fields of it i,e kunnr and vblnr
    When i goto se16 and select the data for say kunnr = '2901350' and vblnr = '20002000'
    Now what happens for this combination i get no data found.
    but say i enter only vblnr = '20002000' i get teh outpur with kunnr '2901350'.
    BUt at the time of selection i enter data i dont get it.
    I also tried entering '0002901350' than to data is not coming.
    when i entered in selection kunnr = '2901350*' then i get the output
    PLease help me output it this is the problem with the conversion exit or not
    how to resolve the problem
    Regards,
    Tanvi

    is the table being updated by any  Z PROGRAM ,,
    if so then in that program check whether the entries on kunnr and vblnr have used conversion alpha routine ..
    if i dont use a routine on value 21220020 then if it is storing in the table as 21220020 then its a discrepancy cause it has to be stored as 0021220020 .
    see if any database entry is like this which u have referred in the post .
    if any one is missing(either on kunnr or vblnr) then its a data discrepancy problem for which u cannot handle with a select.
    regards,
    vijay

  • Table in webdynpro

    hi, i have  displayed a table in webdynpro in that the first column is a listbox. when i select a value it should display the corresponding details in the other columns.

    Below is my coding inside the dropdown's event handler ONACTIONON_MATNR_SELECT
    METHOD onactionon_matnr_select .
      DATA: lr_element TYPE REF TO if_wd_context_element,
            lv_index_table TYPE i,
            lv_index TYPE i,
            lt_node TYPE wd_this->elements_node,
            wa_node TYPE wd_this->element_node,
            wd_node TYPE REF TO if_wd_context_node,
            wa_makt TYPE wd_this->element_makt.
    *** Get row number from which dropdown value was selected
      lr_element = wdevent->get_context_element( 'CONTEXT_ELEMENT' ).
      lv_index_table = lr_element->get_index( ).
      wd_node = wd_context->get_child_node( 'MAKT' ).
      wd_node->set_lead_selection_index( index = lv_index_table ).
    *** Get the index of value within dropdown which is selected
      lv_index = wdevent->get_int( name = 'INDEX' ).
    *** Fetch all the dropdown values into an internal table
      wd_node = wd_context->path_get_node( 'MAKT.NODE' ).
      CALL METHOD wd_node->get_static_attributes_table
        EXPORTING
          from  = 1
          to    = 2147483647
        IMPORTING
          table = lt_node.
    *** Obtain the value selected in the dropdown by the user using the index obtained
      READ TABLE lt_node INTO wa_node INDEX lv_index.
      wd_node->set_attribute( EXPORTING name  = 'MATNR'
                                        value = wa_node-matnr ).
    **** Using conversion exit routine for MATNR so that SELECT statement would work properly
      CALL FUNCTION 'CONVERSION_EXIT_MATN1_INPUT'
        EXPORTING
          input        = wa_node-matnr
        IMPORTING
          output       = wa_node-matnr
        EXCEPTIONS
          length_error = 1
          OTHERS       = 2.
      IF sy-subrc <> 0.
        MESSAGE ID sy-msgid TYPE sy-msgty NUMBER sy-msgno
                WITH sy-msgv1 sy-msgv2 sy-msgv3 sy-msgv4.
      ENDIF.
    *** Obtain language & description fields from MAKT for same value as selected in the dropdown
      SELECT SINGLE spras
                    maktx FROM makt INTO wa_makt WHERE matnr = wa_node-matnr.
    *** Fill the fetched values into the corresponding textfields of table
      wd_node = wd_context->get_child_node( 'MAKT' ).
      CALL METHOD wd_node->set_static_attributes
        EXPORTING
          index             = lv_index_table
          static_attributes = wa_makt.
    ENDMETHOD.

  • QuickTime won't play the format my camcorder records in.

    Camcorder:Sony DCR SR 68
    it saves recordings as .mpg files
    I thought the latest quicktime was able to read these files, but it seems not.
    Using VLC player at the moment, but would like to be able to use native applications (not to mention iMovie)
    I have searched for this addition software, but to no avail.

    I took your advice, and attemped to use iMovie with the files, but it fails to do anything.
    Files must be imported into iMovie directly from the camcorder for iMovie to call the proper "Import from Camera" conversions/capture routines. Files already on your hard drive will be copied/moved to iMovie using "Import" Finder-level routines which do not convert the content to an edit compatibile compression format. So, if the files are not already edit compatible with iMovie, the import option will abort and fail when it determines the content is not edit compatible.
    I will try the Quicktime component with the MPEG Streamclip.
    As already mentioned by John, use of the free MPEG Streamclip app requires the $19.99 QT MPEG-2 Playback component also be installed. The advantage of this work flow is that you have the option to convert "muxed" MPEG-2/AAC fils into any QT edit compatibile compression format combination. (I would normally prefer AIC video with Uncompressed audio here, but you could also use DV/DV, DV/AIFF, Photo-JPEG/AAC, or other equally compatible combination of AV codecs.) Another free third-party option for converting "muxed" MPEG-2/AC3 content would be the free HandBrake app. The disadvantage here is that, like Lion's QT X Player, you are limited with regard to your output options—primarily H.264 video with AAC. Also be advised that QT 7 Pro, even with the QT MPEG-2 Playback component installed, will not handle AC3 audio natively.

  • Temporary files and buffersize limit question

    Hello,
    I have two questions :
    1. Buffer limit
    Is there a limit for the buffer to return to a client. I have
    a conversational service routine. If I want to return 50 record ( i.e. view structures
    ) my service routine hangs. If I do 10 records than it is ok. Is there a limit
    size to return. Is there a parameter in UBBconfig to fix this.
    2. Temporary files on conversational client / services
    My service routine creates temporary files in the /tmp directory. Unfortunately
    the mode for /tmp has 't'bit on so users can not delete files from other users.
    The problem is I have a lot of temporary files in /tmp. Does anyone know how to
    fix this or where can you specify not to use temp files or where can you specify
    the directory to create tempfile. de name of files are /tmp/TUXxxxxxx where xxxxxx
    is a random serie of characters.
    Thanks a lot
    Johan den Boer
    email : [email protected]
    [email protected]

    Buffers that are larger than 3/4 of MSGMNB are sent through a file. The name is
    generated with tmpnam(), so you should be able to specify a different directory by
    setting TMPDIR in the environment.
    The preferred solution is to not use file transfer, by setting your IPC parameters
    high enough to pass all of your application messages.
    If your service routine hangs, you should look at a possible application problem.
    How are you packing the VIEWs into a buffer? Are you using embedded FML with
    FLD_VIEW32 fields? That would be the best way.
    Remember that VIEWs are binary structures that are unique to a particular machine
    type. If you pack Views together into your own buffer format, and try to use them
    on a different machine type, then they won't work properly.
         Scott Orshan
    Johan den Boer wrote:
    Hello,
    I have two questions :
    1. Buffer limit
    Is there a limit for the buffer to return to a client. I have
    a conversational service routine. If I want to return 50 record ( i.e. view structures
    ) my service routine hangs. If I do 10 records than it is ok. Is there a limit
    size to return. Is there a parameter in UBBconfig to fix this.
    2. Temporary files on conversational client / services
    My service routine creates temporary files in the /tmp directory. Unfortunately
    the mode for /tmp has 't'bit on so users can not delete files from other users.
    The problem is I have a lot of temporary files in /tmp. Does anyone know how to
    fix this or where can you specify not to use temp files or where can you specify
    the directory to create tempfile. de name of files are /tmp/TUXxxxxxx where xxxxxx
    is a random serie of characters.
    Thanks a lot
    Johan den Boer
    email : [email protected]
    [email protected]

Maybe you are looking for

  • Error when uppload a employee pic

    Hi folks (sorry for my English): I have a trouble, because it’s necessary to show the photo associated to a specific employee, using Portal. First, I need to upload the images, and for that reason I’m using the ArchiveLink… All the step, were develop

  • How to Reinstall OS X to a completely reset Macbook Air?

    I Reset my macbook cause ads were becoming a problem and i couldnt get rid of them. When i try to reinstall mavericks it says temporarly not available. I think it wont let me because i dont have Yosemite. Is there any possible way for me to reinstall

  • Saving Applet display as an image... Java newb

    Hello, I'm using wirefusion3D to display and configure 3D objects on a website I've been developing. The only thing it lacks is the ability to save out an image of the current display, which I need to do in order to place those images on a pdf invoic

  • Escaping of special signs, once it works, once not

    Hi all, I would like to ask a simple question, I believe some of you know this issue already and know how to solve it, I googled an hour, changed the code 100 times, but with the first $query I get always "Execute not successful." Does anyone know ho

  • Macbook Pro 2011 do I return or keep upgrading? Help!!!

    Okay so everyone on this forum is more helpful everyday that passes, no joke you guys are great! Heres the new story, So I have a 13" MBP early 2011 i5 that I just got less than a month ago. Now I upgraded the Ram to 8GB and was going to throw in a 1