search for: rsd

Displaying 20 results from an estimated 42 matches for "rsd".

Did you mean: bsd
2012 Jun 21
2
check.k function in mgcv packages
...d).... ## check for residual pattern, removeable by increasing `k' ## typically `k', below, chould be substantially larger than ## the original, `k' but certainly less than n/2. ## Note use of cheap "cs" shrinkage smoothers, and gamma=1.4 ## to reduce chance of overfitting... rsd <- residuals(b) gam(rsd~s(x0,k=40,bs="cs"),gamma=1.4,data=dat) ## fine gam(rsd~s(x1,k=40,bs="cs"),gamma=1.4,data=dat) ## fine /gam(rsd~s(x2,k=40,bs="cs"),gamma=1.4,data=dat) ## `k' too low/ gam(rsd~s(x3,k=40,bs="cs"),gamma=1.4,data=dat) ## fine why th...
2013 Mar 22
0
predict.Arima error "'xreg' and 'newxreg' have different numbers of columns"
...error message as 'xreg' and 'newxreg' have different numbers of columns". So I debug into predict.Arima (as shown in (*)). (*): debugging in: predict.Arima(fit, newxreg = indep, n.ahead = 1) debug: { myNCOL <- function(x) if (is.null(x)) 0 else NCOL(x) rsd <- object$residuals xr <- object$call$xreg xreg <- if (!is.null(xr)) eval.parent(xr) else NULL ncxreg <- myNCOL(xreg) if (myNCOL(newxreg) != ncxreg) stop("'xreg' and 'newxreg' have different numbers of columns") class(xre...
2009 Feb 17
0
What's the predict procedure of ARIMA in R?
...t I can't read it. Can anybody explain it to me? Thanks! saji from Shanghai the code: > getS3method("predict","Arima") function (object, n.ahead = 1, newxreg = NULL, se.fit = TRUE, ...) { myNCOL <- function(x) if (is.null(x)) 0 else NCOL(x) rsd <- object$residuals xr <- object$call$xreg xreg <- if (!is.null(xr)) eval.parent(xr) else NULL ncxreg <- myNCOL(xreg) if (myNCOL(newxreg) != ncxreg) stop("'xreg' and 'newxreg' have different numbers of columns") class(x...
2012 May 11
1
ANOVA question
...r level for (i in 1:length(MEAN)) { df$Value[(1+N*(i-1)):(N*i)] <- rnorm(N, MEAN[i], sqrt(VAR[i])) } par(mfrow=c(2,2)) plot(df) # Box plot of the data plot(df$Value) # scatter plot mod_aov <- aov(Value ~ Label, data=df) print(summary(mod_aov)) print(mod_aov$coefficients) rsd <- mod_aov$residuals plot(rsd) # find and print mean() and var() for each level for (l in levels(df$Label)) { index <- df$Label == l # Method 1: directly from data smp <- df$Value[index] # extract sample for this label ssq_smp <- var(smp)*(length(smp)-1) # sum of sq...
2010 Mar 31
1
predict.Arima: warnings from xreg magic
...same environment that I did the fit, so the data object used in the fit is no longer present. Looking at the predict.Arima source, predict.Arima <- function (object, n.ahead = 1, newxreg = NULL, se.fit = TRUE, ...) { myNCOL <- function(x) if (is.null(x)) 0 else NCOL(x) rsd <- object$residuals xr <- object$call$xreg xreg <- if (!is.null(xr)) eval.parent(xr) else NULL ncxreg <- myNCOL(xreg) if (myNCOL(newxreg) != ncxreg) stop("'xreg' and 'newxreg' have different numbers of columns") class(xre...
1999 Sep 21
1
regressions (simple question)
I have a list of measurements taken at 1 second samples in a vector (y). All I want to do is generate a regression through them, and obtain the residuals in another vector. I am currently using the 'line' function from the eda package to do this (ie : z <- line(time,y) rsd <- residuals(z) ) but this method does not handle NA values in the data. I would like to try to use the lm functions but cannot figure out how to do this simple regression with it (how do I set up the model parameter etc). Also can anyone let me know how the ts package handles NA values. Mic...
2010 Mar 29
1
stuck with affy / limma
...oData = pd, verbose = TRUE) #### normalize x <- expresso(a, bg.correct = FALSE, normalize.method = "vsn", normalize.param = list(subsample = 1000), pmcorrect.method = "pmonly", summary.method = "medianpolish") ### genes with highest variation library(hgu133plus2.db) rsd <- apply(exprs(x), 1, sd) sel <- order(rsd, decreasing = TRUE)[1:250] u<-mget(row.names(exprs(x)[sel,]),hgu133plus2SYMBOL) heatmap(exprs(x)[sel, ], labRow=u) ### in this case it works to extract the gene symbol ### limma contrasts design <- model.matrix(~ -1+factor(c(1,1,1,2,2,2,3,3...
2005 Nov 13
4
Robust Non-linear Regression
...izing the squared residus SUM (Y-Yhat)^2, the objective function is now SUM log(1+(Y-Yhat)^2/ RobustSD) where RobustSD is the 68th percentile of the absolute value of the residues my question is: is there a smart and elegant way to change to objective function from squared Distance to log(1+D^2/Rsd^2) ? or alternatively to write this as a weighted non-linear regression where the weights are recalculated during the iterations in nlme it is possible to specify weights, possibly that is the way to do it, but I didn't manage to get it working the weights should then be something like: SUM...
2019 Jul 08
1
Windows XP and 1.1pre17
Hello, 1.1pre17 does not support Windows XP.  The reason is that InitOnceExecuteOnce is not supported. I believe it is better to take the Windows XP name out of the download link. -rsd -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://www.tinc-vpn.org/pipermail/tinc/attachments/20190708/b68071ed/attachment.html> -------------- next part -------------- A non-text attachment was scrubbed... Name: signature.asc Type: application/pgp-sign...
2009 Apr 01
1
Fwd: 'for Loop'
Hello, A nice guy call Jun Shen was helping me out with this, but I require a bit more help. Below is my data set or list called 'test'. I'm trying to calculate the %RSD for each pair of index and keep it in cronological order if you can imagine a 3rd column with 'date' beside index. Result Index 1 0.2901 17 2 0.2928 17 3 0.2913 18 4 0.2893 18 5 0.3526 9 6 0.3316 9 7 0.3492 10 8 0.3467 10 9 0.3385 11 10...
2001 Apr 30
0
hostname as static link
...sage(); ! else ! host = av[0]; ! } SSLeay_add_all_algorithms(); ERR_load_crypto_strings(); -- T. Joseph W. Lazio, Ph.D. voice: +1 202 404 6329 Remote Sensing Division fax: +1 202 404 8894 Naval Research Lab, Code 7213 lazio at rsd.nrl.navy.mil Washington, DC 20375-5351 USA http://rsd-www.nrl.navy.mil/7213/lazio/
2017 Jul 26
2
How to block tinc node advertise it's neighbor/edge/subnet info to another node?
Hi, Tinc experts There’s a requirement, where A connect to B, B connect to C; where B knows all the subnets from A and C, but A wouldn’t need to know anything about C, and C wouldn’t need to know anything about A. Any tinc configuration can make this happen? You can think of B is not an interconnect/forwarding node, instead, it only connect to A and C separately. I can think of run two tinc
2005 Jan 19
1
Should NEVER happen; please bug.report() [mkCLOSXP] (PR#7535)
I'm probably not using the function right, but anyway, the program said: "please bug.report." > w_R.f1=function(PR,Pc) return (Pc*PR^3) > > w_R.f2=function(PR,Pc) return (Pc*PR) > > w_R.fc=c(w_R.f1,w_R.f2) > w_R.fc[2] [[1]] function(PR,Pc) return (Pc*PR) > > RSD(type=3, + gparP=gpar(col="red"), + gparD=gpar(fill=FALSE,col=FALSE), + gparL=gpar(col="red",lwd=2), + gparSL=gpar(col=grey(0.5),lwd=2), + gparS=gpar(fill=FALSE,col=FALSE), + gparSP=gpar(col=grey(0.7)), + w_R.f=w_R.fc[2] + ) Error in R2SDgraph(...) : couldn't find function &q...
2006 Nov 25
2
predict and arima
...he residuals (i've tried to insert a model$residuals<-rep(1,100) after the definition, to check that). Then i look at the code, with getS3method("predict","Arima"). And i get even more confused (!) : where does data play a role in the function ? residuals are loaded into rsd, but this variable is not used after... I looked at KalmanForecast and at the C code of KalmanFore, but it did not help me understand what was going on. thanks Franck A. btw, it has nothing to do with it, but i've done some stuff on time series (filtering with Hodrick prescott or Baxter King...
2007 Jul 25
2
proc:::exit not firing
I have a funny issue whereby when a application exits the proc:::exit probe doesn''t seem to be firing. A customer has written a dtrace script that outputs some info whenever proc:::exit fires but on occasion (random, no pattern in behaviour) dtrace exits without outputting the data. They are running dtrace via ''dtrace -s exit_trace.d -p <pid>'' Can anyone think
2014 Dec 28
2
Road for 1.1 (2.0) backward compatibility
Hi Guus, I know this comes up from time to time. So it is time to update our expectations. Is there a roadmap for a 1.1 backward compatibility already? -rsd -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://www.tinc-vpn.org/pipermail/tinc/attachments/20141228/fcb2b44a/attachment.html>
2016 May 18
0
Upgrade to 1.1pre14
...t once (like a local problem). The others varies the node from time to time. Is these expected or am I running into some kind of problem (network, config, tinc). I have being running this network for many years now with a mix of 1.0 and 1.1 without ExperimentalProtocol. thanks for your time -rsd
2017 Jul 26
0
How to block tinc node advertise it's neighbor/edge/subnet info to another node?
...lt;-----------> C 10.1.2.X/24 |  10.1.2.X/24              |  10.2.2.X/24  |  10.2.2.X/24 So each tinc daemon with a /16 is fine. No way for A <--> C, unless, A and C know about each other and add routes using B as gateway. So B explicitly needs to firewall this situation if necessary. -rsd
2017 Jul 26
1
How to block tinc node advertise it's neighbor/edge/subnet info to another node?
...gt; | 10.2.2.X/24 | 10.2.2.X/24 > > So each tinc daemon with a /16 is fine. > No way for A <--> C, unless, A and C know about each other and add > routes using B as gateway. > > So B explicitly needs to firewall this situation if necessary. > > > -rsd > > >
2018 Dec 19
0
1.11pre17 debian package correction
...nt dpkg: erro ao processar o pacote tinc (--install): sub-processo script post-installation instalado retornou estado de saída de erro 2 A processar 'triggers' para man-db (2.7.6.1-2) ... Erros foram encontrados durante o processamento de: tinc I believe a -p in mkdir might be missing. -rsd -------------- next part -------------- An HTML attachment was scrubbed... URL: <http://www.tinc-vpn.org/pipermail/tinc/attachments/20181219/1f2fdc97/attachment.html>