Displaying 20 results from an estimated 600 matches similar to: "logistic regression - unequal groups in R"
2006 Nov 15
3
using expects with (for Hash and Array)
First off, thanks for the great library.
Is there a way setup expects with this:
runtime_options[:property] = properties_option_string
or do i have to use:
runtime_options.store(:property, properties_option_string)
which results in this:
runtime_options.expects(:store).with(:property, ''prop1=1'')
Thanks for your help.
jeremy
2018 Mar 22
1
Calculate weighted proportions for several factors at once
Hi,
I have a grouped data set and would like to calculate weighted proportions for a large number of factor variables within each group member. Rather than using dplyr::count() on each of these factors individually, the idea would be to do it for all factors at once. Does anyone know how this would work? Here is a reproducible example:
############################################################
2011 Sep 06
1
Question about Natural Splines (ns function)
Hi - How can I 'manually' reproduce the results in 'pred1' below? My attempt
is pred_manual, but is not correct. Any help is much appreciated.
library(splines)
set.seed(12345)
y <- rgamma(1000, shape =0.5)
age <- rnorm(1000, 45, 10)
glm1 <- glm(y ~ ns(age, 4), family=Gamma(link=log))
dd <- data.frame(age = 16:80)
mm <- model.matrix( ~ ns(dd$age, 4))
pred1 <-
2008 Nov 19
1
F-Tests in generalized linear mixed models (GLMM)
Hi!
I would like to perform an F-Test over more than one variable within a
generalized mixed model with Gamma-distribution
and log-link function. For this purpose, I use the package mgcv.
Similar tests may be done using the function "anova", as for example in
the case of a normal
distributed response. However, if I do so, the error message
"error in eval(expr, envir, enclos) :
2012 Jun 08
2
Consulta GLM
Estimados amigos,
Estoy familiarizándome con los modelos lineales generalizados en R. Estoy
interesado en realizar un análisis lig linear y me gustaría saber cuáles
son o como extraer los valores correspondientes al chi cuadrado en el
análisis para cada grupo y para las interacciones. Desde ya muchas gracias
y disculpas si la pregunta es muy básica, adjunto los comandos que estoy
utilizando. Si
2012 Jun 08
2
Consulta sobre GLM-log linear
Estimados amigos,
Estoy familiarizándome con los modelos lineales generalizados en R. Estoy
interesado en realizar un análisis lig linear y me gustaría saber cuáles
son o como extraer los valores correspondientes al chi cuadrado en el
análisis para cada grupo y para las interacciones. Desde ya muchas gracias
y disculpas si la pregunta es muy básica, adjunto los comandos que estoy
utilizando. Si
2012 Jun 08
2
Consulta sobre GLM-log linear
Estimados amigos,
Estoy familiarizándome con los modelos lineales generalizados en R. Estoy
interesado en realizar un análisis lig linear y me gustaría saber cuáles
son o como extraer los valores correspondientes al chi cuadrado en el
análisis para cada grupo y para las interacciones. Desde ya muchas gracias
y disculpas si la pregunta es muy básica, adjunto los comandos que estoy
utilizando. Si
2008 May 08
2
poisson regression with robust error variance ('eyestudy
Ted Harding said:
> I can get the estimated RRs from
> RRs <- exp(summary(GLM)$coef[,1])
> but do not see how to implement confidence intervals based
> on "robust error variances" using the output in GLM.
Thanks for the link to the data. Here's my best guess. If you use
the following approach, with the HC0 type of robust standard errors in
the
2010 Aug 20
3
Deviance Residuals
Dear all,
I am running a logistic regression and this is the output:
glm(formula = educationUniv ~ brncntr, family = binomial)
Deviance Residuals:
Min 1Q Median 3Q Max # ???? ????? ?? ????????
-0.8825 -0.7684 -0.7684 1.5044 1.6516
Coefficients:
Estimate Std. Error z value Pr(>|z|)
(Intercept) -1.06869 0.01155 -92.487 <2e-16 ***
brncntrNo
2004 Aug 19
1
The 'test.terms' argument in 'regTermTest' in package 'survey'
This is a question regarding the 'regTermTest' function in the 'survey' package. Imagine Z as a three level factor variable, and code ZB and ZC as the two corresponding dummy variables. X is a continuous variable. In a 'glm' of Y on Z and X, say, how do the two test specifications
test.terms = c("ZB:X","ZC:X") # and
test.terms = ~ ZB:X + ZC:X
in
2006 Jul 13
1
step method in glm()
Hello,
I estimaded two logit models via glm(). A null model (called glm00) and
"full" model with all accessible covariates and interactions between them
(glm1).
Then I tried to get even better model by step procedure. I tried the
following code:
> step(glm00, scope=formula(glm1), method="both")
and another one:
> step(glm00, scope=formula(glm1),
2012 Jul 15
1
how to extract p-value in GenMatch function
Dear R-Users,
I have a problem on extracting T-Stat and P-Value. I have written R-code below
library("Matching")
data("lalonde")
attach(lalonde)
names(lalonde)
Y <- lalonde$re78
Tr <- lalonde$treat
glm1 <- glm(Tr~age+educ+black+hisp+married+nodegr+re74+re75,family=binomial,data=lalonde)
pscore.predicted <- predict(glm1)
rr1 <-
2001 Nov 16
2
pearson residuals in glm for binomial response (PR#1175)
R version 1.3.0
OS: SunOS 5.7, but I think the same problem occurs with Windows
An incorrect formula seems to be used to calculate the pearson residuals
for a generalized linear model with a binomial response. Here is a
simple program which gives (a) the pearson residuals calculated directly,
(b) the pearson residuals from glm, and (c) the deviance residuals from
glm. The first and last
2010 Jan 24
2
How to define degree=1 in mgcv
Hi, all
I have a question on mgcv and ns. Now I want to compare the results from
glm, gam and ns. Take a simple model y~x for example.
glm1 = glm(y~x, data=data1)
gam1 = gam(y~s(x), data=data1)
ns1 = glm(y~ns(x),data=data1)
In order to confirm the result from glm1 is consistent to those from gam1
and ns1, I want to define degree=1 in mgcv and ns. I am wondering if there
is somebody can give me
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]]
2007 Feb 14
1
how to report logistic regression results
Dear all,
I am comparing logistic regression models to evaluate if one predictor
explains additional variance that is not yet explained by another predictor.
As far as I understand Baron and Li describe how to do this, but my question
is now: how do I report this in an article? Can anyone recommend a
particular article that shows a concrete example of how the results from te
following simple
2008 Feb 19
1
Referencing to an object within a function
I am encountering an error when I attempt to reference a glm model
within a function. The function uses the segmented.glm command
(package = segmented). Within the segmented.glm command one specifies
an object, in this case a logistic regression model, and specifies a
starting threshold term (psi). I believe this is an environment
problem, but I do not have a solution. Any assistance
2010 Jun 03
1
compare results of glms
dear list!
i have run several glm analysises to estimate a mean rate of dung decay
for independent trials. i would like to compare these results
statistically but can't find any solution. the glm calls are:
dung.glm1<-glm(STATE~DAYS, data=o_cov, family="binomial(link="logit"))
dung.glm2<-glm(STATE~DAYS, data=o_cov_T12, family="binomial(link="logit"))
as
2009 Sep 08
1
makefile for sweave
Hello, I have the following makefile. The problem is that the bibliography
doesn t work. Any help would be appreciated! I really don t don t what to
do..:-(
# The sources of the report (tex, Rnw and other files (e.g. bib, idx))
TEX_CMPS = Report problem
RNW_CMPS = prop1 prop2 ExeExps
OTHER = Report.bib
# The name of the report to produce
all: Report.pdf
code: $(RNW_CMPS:=.R)
clean:
rm
2004 May 07
1
contrasts in a type III anova
Hello,
I use a type III anova ("car" package) to analyse an unbalanced data design. I
have two factors and I would have the effect of the interaction. I read that
the result could be strongly influenced by the contrasts. I am really not an
expert and I am not sure to understand indeed about what it is...
Consequently, I failed to properly used the fit.contrast function (gregmisc