search for: ymat

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

Did you mean: mat
2013 Jan 23
1
Evaluating the significance of the random effects in GLMM
Hi all! I am working with GLMM using the binomial family I use the following codes I dropped no significant terms, refitting the model and comparing the changes with likelihood: G.1<-lmer(data$Ymat~stu+spi+stu*sp1+(1|ber),data=data,family="binomial") G.1b<-lmer(data$Ymat~stu+spi+(1|ber),data=data,family="binomial") anova (G.1,G.2) But, when I want to evaluate the significance of random effect (1|ber) I cannot use a likelihood-ratio test, probably because the link fun...
2012 Feb 10
1
stepwise variable selection with multiple dependent variables
...o produce a set of candidate models. However, when I pass the fitted lm object to step() I get the following error: Error from R: Error in drop1.mlm(fit, scope$drop, scale = scale, trace = trace, k = k, : no 'drop1' method for "mlm" models My dependent data is in the matrix ymat where ymat is 35 rows by 3 columns. The predictors are in X where X is 35 by 6 The steps I used were: m.fit <- lm(ymat ~ ., data=X) m.step <- step(m.fit) If variable selection is not possible with step() is there another package that will perform variable selection in a multivariate settin...
2007 Aug 02
1
simulate() and glm fits
...hat does what I would expect (note that my binomial works for only binary response glms): simulate.glm.hack <- function(fit, nsim=1, seed=NULL) { if (!is.null(seed)) set.seed(seed) n <- length(fitted(fit)) theta <- model.matrix(fit$terms, data=fit$data) %*% coef(fit) ymat <- matrix(NA, nrow=n, ncol=nsim) for (s in 1:nsim) { if ("poisson"==fit$family$family) { ymat[,s] <- rpois(n, fit$family$linkinv(theta)) } else if ("binomial"==fit$family$family) { ymat[,s] &l...
2006 Nov 22
1
Probit analysis
Respected Sir/Madam, I have a question regarding calculation of LD50 (Lethal Dose) and IC50 (50% inhibitory concentration) of an antimicrobial experiment. I have used a compound isolated from a plant and observed its effect on the fungus *Fusarium oxysporum* by the food poisoning method. Solutions of the compound at concentrations of 0, 50, 100, 150, 200 and 250µg/ ml were added to
2009 Jun 17
0
nls with weights
...- bottom) / (1 + 10^((logec50-x)*slope)) } xData <- seq(-10,10,1.2) yData1 <- sigmoid(xData,10,1,-0.2,3) + rnorm(1:length(xData), sd = 0.5) yData2 <- sigmoid(xData,10,1,-0.2,3) + rnorm(1:length(xData), sd = 0.2) yData3 <- sigmoid(xData,10,1,-0.2,3) + rnorm(1:length(xData), sd = 1.1) yMat <- rbind(yData1, yData2, yData3) yData <- apply(yMat, 2, mean) yDataSd <- apply(yMat, 2, sd) plot(yData ~ xData, ylim = c(min(yData - yDataSd), max(yData + yDataSd))) arrows(xData, yData - yDataSd, xData, yData + yDataSd, angle = 90, length = 0.1, code = 3) # without weights model <...
2005 Oct 27
0
where is Jim Lemon? (PR#8259)
...gins text "Introduction to Modern Nonparametric Statistics". Regards, Rob Kushler k <- 3 b <- 6 prob47 <- data.frame(day=factor(rep(1:k,each=b)),blk=factor(rep(1:b,k)), dryhay <- c(1.5,2.1,1.9,2.8,1.4,1.8,1.8,2.0,2.0,2.7,1.6,2.3,1.9,2.5,2.5,2.6,2.1,2.4)) attach(prob47) (ymat <- matrix(dryhay,nrow=b,ncol=k)) library(concord) page.trend.test(ymat) muL <- b*k*(k+1)2/4 varL <- b*(k2)*(k+1)*(k2 -1)/144 (zL <- (79 - muL)/sqrt(varL)) pnorm(zL,lower=F)
2008 May 28
1
calling C function from R
...the rpart.c function? If so, what was sent to rpfit? I am confused because rpart.c only returns an integer, not an object. The following is the rpart.c function: int rpart(int n,&nbsp; int nvarx, Sint *ncat, int method,&nbsp; int&nbsp; maxpri,&nbsp; double *parms,&nbsp; double *ymat,&nbsp; FLOAT *xmat, Sint *missmat, struct cptable *cptable, struct node **tree,&nbsp;&nbsp;&nbsp;&nbsp;&nbsp;&nbsp;&nbsp;&nbsp;&nbsp;&nbsp;&nbsp; char **error,&nbsp;&nbsp; int *which, int xvals,&nbsp;&nbsp;&nbsp;&nbsp; Sint *x_...
2009 Jan 08
1
cosinor analysis
Hallo, I didn´t found any facilities for Halbergs cosinor analysis in R. This analysis is well known in the Chronobiology as the least square approximation of time series using cosine function of known period (in my case of 24hours-period). I tried to write a script but crashed... Can you give me some advices, please!? Thanks Anne Berger Institute of Zoo- and Wildlife Research, Berlin, Germany
2002 Jul 03
0
poly.transform in R
...'m doing polynomial regression of percentage of one insect in a community on altitude, precipitations, evapotranspiration, max and min temperatures using glm. I would like to get the standard coordinates of my polynom in order to draw maps, get the maximum values, etc... Call: glm(formula = Ymat ~ poly(Alt, 2) + poly(Pmm, 2) + poly(E0, 2) + poly(Min, 2) + poly(Max, 2), family = binomial, data = tableau) Deviance Residuals: Min 1Q Median 3Q Max -15.5168 -0.1223 0.1085 3.5095 14.0412 Coefficients: Estimate Std. Error z value Pr(>|...
2011 Apr 20
2
Random Relabelling
I have 4000 observations that I need to randomly relabel 1000 times and then calculate the mean of the 1000 values at each of the 4000 points. Any ideas for where to begin? Thanks Kevin -- View this message in context: http://r.789695.n4.nabble.com/Random-Relabelling-tp3463100p3463100.html Sent from the R help mailing list archive at Nabble.com.
2004 Aug 23
0
corrections for R-intro.texi (PR#7192)
...ing ====================================================================== [-default-] {+default,+} ====================================================================== --- R-intro.texi~ Mon Aug 23 13:23:57 2004 +++ R-intro.texi Mon Aug 23 13:23:57 2004 @@ -4864,7 +4864,7 @@ > fml <- glm(Ymat ~ x, family = binomial, data = kalythos) @end example -Since the logit link is the default the parameter may be omitted on the +Since the logit link is the default, the parameter may be omitted on the second call. To see the results of each fit we could use @example =======================...