search for: yobs

Displaying 11 results from an estimated 11 matches for "yobs".

Did you mean: jobs
2012 Apr 24
1
Use of optim to fit two curves at the same time ?
...R ? Thanks Arnaud ###################################################################### ## function 1 x1 <- 1:100 y1 <- 5.468 * x + 3 # + rnorm(100,0, 10) dfxy <- cbind(x1,y1) # Objective function optfunc <- function(x, dfxy){ a <- x[1] b <- x[2] xtest <- dfxy[,1] yobs <- dfxy[,2] ysim <- a*xtest + b sum((ysim - yobs)^2) } out<- optim(par=c(0.2,5), fn=function(x){optfunc(x, dfxy)}, method = "Nelder-Mead", hessian = F) ## function 2 x2 <- seq(0.01, 0.1, length=100) y2 <- exp(30*x2) dfxy2 <- cbind(x2,y2) # objective function opt...
2011 Jul 19
2
loops and simulation
...> E[i]<- 1/( i+ sum(R[(m+1-i):m])) > i<-i+1 > } > > V<-W^E > > i<-1 > while (i<=m) { > > U[i]<- (1- prod( V[(m+1-i):m])) > i<-i+1 > } > > x<-( (1-U)^(-1/theta)-1 )/beta # simulation ends > > Yobs<-x > > em.lomax <- function(Y){ > r <- length(Yobs) > > ##initial value > > theta.t=theta > beta.t=beta > > # Define log-likelihood function > ll <- function(y, k, c){ > n*log(c*k)-(k+1)*( sum(log(1+c*Y))+sum( R*log(1+c*Y)+1/k ) ) > } > &gt...
2006 Aug 10
1
logistic discrimination: which chance performance??
Hello, I am using logistic discriminant analysis to check whether a known classification Yobs can be predicted by few continuous variables X. What I do is to predict class probabilities with multinom() in nnet(), obtaining a predicted classification Ypred and then compute the percentage P(obs) of objects classified the same in Yobs and Ypred. My problem now is to figure out whether P(ob...
2006 Jun 18
1
bug with boot.sw98 function (PR#8999)
...HE Submission from: (NULL) (84.9.38.207) I'm using the FEAR library to perform Data Envelopment analysis with a 36,000 obs dataset. The function dea is working fine but then when I try to use the boot.sw98 to come up with some sensitivity analysis I get the following error: boot.sw98(XOBS=x,YOBS=y,NREP=100,DHAT=dhat,RTS=3,ORIENTATION=2) Error in 0:L : NA/NaN argument In addition: Warning message: longer object length is not a multiple of shorter object length in: kappam * Gcounts What does this mean? Is this because I have too many observations? What can I do to fix it? Please le...
2004 Jul 21
1
function ms
Dear R users, I am using the MICE package. Specifically, at some point in my code I have imp2=mice(PoptotalMICE,imputationMethod="logreg2") And R returns... iter imp variable 1 1 MICEYError in logitreg(xobs, yobs, intercept=F) : couldn't find function "ms" I have been looking for this ms function on the web, hoping it was just a matter of downloading a package. I didn't find anything. I have tried getAnywhere without success. What can it be? Where is the function ms? Thanks [...
2007 Nov 15
3
kalman filter estimation
...m. for (i in 2:N){ xp[[i]]=C%*%xf[[i-1]] Pp[[i]]=C%*%Pf[[i-1]]%*%t(C)+Q siginv=A[[i]]%*%Pp[[i]]%*%t(A[[i]])+R sig[[i]]=(t(siginv)+siginv)/2 # make sure sig is symmetric siginv=solve(sig[[i]]) # now siginv is sig[[i]]^{-1} K=Pp[[i]]%*%t(A[[i]])%*%siginv innov[[i]]=as.matrix(yobs[i,])-A[[i]]%*%xp[[i]] xf[[i]]=xp[[i]]+K%*%innov[[i]] Pf[[i]]=Pp[[i]]-K%*%A[[i]]%*%Pp[[i]] like= like + log(det(sig[[i]])) + t(innov[[i]])%*%siginv%*%innov[[i]] } like=0.5*like list(xp=xp,Pp=Pp,xf=xf,Pf=Pf,like=like,innov=innov,sig=sig,Kn=K) } I tried to fit my problem and observe that I...
2008 Jun 09
1
Cross-validation in R
...I get mean of perr1 of 0.2336 and SD of 0.000139. When using a home-made cross validation, code below, I get mean of perr2 of 0.2338 and SD of 0.02184. The means are similar but SD are different. Questions are: (1) how the $delta is computed in the cv.glm? In the home-made version, I simply use ((Yobs - Ypred)^2)/n. The equation might be correct because the mean is similar. (2) in the cv.glm, I have the impression the system is using glm0.dmi that was generated using all the data points whereas in my homemade version I only use the "test" database. I am confused if the cv.glm generate...
2004 Feb 03
1
starcraft problem
Hi all, i have just finished my installation of wine as normal user (see below). Notepad is running fine, so i decided to run something more fun, starcraft. The installation program works, even with sound and all, exept when i decide to run the previews. The previews run rine, but whithout sound. When i return to the installation program the sound is gone. But anyway, it does it's yob,
2010 Mar 29
18
please decrypt your manuals
I. most of ssh manual and all sshd manual present server and client as one machine, called host. All files mentioned are placed on one machine. This is incorrect, and makes the explanation unclear. For example, man sshd SSH_KNOWN_HOSTS FILE FORMAT suggests to copy keys from /etc/ssh/ssh_host_key.pub into /etc/ssh/ssh_known_hosts, as if those files are on the same machine. II. a general
2012 Mar 25
2
avoiding for loops
I have data that looks like this: > df1 group id 1 red A 2 red B 3 red C 4 blue D 5 blue E 6 blue F I want a list of the groups containing vectors with the ids. I am avoiding subset(), as it is only recommended for interactive use. Here's what I have so far: df1 <- data.frame(group=c("red", "red", "red", "blue",
2008 Aug 09
2
xy plot in version 2.7.1 for Mac (PR#12520)
--Apple-Mail-30--530209534 Content-Type: text/plain; charset=US-ASCII; format=flowed; delsp=yes Content-Transfer-Encoding: 7bit I recently reformatted my hard disk on my MacBook Pro using a clean install of Leopard (had Leopard before too but not from a clean install). I had to reinstall R, and therefore installed the new version 2.7.1 for Mac. In preparing some graphs, I noticed