search for: etas

Displaying 20 results from an estimated 755 matches for "etas".

Did you mean: eta
2012 Sep 11
1
Strange result from GAMLSS
Hi Folks! Just started using the gamlss package and I tried a simple code example (see below). Why the negative sigma? John > y <- rt(100, df=1)> m1<-fitDist(y, type="realline")Warning messages:1: In MLE(ll3, start = list(eta.mu = eta.mu, eta.sigma = eta.sigma, : possible convergence problem: optim gave code=1 false convergence (8)2: In MLE(ll4, start = list(eta.mu =
2005 Apr 14
0
predict.glm(..., type="response") dropping names (and a propsed (PR#7792)
Here's a patch that should make predict.glm(..., type="response") retain the names. The change passes make check on our Opteron running SLES9. One simple test is: names(predict(glm(y ~ x, family=binomial, data=data.frame(y=c(1, 0, 1, 0), x=c(1, 1, 0, 0))), newdata=data.frame(x=c(0, 0.5, 1)), type="response")) which gives [1]
2011 Sep 23
4
'save' saved object names instead of objects
Hello, I created an array to hold the results of a series of simulations I'm running: d.eta <- array(0,dim=c(3,3,200)) <simulation goes here and populates the array but it's not important> Then I tried to save the results using this: save(d.eta,file="D:/Simulation Results/sim 9-23-11 deta") When I later tried to reload them using this: d.eta <-
2008 Apr 03
1
help with R semantics
Greetings: I'm running R2.6.2 on a WinXP DELL box with 2 gig RAM. I have created a new glm link function to be used with family = binomial. The function works (although any suggested improvements would be welcome), logit.FC <- function(POD.floor = 0, POD.ceiling =1) { if (POD.floor < 0 | POD.floor > 1) stop ("POD.floor must be between zero and one.") if
2010 Aug 03
2
incorrect number of dimensions
Hi, How to solve this problem. The following is the code. betabinexch0=function(theta,data) + { + eta=theta[,1] + K=theta[,2] + y=data[,1]; n=data[,2] + N=length(y) + val=0*K; + for (i in 1:N) + val=val+lbeta(K*eta+y[i],K*(1-eta)+n[i]-y[i]) + val=val-N*lbeta(K*eta,K*(1-eta)) + val=val-2*log(1+K)-log(eta)-log(1-eta) + return(val) + } > data(cancermortality) >
2009 Jun 03
2
code for double sum
Hi R-users,   I wrote a code to evaluate double sum as follows:   ff2 <- function(bb,eta,z,k) { r <- length(z) for (i in 1:r) { sm1 <- sum((z[i]*bb/2)*(psigamma((0:k)+eta+1,deriv=0)/(factorial(0:k)*gamma((0:k)+eta+1))))  sm2 <- sum((besselI(z[i]*bb,eta)*log(z[i]*bb/2) - sm1)/besselI(z[i]*bb,eta))  sm2 } ff2(bb,eta,z,10)     but it gave me the following message:   >
2002 Feb 27
1
Bug in glm.fit? (PR#1331)
...As mentioned above, "coefold" may be initialised to NULL in line 58 if the parameter "start" is not specified. (Which typically would be the case?) But furthermore, in lines 44-53 the test for the parameter "start" is mangled into the test for the parameter "etastart". If "etastart" is not specified but a bad "start" (not the correct length), the bad "start" would be caught. But if a valid "etastart" is specified, then a bad "start" would not be caught since those tests are not executed. (Are there u...
2011 May 19
3
problem with optim()
Dear R-users, I would like to maximize the function g above which depends on 4 parameters (2 vectors, 1 real number, and 1 matrix) using optim() and BFGS method. Here is my code: # fonction to maximize g=function(x) { x1 = x[1:ncol(X)] x2 = x[(ncol(X)+1)] x3 = matrix(x[(ncol(X)+2):(ncol(X)+1+ncol(X)*ncol(Y))],nrow=ncol(X),ncol=ncol(Y)) x4 = x[(ncol(X)+1+ncol(X)*ncol(Y)+1):length(x)]
2011 Jun 23
0
Fwd: Re: Help with winbugs code
Hi folks, I'm forwarding this to the list as my email to nita was about getting her code to the list. Additionally, I'm running Linux and have no experience with WinBUGS. Jim -------- Original Message -------- Subject: Re: [R] Help with winbugs code Date: Thu, 23 Jun 2011 16:49:33 +0700 From: nita yalina <tayalin at gmail.com> To: Jim Lemon <jim at bitwrit.com.au>
2010 Mar 15
0
Partial Credit Models using eRm
Hello all, I have just started using fitting the PCM (Partial Credit Model) using eRm and have 2 problems which I cannot solve, I have checked everywhere on the net, but no joy: Firstly, I have fit a PCM model to 10 variables with differing response categories (3 for the first 6 items, 4 for the following 2 and 2 for the last two items). mat1 <- matrix(c(rasch_bart$bart_bowel,
2005 Jul 22
1
multiplicate 2 functions
Thks for your answer, here is an exemple of what i do with the errors in french... > tmp [1] 200 150 245 125 134 345 320 450 678 > beta18 Erreur : Objet "beta18" not found //NORMAL just to show it > eta [1] 500 > func1<-function(beta18) dweibull(tmp[1],beta18,eta) > func1<-func1(beta18) * function(beta18) dweibull(tmp[2],beta18,eta) Erreur dans dweibull(tmp[1],
2008 Jun 13
1
Writing a new link for a GLM.
Hi, I wish to write a new link function for a GLM. R's glm routine does not supply the "loglog" link. I modified the make.link function adding the code: }, loglog = { linkfun <- function(mu) -log(-log(mu)) linkinv <- function(eta) exp(-exp(-eta)) mu.eta <- function(eta) exp(-exp(-eta)-eta) valideta <- function(eta) all(eta != 0)
2008 Mar 15
1
again with polr
hello everybody solved the problem with summary, now I have another one eg I estimate > try.op <- polr( > as.ordered(sod.sit.ec.fam) ~ > log(y) + > log(1 + nfiglimin) + > log(1 + nfiglimagg) + > log(ncomp - nfiglitot) + > eta + > I(eta^2) + >
2007 Mar 07
1
Failure to run mcsamp() in package arm
Dear r-helpers, I can run the examples on the mcsamp help page. For example: **************************************** > M1 <- lmer (y1 ~ x + (1|group)) > (M1.sim <- mcsamp (M1)) fit using lmer, 3 chains, each with 1000 iterations (first 500 discarded) n.sims = 1500 iterations saved mean sd 2.5% 25% 50% 75% 97.5% Rhat n.eff beta.(Intercept)
2011 Aug 18
3
Error message: object of type 'closure' is not subsettable
Dear R-users I need to calibrate kappa, rho, eta, theta, v0 in the following code, see below. However when I run it, I get: y <- function(kappahat, rhohat, etahat, thetahat, v0hat) {sum(difference(k, t, S0, X, r, implvol, q, kappahat, rhohat, etahat, thetahat, v0hat)^2)} > nlminb(start=list(kappa, rho, eta, theta, v0), objective = y, lower =lb, > upper =ub) Error in dots[[1L]][[1L]] :
2006 Mar 01
1
a strange problem with integrate()
Dear all, I am stuck on the following problem with integrate(). I have been out of luck using RSiteSearch().. My function is g2<-function(b,theta,xi,yi,sigma2){ xi<-cbind(1,xi) eta<-drop(xi%*%theta) num<-exp((eta + rep(b,length(eta)))*yi) den<- 1 + exp(eta + rep(b,length(eta))) result=(num/den)*exp((-b^2)/sigma2)/sqrt(2*pi*sigma2)
2008 May 10
2
substitute in graphics - Uwe's help desk
Un texte encapsul? et encod? dans un jeu de caract?res inconnu a ?t? nettoy?... Nom : non disponible URL : <https://stat.ethz.ch/pipermail/r-help/attachments/20080510/28c07d4e/attachment.pl>
2006 Jul 30
1
Parametric links for glm?
At useR 2006 I mentioned that it would be nice to have a way to specify binomial links that involved free parameters and described some experience with a Gosset link involving a free degrees of freedom parameter, and a Tukey-lambda link with two free parameters. My implementation of this involved some rather kludgey modifications of binomial, make.link and glm that (essentially) added a
2006 Mar 08
1
Want to fit random intercept in logistic regression (testing lmer and glmmML)
Greetings. Here is sample code, with some comments. It shows how I can simulate data and estimate glm with binomial family when there is no individual level random error, but when I add random error into the linear predictor, I have a difficult time getting reasonable estimates of the model parameters or the variance component. There are no clusters here, just individual level responses, so
2012 Aug 10
0
error applying user-defined link function to lmer
Dear R users, I'm struggling with applying a user-defined link function in lmer. For analyzing data of a 2AFC psychophysical experiment, I would like to model my binary data with a logistic function with a lower limit at 0.5 instead of 0. In a previous question this has been described as a halflogit function. To do so I wrote my own link function and would like to submit it to lmer, however