Displaying 20 results from an estimated 1000 matches similar to: "ICC for Binary data"
2006 Jun 04
2
evaluation of the alternative expression in ifelse
Dear all,
I am trying to avoid the warnings produced by:
> x <- -2:2
> log(x)
[1] NaN NaN -Inf 0.0000000 0.6931472
Warning message:
production de NaN in: log(x)
I thought that using ifelse would be a solution, but it is not the case:
> ifelse(test = x < 0, yes = NaN, no = log(x))
[1] NaN NaN -Inf 0.0000000 0.6931472
Warning message:
production
2006 Aug 21
1
Fwd: Re: Finney's fiducial confidence intervals of LD50
thanks a lot Renaud.
but i was interested in Finney's fiducial confidence intervals of LD50 so to obtain comparable results with SPSS.
But your reply leads me to the next question: does anybody know what is the best method (asymptotic, bootstrap etc.) for calculating confidence intervals of LD50?
i could "get rid" of Finney's fiducial confidence intervals but
2006 Jul 08
2
String mathematical function to R-function
hello
I make a subroutine that give-me a (mathematical)
function in string format.
I would like transform this string into function ( R
function ).
thanks for any tips.
cleber
#e.g.
fun_String = "-100*x1 + 0*x2 + 100*x3"
fun <- function(x1,x2,x3){
return(
############
evaluation( fun_String )
############
)
True String mathematical function :-( :-(
> nomes
[1]
2005 Sep 29
5
Regression slope confidence interval
Hi list,
is there any direct way to obtain confidence intervals for the regression
slope from lm, predict.lm or the like?
(If not, is there any reason? This is also missing in some other statistics
softwares, and I thought this would be quite a standard application.)
I know that it's easy to implement but it's for
explanation to people who faint if they have to do their own
programming...
2006 Aug 27
1
refer to objects with sequential names
Dear Listers,
If I have several glm objects with names glm1, glm2.... and want to apply
new data to these objects. Instead of typing "predict(glm1, newdata)..." 100
times, is there way I could do so in a loop?
Thank you so much!
wensui
[[alternative HTML version deleted]]
2006 Jan 30
4
Logistic regression model selection with overdispersed/autocorrelated data
I am creating habitat selection models for caribou and other species with
data collected from GPS collars. In my current situation the radio-collars
recorded the locations of 30 caribou every 6 hours. I am then comparing
resources used at caribou locations to random locations using logistic
regression (standard habitat analysis).
The data is therefore highly autocorrelated and this causes Type
2005 Nov 13
4
voronoi
Is there any pure r code to do delaunay or voronoi diagrams?
Thanks!
---------------------------------
[[alternative HTML version deleted]]
2006 Nov 09
1
Extracting the full coefficient matrix from a gls summary?
Hi,
I am trying to extract the coefficients matrix from a gls summary.
Contrary to the lm function, the command fit$coefficients returns
only the estimates of the model, not the whole matrix including the
std errors, the t and the p values.
example:
ctl <- c(4.17,5.58,5.18,6.11,4.50,4.61,5.17,4.53,5.33,5.14)
trt <- c(4.81,4.17,4.41,3.59,5.87,3.83,6.03,4.89,4.32,4.69)
group <-
2006 Nov 06
1
question about function "gls" in library "nlme"
Hi:
The gls function I used in my code is the following
fm<-gls(y~x,correlation=corARMA(p=2) )
My question is how to extact the AR(2) parameters from "fm".
The object "fm" is the following. How can I extract the correlation parameters
Phi1 and Phi2 from "fm"? These two parametrs is not in the "coef" componenet of "fm".
Thanks a
2005 Dec 05
1
extracting p-values from lmer()
Dear R users,
I've been struggling with the following problem: I want to extract the Wald p-value
from an lmer() fit, i.e., consider
library(lme4)
n <- 120
x1 <- runif(n, -4, 4)
x2 <- sample(0:1, n, TRUE)
z <- rnorm(n)
id <- 1:n
N <- sample(20:200, n, TRUE)
y <- rbinom(n, N, plogis(0.1 + 0.2 * x1 - 0.5 * x2 + 1.5 * z))
m1 <- lmer(cbind(y, N - y) ~ x1 + x2 + (1 | id),
2006 Aug 21
2
Finney's fiducial confidence intervals of LD50
I am working with Probit regression (I cannot switch to logit) can anybody help me in finding out how to obtain with R Finney's fiducial confidence intervals for the levels of the predictor (Dose) needed to produce a proportion of 50% of responses(LD50, ED50 etc.)?
If the Pearson chi-square goodness-of-fit test is significant (by default), a heterogeneity factor should be used to calculate
2005 Sep 28
1
gee models summary
I'm running some GEE models but when I request the summary(pcb.gee) all
I get are rows and rows of intercorelations and they fill up the screen
buffer so I can not even scroll back to see what else might be in the
summary. How do I get the summary function to NOT print the
intercorrelations?
Thanks,
--
Dean Sonneborn
Programmer Analyst
Department of Public Health Sciences
University of
2005 Dec 09
1
Residuals from GLMMs in the lme4 package
Hello there
This is the first time I have used r-help message board so I hope I have got
the right address.
I am trying to check the residuals of a GLMM model(run using the package
lme4). I have been able to check the residiuals of REMLs in lme4 using the
following:
m1<-lmer(vTotal~Week+fCollar+ (1|fCat), collars)
res<-resid(m1)
plot(res)
qqnorm(res)
library(MASS)
par(mfrow=c(2,3))
2005 Oct 03
2
interpolation using akima (PR#8174)
Full_Name: Jonathan Lees
Version: 2.0.1
OS: linux-gnu
Submission from: (NULL) (152.2.75.65)
there is a problem with calculating the convex hull in 2-D interpolation using
the codes interp fromt eh akima package:
x =c(0.6505304, -1.1821562, -0.2600792, 0.7913716)
y = c(1.0424226, 0.1754048, -1.4523334, 0.2349112)
z = c(0.000, 3.042, 0.370, 0.122)
EX = seq(from=min(x), to=max(x),
2006 Apr 10
5
p values for a GEE model
Hi all,
I have a dataset in which the output Y is observed on two groups of
patients (treatment factor T with 2 levels).
Every subject in each group is observed three times (not time points but
just technical replication).
I am interested in estimating the treatment effect and take into account
the fact that I have repeated measurements for every subject.
If I do this with repeated measures
2010 Aug 03
2
How to extract ICC value from irr package?
Hi, all
There are 62 samples in my data and I tested 3 times for each one, then I
want to use ICC(intraclass correlation) from irr package to test the
consistency among the tests.
*combatexpdata_p[1:62] is the first text results and combatexpdata_p[63:124]
* is the second one and *combatexpdata_p[125:186]* is the third.
Here is the result:
2009 Sep 04
2
enabling core dumps
"Writing R Extensions" says
{quotes}
If you have a crash which gives a core dump you can use something like
gdb /path/to/R/bin/exec/R core.12345
to examine the core dump. If core dumps are disabled...
{unquotes}
sadly it doesn't go on to say how to enable if core dumps are disabled.
I understand that in bash I need to do
$ ulimit -c unlimited
but this doesn't seem to
2009 Feb 20
1
NOT an R problem: cannot install packages from distant repository
I met today a computer crash and our maintenance officer had to reinstall
some components of the OS (MS Windows XP Pro) as well as the Internet
browser (among other things). Now, I cannot install packages from a distant
repository:
> utils:::menuInstallPkgs()
Error in .readRDS(pfile) : unknown input format
> traceback()
5: .readRDS(pfile)
4: .packages(all.available = TRUE)
3:
2009 Mar 26
1
ICC question: Interrater and intrarater variability (intraclass correlation coefficients)
Hello dear R help group.
I encountered this old thread (http://tinyurl.com/dklgsk) containing the a
similar question to the one I have, but left without an answer.
I am and hoping one of you might help.
A simplified situation: I have a factorial design (with 2^3 experiment
combinations), for 167 subjects, each one has answered the same question
twice (out of a bunch of "types" of
2001 May 09
1
Coding categorical -> dummy
Dear R-Users,
I have a data frame with several categorical variables. I want to create a
new data frame with dummy variables (with all levels).
I know the function model.matrix (see below) but it works only for one
categorical variable :
> tt <- c("a","a","b","a","c")
> tt <- factor(tt)
> model.matrix(~ tt - 1)
is there anyone who