similar to: [SUMMARY] Converting coef(lm) to SQL/VBA/etc

Displaying 20 results from an estimated 7000 matches similar to: "[SUMMARY] Converting coef(lm) to SQL/VBA/etc"

2008 Jun 21
1
converting an R function into VBA
Hi everyone, I want to convert an R function into VBA for calculating the eigenvectors and eigenvalues of a matrix using the "Power Method". The function is: PowerMethod <- function(x, tolerance) {     my.mat <- var(x[,-1], na.method="available")     matSize <- dim(my.mat)[1]     eigenVec <- matrix(NA, nrow=matSize, ncol=matSize)     eigenVal <- rep(NA,
2010 Oct 30
1
R & VBA
Hi List, Is there any way to pass on directly VBA variable content into a R variable? on windows XP & using R 2.12.0 I have installed RExcel addin (with associated D(COM)) >> It function fine when trying to pass Excel Range to R but I failed (sorry if it is only my own limitation, search till now unsuccessful) to find out how to pass directly VBA array into R Below an example -
2011 Jul 25
0
Junior R and VBA Specialist ; Belgium Brussels
You will create new databases and reports in R and VBA. You will also update and /or improve existing reports in R and VBA. Required: * Good knowledge of R is essential, mainly in the field of database mgt. Knowledge of statistics is not necessarily required. * Knowledge of VBA * You are a dynamic teamplayer who works efficiently and in a structured way Offer: Competitive reward Contract type to
2008 Jun 08
0
Office 97: VBA editor flashes onto screen, then disappears
Running Debian Etch with msttcorefonts installed, and Wine 0.9.58 Office 97 (Excel, Word, Powerpoint only, not Outlook etc) installed fine using Winecfg 'out of the box', setting default environment to Windows 98. Office 97 includes VBA, which can be started from Word's or Excel's menu: 'Tools, Macros, Visual basic Editor'. (The VBA editor is normally 3 panes, two
2007 Jun 11
1
Starting R within an VBA makro
Hello everybody, at work I want to start R within an VBA program. First I calculate something in Excel 2003. After that I want to start within my VBA makro R wich should start an R file, say i.g, superplot.R which plots me the data well. So is it possible? Maybe something like that: sub test() 'calculate something start R superplot.R end test() Thank you so much. Kindly
2013 Aug 22
0
Usage of ETS R codes through RExcel macros in VBA
Issue: Usage of ETS R codes through RExcel macros in VBA Given below is my command code: Rinterface.runrcodefromrange Range(?Sheet1!B2:D8?) Following are the codes written in the given cell reference: #!rput zz 'Sheet1'!$B$2:$B$22 library(forecast) zz <- ts(zz,freq=365,start=c(2009,1)) etsz <- ets(zz,model='AAN') etszP <- forecast(etsz,h=34) write.table(etszP) How
2013 Jul 12
0
Conexion excel vba con R y VBasic con R
Hola Eduardo. Lo que buscas lo puedes encontrar aquí.... http://www.statconn.com/products.html#RExcel Un saludo, _____________________________ Miguel Ángel Rodríguez Muíños Dirección Xeral de Innovación e Xestión da Saúde Pública Consellería de Sanidade Xunta de Galicia http://dxsp.sergas.es -----Mensaje original----- De: r-help-es-bounces en r-project.org [mailto:r-help-es-bounces en
2012 Apr 28
2
Equivalent of Nothing (in VBA) or [] in Matlab in R
Hi, I am very new to R so please excuse me if I am asking very obvious questions. I am trying to call a blackbox api function implemented in as a COM object from R. The function definition says that 1. if calling from VBA, the first parameter should be set to "Nothing" 2. if calling from matlab, the first parameter should be set to [] What should be the equivalent for above in R?.
2013 Jul 12
1
Conexion excel vba con R y VBasic con R
Muchas gracias, Sergio. Saludos cordiales. Eduardo Freyre -----Mensaje original----- De: miguel.angel.rodriguez.muinos en sergas.es [mailto:miguel.angel.rodriguez.muinos en sergas.es] Enviado el: viernes, 12 de julio de 2013 12:39 Para: efreyre en movistar.es; r-help-es en r-project.org Asunto: RE: [R-es] Conexion excel vba con R y VBasic con R Hola Eduardo. Lo que buscas lo puedes
2007 Mar 19
4
running VBA code/macros within Linux
Hi, . I know you can run Windows applications using WINE (winehq.com), but has anyone tried, say, running Word or Excel VBA code/macros based on Windows run time libraries? . the thing is that in their faq (http://www.winehq.com/site/docs/wine-faq/index) they don't even mention this possibility and searching on; VBA Word, doesn't give you any hits, even though WINE does link to windows
2007 Jul 16
2
can I run/launch an excel VBA macro from wihin R?
Is there an "easy" or good way to run/launch an Excel VBA macro from within R? --------------------------------- Pinpoint customers who are looking for what you sell. [[alternative HTML version deleted]]
2011 Oct 18
1
how to invoke vba by r?
dear listers, right now, we are trying to use r to implement sas dde function, e.g. interact with excel. however, we can't find a way to call vba from r? any insight is appreciated. [[alternative HTML version deleted]]
2003 May 09
0
VBA function InStrRev in RCOM
Dear all, I am trying to use R within Excel 97. Seems the VBA with Excel 97 does not recognize function "InStrRev" (it gives error message when I try to launch RExcel Help, just the same as that it doesn't recognize function "Replace"). A solution for frunction Replace has been provided (Ritter, Christian ,
2009 Jun 15
2
[OT] VBA to save excel as csv
Hi all, This is a little off-topic, but it is on the general topic of getting data in R. I'm looking for a excel macro / vba script that will export all spreadsheets in a directory (with one file per tab) into csv. Does anyone have anything like this? Thanks, Hadley -- http://had.co.nz/
2013 Jul 12
2
Conexion excel vba con R y VBasic con R
Buenos días: ¿Hay alguna forma de conectar VBA de Excel con R, de forma que desde Excel se puedan cursar instrucciones de R?, ¿ y V.Basic con R? Gracias anticipadas. Saludos [[alternative HTML version deleted]]
2005 Feb 24
0
Error while opening a Excel VBA file in a Samba PDC client
Hi All, Server OS - SuSE Pro 9.0 Samba server version - samba3-3.0.9-1 (SuSE rpm) Client - Windows XP Pro SP 2 Office XP SP 2 I have everything working well like machines joining domain, users logging in, roaming profiles etc. But when a user of the Samba domain tries to open a Excel VBA document, the following error occurs. "Error accessing the system registry" Please note that the
2003 Feb 14
5
Translating lm.object to SQL, C, etc function
This is my first post to this list so I suppose a quick intro is in order. I've been using SPLUS 2000 and R1.6.2 for just a couple of days, and love S already. I'm reading MASS and also John Fox's book - both have been very useful. My background in stat software was mainly SPSS (which I've never much liked - thanks heavens I've found S!), and Perl is my tool of choice for
2006 Aug 22
1
summary(lm ... conrasts=...)
Hi Folks, I've encountered something I hadn't been consciously aware of previously, and I'm wondering what the explanation might be. In (on another list) using R to demonstrate the difference between different contrasts in 'lm' I set up an example where Y is sampled from three different normal distributions according to the levels ("A","B","C")
2005 Feb 27
2
Error while opening Excel VBA macros in Samba PDC windows clients
Hi All, Server OS - SuSE Pro 9.0 Samba server version - samba3-3.0.9-1 (SuSE rpm) Client - Windows XP Pro SP 2 Office XP SP 2 I have everything working well such as machines joining domain, users logging in, roaming profiles etc. But when a user of the Samba domain tries to open a Excel VBA document, the following error occurs. "Error accessing the system registry" Please note that
2001 Jun 15
1
contrasts in lm and lme
I am using RW 1.2.3. on an IBM PC 300GL. Using the data bp.dat which accompanies Helen Brown and Robin Prescott 1999 Applied Mixed Models in Medicine. Statistics in Practice. John Wiley & Sons, Inc., New York, NY, USA which is also found at www.med.ed.ac.uk/phs/mixed. The data file was opened and initialized with > dat <- read.table("bp.dat") >