Displaying 20 results from an estimated 500 matches similar to: "Weighted Logistic Regressions using svyglm"
2010 Apr 28
2
Generating a model fitness when score using svyglm?
Does anyone know how to calculated a BIC score (or an equivalent model
fitness score) when using svyglm for logistic regressions?
Thanks
Brad
-- 
View this message in context: http://r.789695.n4.nabble.com/Generating-a-model-fitness-when-score-using-svyglm-tp2069280p2069280.html
Sent from the R help mailing list archive at Nabble.com.
2009 Apr 02
1
problem with svyglm()
Hello,
I'm trying to use the function svyglm in the library survey.
I create a data survey object:
data_svy<- svydesign(id=~PSU, strata=~sample_domain,  
weights=~sample_weight, data=data, nest=TRUE)
and I try to use svyglm() with little success:
R<-svyglm(data_svy[,4]~(data_svy[,iCol]==listModality[[iVar]] 
[iMod]),design=data_svy, family=binomial(link="logit")
Error in
2012 Aug 15
2
sensitivity and specificity in svyglm??
Hello,
 As obtained from a table svyglm clasificaion, sensitivity and specificity. The funtion ConfusionMatrix () of the library (caret)
gives these results but not how to apply it to svyglm. 
thanks
 		 	   		  
	[[alternative HTML version deleted]]
2012 Jul 24
3
stepwise in svyglm???
Hello,
 I want to know how to perform stepwise elimination of variables to svyglm
 thanks 		 	   		  
	[[alternative HTML version deleted]]
2008 Aug 06
1
Warning when using survey:::svyglm
Howdy,
Referencing the below exchange:
https://stat.ethz.ch/pipermail/r-help/2006-April/103862.html
I am still getting the same warning ("non-integer #successes in a
binomial glm!") when using svyglm:::survey.  Using the API data:
library(survey)
data(api)
#stratified sample
dstrat<-svydesign(id=~1,strata=~stype, weights=~pw, data=apistrat, fpc=~fpc)
2012 Aug 02
1
summary(svyglm) Pr (> | t |) ?
Hello
I want to know if the summary of the logistic model with survey
 Pr (> | t |) to test if the coefficient of the model is significant,
 ie is the p_valor wald test for the model coefficients,
 for I am interested to know if the three levels of the variable educational level are significant to the model (significance of handling 0.2), 
I present below the results of my model
2008 Dec 19
1
svyglm and sandwich estimator of variance
Hi, 
I would like to estimate coefficients using poisson regression and then get 
standard errors that are adjusted for heteroskedasticity, using a complex 
sample survey data. Then I will calculate prevalence ratio and confidence 
intervals.
Can sandwich estimator of variance be used when observations aren?t 
independent? In my case, observations are independent across groups 
(clusters), but
2012 Nov 23
1
problem with svyglm
I have this problem.
test <- svydesign(id=~1,weights=~peso)
logit <- svyglm(bach ~ job2 + mujer + egp4 + programa + delay + mdeo + str
+ evprivate, family=binomial,design=test)
then appear:
Error in svyglm.survey.design(bach ~ job2 + mujer + egp4 + programa +  :
  all variables must be in design= argument
I don't know what this mean...
Please help.
Pablo.
	[[alternative HTML
2017 Jul 05
2
Svyglm Error
Greetings,
I am revisiting code from several different files I have saved from the past and all used to run flawlessly; now when I run any of the svyglm related functions, I am coming up with an error:
Error in model.frame.default(formula = F3ATTAINB ~ F1PARED, data = data,  :
  the ... list does not contain 4 elements
The following is a minimal reproducible example:
library(RCurl)
2017 Jul 05
0
Svyglm Error
hi, i am not hitting an error when i copy and paste your code into a fresh
console.  maybe compare your sessionInfo() to mine?
    > sessionInfo()
    R version 3.4.1 (2017-06-30)
    Platform: x86_64-w64-mingw32/x64 (64-bit)
    Running under: Windows Server 2008 R2 x64 (build 7601) Service Pack 1
    Matrix products: default
    locale:
    [1] LC_COLLATE=English_United States.1252 
2017 Dec 04
1
svyglm
Hi,
I am trying to run analyzes incorporating sample weight, strata and cluster (three-stage sample) with PNS data (national health survey) and is giving error. I describe below the commands used. I could not make the code reproducible properly.
Thanks,
#################################################
library(survey)####change to 0 and 1 variable
2012 Feb 12
1
how to extract p values in svyglm
summary(result)
Call:
svyglm(Injury ~ seat, sD, family = quasibinomial(link = "logit"))
Survey design:
svydesign(~1, prob = NULL, strata = Data[, 1], weights = Data[,
    4], data = Data, fpc = ~fPc)
Coefficients:
             Estimate Std. Error t value Pr(>|t|)
(Intercept) -4.256875   0.001421 -2996.7   <2e-16 ***
seatbad      0.681504   0.001689   403.4   <2e-16 ***
---
2008 Dec 18
1
svyglm fit method?
Dear list,
I am using svyglm in the survey library to fit a binomial logistic  
regression accounting for sample design.  The documentation says the  
models are not fit by maximum likelihood, so my question is what is  
the fitting method?  Pseudo likelihood?  Generalized least squares?   
Thanks for any insight.
Best,
Corey
Corey Sparks
Assistant Professor
Department of Demography and
2009 Oct 09
1
svy / weighted regression
Dear list,
I am trying to set up a propensity-weighted regression using the
survey package. Most of my population is sampled with a sampling
probability of one (that is, I have the full population). However, for
a subset of the data I have only a 50% sample of the full population.
In previous work on the data, I analyzed these data using SAS and
STATA. In those packages I used a propensity weight
2006 Jul 18
1
Survey-weighted ordered logistic regression
Hi,
I am trying to fit a model with an ordered response variable (3 levels) and
13 predictor variables. The sample has complex survey design and I've used
'svydesign' command from the survey package to specify the sampling design.
After reading the manual of 'svyglm' command, I've found that you can fit a
logistic regression (binary response variable) by specifying the
2012 Jun 21
4
crosstable and regression for survey data (weighted)
I have survey data that I am working on. I need to make some multi-way tables
and regression analyses on the data. After attaching the data, this is the
code I use for tables for four variables (sweight is the weight variable):
> a <- xtabs(sweight~research.area + gender + a2n2 + age)
> tmp <- ftable(a)
Is this correct? I don't think I need to use the strata and cluster
2007 Aug 17
0
svyglm.predict: cannot allocate vector
Hi,
I have a problem with the predict function of svyglm:
When I try to predict with an object of svyglm I get
the error message that R can't allocate a vector about
3 GB big.
Has anybody a hint how I can reduce the memory used
for this?
I have about 25000 observation and use the weigths
parameter. Where is so much data created?
Thanks,
  Werner
2007 Jul 06
0
svyglm
Dear Professor Lumley
I am relatively new to using R and also to logistic regression.  We have
analysed our Dudley Health Survey using the survey package.  I am now
trying to look at associations using svyglm but I am unsure of how to
interpret the output and present the resulting model or whether there
are any other things I should do to check the validity of the model.
Below is an example of
2013 May 02
1
Package survey: singularities in linear regression models
Hello,
I want to specify a linear regression model in which the metric outcome 
is predicted by two factors and their interaction. glm() computes 
effects for each factor level and the levels of the interaction. In the 
case of singularities glm() displays "NA" for the corresponding 
coefficients. However, svyglm() aborts with an error message. Is there a 
possibility that svyglm()
2012 Dec 10
3
Warning message: In eval(expr, envir, enclos) : non-integer #successes in a binomial glm!
Hi there 
I'm trying to fit a logistic regression model to data that looks very similar to the data in the sample below.   I don't understand why I'm getting this error; none of the data are proportional and the weights are numeric values.  Should I be concerned about the warning about non-integer successes in my binomial glm? If I should be, how do I go about addressing it?
I'm