Displaying 20 results from an estimated 4000 matches similar to: "Handling of NAs in functions lrm and robcov"
2004 Mar 04
1
Ordinal logistic regression using spatial data
I have a spatial data set with ordinal response variable containing 
four levels. I would like to know if and how spatial autocorrelation 
can be taken into account when ordinal logistic regression is used 
(e.g. the function lrm from the Design package).
Thanks for your help!
Christof
2007 Jan 25
1
summary of the effects after logistic regression model
Dear all, my aim is to estimate the efficacy over time  of a treatment for
headache prevention.  Data consist of long sequences of repeated binary
outcomes   (1 if the subject has at least 1 episode of headache  , 0
otherwise) on subjects randomized to placebo or treatment.
I have fit a logistic regression model with Huber-White cluster sandwich
covariance estimator.
I have put in the model  the
2009 May 08
2
Probit cluster-robust standard errors
If I wanted to fit a logit model and account for clustering of observations, I would do something like:
library(Design)
f <- lrm(Y1 ~ X1 + X2, x=TRUE, y=TRUE, data=d)
g <- robcov(f, d$st.year)
What would I do if I wanted to do the same thing with a probit model? 
?robcov says the input model must come from the Design package, but the Design package appears not to do probit?
Thanks very
2011 Apr 30
0
bootcov or robcov for odds ratio?
Dear list,
I made a logistic regression model (MyModel) using lrm and penalization
by pentrace for data of 104 patients, which consists of 5 explanatory
variables and one binary outcome (poor/good). Then, I found bootcov and
robcov function in rms package for calculation of confidence range of
coefficients and odds ratio by bootstrap covariance matrix and
Huber-White sandwich method,
2008 Jul 25
1
extracting Pr>ltl from robcov/ols (Design)
I am trying to extract significance levels out of a robcov+ols call.
For background: I am analysing data where multiple measurements(2 per
topic) were taken from individuals(36) on their emotional reaction
(dependent variable) to various topics (3 topics). Because I have
several emotions and a rotation to do on the topics, I'd like to have
the results pumped into a nice table.
2013 Apr 19
2
NAMESPACE and imports
I am cleaning up the rms package to not export functions not to be called
directly by users.  rms uses generic functions defined in other packages. 
For example there is a latex method in the Hmisc package, and rms has a
latex method for objects of class "anova.rms" so there are anova.rms and
latex.anova.rms functions in rms.  I use:
2009 Apr 13
3
Clustered data with Design package--bootcov() vs. robcov()
Hi,
I am trying to figure out exactly what the bootcov() function in the Design
package is doing within the context of clustered data. From reading the
documentation/source code it appears that using bootcov() with the cluster
argument constructs standard errors by resampling whole clusters of
observations with replacement rather than resampling individual
observations. Is that right, and is
2003 Oct 07
1
Adjusting for within-cluster correlation: robcov() in Design-package and 'ids' in survey-package
Dear all,
I would like to know if it possible to use the the robcov()-command in the Design-
package in order to obtain a robust variance-estimate that adjusts for within-cluster 
correlation. Does the ids-option in the survey-package the same job? 
TIA,
Bernd
2007 Aug 30
2
Assigning line colors in xyplot
Hi,
I have a dataframe containing data from individuals 1, ..., 12 (grouping 
variable "g" in the data frame below), which belong either to "A" or "B" 
(grouping variable "f"):
set.seed(1)
tmp <- data.frame(
      
2005 Jul 12
1
Design: predict.lrm does not recognise lrm.fit object
Hello
I'm using logistic regression from the Design library (lrm), then fastbw to
undertake a backward selection and create a reduced model, before trying to
make predictions against an independent set of data using predict.lrm with
the reduced model.  I wouldn't normally use this method, but I'm
contrasting the results with an AIC/MMI approach.  The script contains:
# Determine full
2017 Sep 14
0
Help understanding why glm and lrm.fit runs with my data, but lrm does not
> On Sep 14, 2017, at 12:30 AM, Bonnett, Laura <L.J.Bonnett at liverpool.ac.uk> wrote:
> 
> Dear all,
> 
> I am using the publically available GustoW dataset.  The exact version I am using is available here: https://drive.google.com/open?id=0B4oZ2TQA0PAoUm85UzBFNjZ0Ulk
> 
> I would like to produce a nomogram for 5 covariates - AGE, HYP, KILLIP, HRT and ANT.  I have
2010 Dec 25
2
predict.lrm vs. predict.glm (with newdata)
Hi all
I have run into a case where I don't understand why predict.lrm and
predict.glm don't yield the same results. My data look like this:
set.seed(1)
library(Design); ilogit <- function(x) { 1/(1+exp(-x)) }
ORDER <- factor(sample(c("mc-sc", "sc-mc"), 403, TRUE))
CONJ <- factor(sample(c("als", "bevor", "nachdem",
2017 Sep 14
1
Help understanding why glm and lrm.fit runs with my data, but lrm does not
Fixed 'maxiter' in the help file.  Thanks.
Please give the original source of that dataset.
That dataset is a tiny sample of GUSTO-I and not large enough to fit this
model very reliably.
A nomogram using the full dataset (not publicly available to my knowledge)
is already available in http://biostat.mc.vanderbilt.edu/tmp/bbr.pdf
Use lrm, not lrm.fit for this.  Adding maxit=20 will
2012 May 27
2
Unable to fit model using “lrm.fit”
Hi,
I am running a logistic regression model using lrm library and I get the
following error when I run the command:
mod1 <- lrm(death ~ factor(score), x=T, y=T, data = env1)
Unable to fit model using ?lrm.fit?
where score is a numeric variable from 0 to 6.
LRM executes fine for the following commands:
mod1 <- lrm(death ~ score, x=T, y=T, data = env1)
mod1<- lrm(death ~     
2017 Sep 14
3
Help understanding why glm and lrm.fit runs with my data, but lrm does not
Dear all,
I am using the publically available GustoW dataset.  The exact version I am using is available here: https://drive.google.com/open?id=0B4oZ2TQA0PAoUm85UzBFNjZ0Ulk
I would like to produce a nomogram for 5 covariates - AGE, HYP, KILLIP, HRT and ANT.  I have successfully fitted a logistic regression model using the "glm" function as shown below.
library(rms)
gusto <-
2009 Aug 21
1
Possible bug with lrm.fit in Design Library
Hi,
I've come across a strange error when using the lrm.fit function and the 
subsequent predict function.
The model is created very quickly and can be verified by printing it on 
the console.  Everything looks good. (In fact, the performance measures 
are rather nice.)
Then, I want to use the model to predict some values.  I get the 
following error: "fit was not created by a Design
2009 Oct 25
1
Getting AIC from lrm in Design package
I am trying to obtain the AICc after performing logistic regression
using the Design package. For simplicity, I'll talk about the AIC. I
tried building a model with lrm, and then calculating the AIC as
follows:
likelihood.ratio <-
unname(lrm(succeeded~var1+var2,data=scenario,x=T,y=T)$stats["Model
L.R."]) #Model likelihood ratio???
model.params <- 2 #Num params in my model
AIC
2008 Mar 03
1
using 'lrm' for logistic regression
Hi R,
 
I am getting this error while trying to use 'lrm' function with nine
independent variables:
 
> res =
lrm(y1994~WC08301+WC08376+WC08316+WC08311+WC01001+WC08221+WC08106+WC0810
1+WC08231,data=y)
 
singular information matrix in lrm.fit (rank= 8 ).  Offending
variable(s):
WC08101 WC08221 
Error in j:(j + params[i] - 1) : NA/NaN argument
 
Now, if I take choose only four
2006 Nov 14
1
Using lrm
Hi,
I have to build a logistic regression model on a data set that I have. I
have three input variables (x1, x2, x3) and one output variable (y).
The syntax of lrm function looks like this
     lrm(formula, data, subset, na.action=na.delete, method="lrm.fit",
         model=FALSE, x=FALSE, y=FALSE, linear.predictors=TRUE, se.fit=FALSE,
         penalty=0, penalty.matrix, tol=1e-7,
  
2009 Sep 04
2
lrm in Design package--missing value where TRUE/FALSE needed
Hi,
A error message arose while I was trying to fit a ordinal model with lrm() I am using R 2.8 with Design package.
Here is a small set of mydata:
RC	RS	Sex	CovA	CovB	CovC	CovD	CovE
2	1	0	1	1	0	-0.005575280	2
2	1	0	1	0	1	-0.001959580	2
3	0	0	0	1	0	-0.004725880	2
0	0	0	1	0	0	-0.005504850	2
2	1	1	0	0	0	-0.003880170	1
2	1	0	0	1	0	-0.006074230	2
2	1	0	0	1     1 	-0.003963920	2
2	1	0	0	1	0