similar to: val.surv

Displaying 20 results from an estimated 7000 matches similar to: "val.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 Jan 26
1
Error in Surv(time, status) : Time variable is not numeric
Dear, I want to analyze two-level survival data using a shared frailty model, for which I want to use the R package 'Frailtypack", proposed by Rondeau et al. The dataset was built using SAS software. I also tried to change the format using SPSS and Excell. My (reduced) dataset has following column names: ID entry time status family var1 I used following command: >
2011 Jul 15
1
validate survival with val.surv
Dear R users: I want to externally validate a model with val.surv. Can I use only calculated survival (at 1 year) and actual survival? Or I needed the survival function and actual survival. Thanks *Yao Zhu* *Department of Urology Fudan University Shanghai Cancer Center Shanghai, China* [[alternative HTML version deleted]]
2011 Apr 08
1
Variance of random effects: survreg()
I have the following questions about the variance of the random effects in the survreg() function in the survival package: 1) How can I extract the variance of the random effects after fitting a model? For example: set.seed(1007) x <- runif(100) m <- rnorm(10, mean = 1, sd =2) mu <- rep(m, rep(10,10)) test1 <- data.frame(Time = qsurvreg(x, mean = mu, scale= 0.5, distribution =
2011 Jun 25
2
cluster() or frailty() in coxph
Dear List, Can anyone please explain the difference between cluster() and frailty() in a coxph? I am a bit puzzled about it. Would appreciate any useful reference or direction. cheers, Ehsan > marginal.model <- coxph(Surv(time, status) ~ rx + cluster(litter), rats) > frailty.model <- coxph(Surv(time, status) ~ rx + frailty(litter), rats) > marginal.model Call: coxph(formula =
2008 Apr 17
1
survreg() with frailty
Dear R-users, I have noticed small discrepencies in the reported estimate of the variance of the frailty by the print method for survreg() and the 'theta' component included in the object fit: # Examples in R-2.6.2 for Windows library(survival) # version 2.34-1 (2008-03-31) # discrepancy fit1 <- survreg(Surv(time, status) ~ rx + frailty(litter), rats) fit1 fit1$history[[1]]$theta
2004 Nov 08
1
coxph models with frailty
Dear R users: I'm generating the following survival data: set.seed(123) n=200 #sample size x=rbinom(n,size=1,prob=.5) #binomial treatment v=rgamma(n,shape=1,scale=1) #gamma frailty w=rweibull(n,shape=1,scale=1) #Weibull deviates b=-log(2) #treatment's slope t=exp( -x*b -log(v) + log(w) ) #failure times c=rep(1,n) #uncensored indicator id=seq(1:n) #individual frailty indicator
2013 Oct 09
1
frailtypack
I can't comment on frailtypack issues, but would like to mention that coxme will handle nested models, contrary to the statement below that "frailtypack is perhaps the only .... for nested survival data". To reprise the original post's model cgd.nfm <- coxme(Surv(Tstart, Tstop, Status) ~ Treatment + (1 | Center/ID), data=cgd.ag) And a note to the poster-- you should
2007 Apr 17
3
Extracting approximate Wald test (Chisq) from coxph(..frailty)
Dear List, How do I extract the approximate Wald test for the frailty (in the following example 17.89 value)? What about the P-values, other Chisq, DF, se(coef) and se2? How can they be extracted? ######################################################> kfitm1 Call: coxph(formula = Surv(time, status) ~ age + sex + disease + frailty(id, dist = "gauss"), data = kidney)
2007 Sep 12
1
enquiry
Dear R-help, I am trying to estimate a Cox model with nested effects basing on the minimization of the overall AIC; I have two frailties terms, both gamma distributed. There is a error message (theta2 argument misses) and I don?t understand why. I would like to know what I have wrong. Thank you very much for your time. fitM7 <- coxph(Surv(lifespan,censured) ~ south + frailty(id,
2004 Nov 17
1
frailty and time-dependent covariate
Hello, I'm trying to estimate a cox model with a frailty variable and time-dependent covariate (below there is the statement I use and the error message). It's seems to be impossible, because every time I add the time-dependent covariate the model doesn't converge. Instead, if I estimate the same model without the time-dependent covariate it's converge. I'd like knowing if
2007 Dec 05
4
coxme frailty model standard errors?
Hello, I am running R 2.6.1 on windows xp I am trying to fit a cox proportional hazard model with a shared Gaussian frailty term using coxme My model is specified as: nofit1<-coxme(Surv(Age,cen1new)~ Sex+bo2+bo3,random=~1|isl,data=mydat) With x1-x3 being dummy variables, and isl being the community level variable with 4 levels. Does anyone know if there is a way to get the standard error
2011 May 04
2
speexenc/speexdec doubles file size
this is not really a development question, but i didn't find another mailing list to ask it. any idea why size of wav file doubles when it is encoded to speex and back to wav: $ ls -ls testi.wav 40 -rw-r--r-- 1 foo foo 40674 May 4 14:38 testi.wav $ speexenc --denoise --agc --quality 10 testi.wav testi.spx Encoding 8000 Hz audio using narrowband mode (mono) $ ls -ls testi.spx 20
2002 Oct 08
2
Frailty and coxph
Does someone know the rules by which 'coxph' returns 'frail', the predicted frailty terms? In my test function: ----------------------------------------------- fr <- function(){ #testing(frailty terms in 'survival' require(survival) dat <- data.frame(exit = 1:6, event = rep(1, 6), x = rep(c(0, 1), 3),
2006 Feb 28
1
ex-Gaussian survival distribution
Dear R-Helpers, I am hoping to perform survival analyses using the "ex-Gaussian" distribution. I understand that the ex-Gaussian is a convolution of exponential and Gaussian distributions for survival data. I checked the "survreg.distributions" help and saw that it is possible to mix pre-defined distributions. Am I correct to think that the following code makes the
2005 Jul 18
1
Survival dummy variables and some questions
Hi All, I am currently conducting some survival analyses. I would like to extract coefficients at each level of the IVs. I read on a previous posting that dummy regression using coxph was not possible. Therefore I though, hey why not categorize the variables (I realize some folks object to categorization but the paper I am replicating appears to have done so ...) and turn the variables
2006 Nov 07
1
Extracting parameters for Gamma Distribution
I'm doing a cox regression with frailty: model <- coxph(Surv(Start,Stop,Terminated)~ X + frailty(id),table) I understand that model$frail returns the group level frailty terms. Does this mean this is the average of the frailty values for the respective groups? Also, if I'm fitting it to a gamma frailty, how do I extract the rate and scale parameters for the different gamma
2012 Dec 03
1
fitting a gamma frailty model (coxph)
Dear all, I have a data set<http://yaap.it/paste/c11b9fdcfd68d02b#gIVtLrrme3MaiQd9hHy1zcTjRq7VsVQ8eAZ2fol1lUc=>with 6 clusters, each containing 48 (possibly censored, in which case "event = 0") survival times. The "x" column contains a binary explanatory variable. I try to describe that data with a gamma frailty model as follows: library(survival) mod <-
2003 May 19
1
survit function and cox model with frailty
Hi: I have a question about the use of the survfit function after the estimation of a cox proportional hazard model with a frailty term. My goal is to estimate expected survival probabilities while controlling for the group-specific frailty term. First, I estimate a model of the following form: model1 <- coxph(Surv(t0, t, d) ~ x1 + x2 + frailty(id), na.action=na.exclude,
2003 Aug 04
1
coxph and frailty
Hi: I have a few clarification questions about the elements returned by the coxph function used in conjuction with a frailty term. I create the following group variable: group <- NULL group[id<50] <- 1 group[id>=50 & id<100] <- 2 group[id>=100 & id<150] <- 3 group[id>=150 & id<200] <- 4 group[id>=200 & id<250] <- 5 group[id>=250