Displaying 20 results from an estimated 2000 matches similar to: "PSM function in Design package (PR#6525)"
2007 Jun 18
1
psm/survreg coefficient values ?
I am using psm to model some parametric survival data, the data is for
length of stay in an emergency department. There are several ways a
patient's stay in the emergency department can end (discharge, admit, etc..)
so I am looking at modeling the effects of several covariates on the various
outcomes. Initially I am trying to fit a survival model for each type of
outcome using the psm
2010 May 05
1
Error messages with psm and not cph in Hmisc
While
sm4.6ll<-fit.mult.impute(Surv(agesi, si)~partner+ in.love+ pubty+ FPA+
strat(gender),fitter = cph, xtrans = dated.sexrisk2.i, data =
dated.sexrisk2, x=T,y=T,surv=T, time.inc=16)
runs perfectly using Hmisc, Design and mice under R11 run via Sciviews-K,
with
library(Design)
library(mice)
ds2d<-datadist(dated.sexrisk2)
options(datadist="ds2d")
2013 Jan 14
1
Does psm::Surv handle interval2 data?
Does Surv in psm handle interval2 data? The argument list seems to indicate it does but I get an error.
Thanks,
Chris
# code
library('survival')
left <- c(1, 3, 5, NA)
right <-c(2, 3, NA, 4)
Surv(left, right, type='interval2')
survreg(Surv(left, right, type='interval2') ~ 1)
library('rms')
Surv(left, right, type='interval2') # error
args(Surv)
2011 May 08
1
question about val.surv in R
Dear R users:
I tried to use val.surv to give an internal validation of survival
prediction model.
I used the sample sources.
# Generate failure times from an exponential distribution
set.seed(123) # so can reproduce results
n <- 1000
age <- 50 + 12*rnorm(n)
sex <- factor(sample(c('Male','Female'), n, rep=TRUE, prob=c(.6, .4)))
cens <- 15*runif(n)
h
2009 Apr 16
1
Survreg/psm output
Dear R-listers,
I know that there have been many, many posts on the output from
Survreg. To summarise what I have read, Scale is 1/shape of the
Weibull which is also the standard deviation of the normal
distribution which is also the standard deviation of the log survival
time and Intercept is log(scale). I also know that the hazard
function can be calculated from the output to give something
2008 Jan 23
2
Parametric survival models with left truncated, right censored data
Dear All,
I would like to fit some parametric survival models using left
truncated, right censored data in R. However I am having problems
finding a function to fit parametric survival models which can handle
left truncated data.
I have tested both the survreg function in package survival:
fit1 <- survreg(Surv(start, stop, status) ~ X + Y + Z, data=data1)
and the psm function in package
2018 Feb 16
0
Competing risks - calibration curve
Hi,
Sorry not to provide R-code in my previous mail. R code is below
#install.packages("rms")
require(rms)
#install.packages("mstate")
library(mstate)
require(splines)
library(ggplot2)
library(survival)
library(splines)
#install.packages("survsim")
require(survsim)
set.seed(10)
df<-crisk.sim(n=500, foltime=10, dist.ev=rep("lnorm",2),
2004 Nov 23
6
Weibull survival regression
Dear R users,
Please can you help me with a relatively straightforward problem that I
am struggling with? I am simply trying to plot a baseline survivor and
hazard function for a simple data set of lung cancer survival where
`futime' is follow up time in months and status is 1=dead and 0=alive.
Using the survival package:
lung.wbs <- survreg( Surv(futime, status)~ 1, data=lung,
2012 Apr 22
1
Survreg
Hi all,
I am trying to run Weibull PH model in R.
Assume in the data set I have x1 a continuous variable and x2 a
categorical variable with two classes (0= sick and 1= healthy). I fit the
model in the following way.
Test=survreg(Surv(time,cens)~ x1+x2,dist="weibull")
My questions are
1. Is it Weibull PH model or Weibull AFT model?
Call:
survreg(formula = Surv(time, delta) ~ x1
2012 May 11
2
survival analysis simulation question
Hi,
I am trying to simulate a regression on survival data under a few
conditions:
1. Under different error distributions
2. Have the error term be dependent on the covariates
But I'm not sure how to specify either conditions. I am using the Design
package to perform the survival analysis using the survreg, bj, coxph
functions. Any help is greatly appreciated.
This is what I have so far:
2005 Aug 27
1
survival parametric question
Hi to all,
I am working on design package using survival function.
First using PSM and adopting a weibull specification for the baseline hazard , I have got the following results(since weibull has both PH and AFT propreties ,in addition I have used the PPHSm command):
Value Std. Error z p
(Intercept) 1.768 1.0007 1.77 7.73e-02
SIZE -0.707 0.0895 -7.90 2.80e-15
2005 Jan 20
2
(no subject)
Hello
I would like to compare the results obtained with a classical non
parametric proportionnal hazard model with a parametric proportionnal
hazard model using a Weibull.
How can we obtain the equivalence of the parameters using coxph(non
parametric model) and survreg(parametric model) ?
Thanks
Virginie
2011 Jan 28
1
survreg 3-way interaction
> I was wondering why survreg (in survival package) can not handle
> three-way interactions. I have an AFT .....
You have given us no data to diagnose your problem. What do you mean
by "cannot handle" -- does the package print a message "no 3 way
interactions", gives wrong answers, your laptop catches on fire when you
run it, ....?
Also, make sure you read
2007 Jan 22
0
[UNCLASSIFIED] predict.survreg() with frailty term and newdata
Dear All,
I am attempting to make predictions based on a survreg() model with some censoring and a frailty term, as below: predict works fine on the original data, but not if I specify newdata.
# a model with groups as fixed effect
model1 <- survreg(Surv(y,cens)~ x1 + x2 + groups,
dist = "gaussian")
# and with groups as a random effect
fr <- frailty(groups,
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:
2012 Aug 31
3
fitting lognormal censored data
Hi ,
I am trying to get some estimator based on lognormal distribution when we have left,interval, and right censored data. Since, there is now avalible pakage in R can help me in this, I had to write my own code using Newton Raphson method which requires first and second derivative of log likelihood but my problem after runing the code is the estimators were too high. with this email ,I provide
2005 May 03
2
comparing lm(), survreg( ... , dist="gaussian") and survreg( ... , dist="lognormal")
Dear R-Helpers:
I have tried everything I can think of and hope not to appear too foolish
when my error is pointed out to me.
I have some real data (18 points) that look linear on a log-log plot so I
used them for a comparison of lm() and survreg. There are no suspensions.
survreg.df <- data.frame(Cycles=c(2009000, 577000, 145000, 376000, 37000,
979000, 17420000, 71065000, 46397000,
2006 Jul 07
6
parametric proportional hazard regression
Dear all,
I am trying to find a suitable R-function for
parametric proportional hazard regressions. The
package survival contains the coxph() function which
performs a Cox regression which leaves the base hazard
unspecified, i.e. it is a semi-parametric method. The
package Design contains the function pphsm() which is
good for parametric proportional hazard regressions
when the underlying base
2008 Apr 25
3
Use of survreg.distributions
Dear R-user:
I am using survreg(Surv()) for fitting a Tobit model of left-censored longitudinal data. For logarithmic transformation of y data, I am trying use survreg.distributions in the following way:
tfit=survreg(Surv(y, y>=-5, type="left")~x + cluster(id), dist="gaussian", data=y.data, scale=0, weights=w)
my.gaussian<-survreg.distributions$gaussian
2009 Mar 08
2
survreg help in R
Hey all,
I am trying to use the survreg function in R to estimate the mean and
standard deviation to come up with the MLE of alpha and lambda for the
weibull distribution. I am doing the following:
times<-c(10,13,18,19,23,30,36,38,54,56,59,75,93,97,104,107,107,107)
censor<-c(1,0,0,1,0,1,1,0,0,0,1,1,1,1,0,1,0,0)
survreg(Surv(times,censor),dist='weibull')
and I get the following