Displaying 12 results from an estimated 12 matches for "failcode".
Did you mean:
mailcode
2009 Jun 25
2
crr - computationally singular
...ng is as follows where covaea and covaeb are matrices
of covarites, all coded as binary variables.
In case a:
> covaea <- cbind(sexa,fsha,fdra,nsigna,eega,th1a,th2a,stype1a,stype2a,stype3a,pgu1a,pgu2a,log(agea),firstinta/1000,totsezbasea)
> fita <- crr(snearma$with.Withtime,csaea,covaea,failcode=2,cencode=0)
and in case b:
> covaeb <- cbind(sexb,fshb,fdrb,nsignb,eegb,th1b,th2b,stype1b,stype2b,stype3b,stype4b,stype5b,pgu1b,pgu2b,(ageb/10)^(-1),firstintb,log(totsezbaseb))
> fitb <- crr(snearmb$with.Withtime,csaeb,covaeb,failcode=2,cencode=0)
csaea and csaeb are the censoring in...
2008 Aug 22
1
Help on competing risk package cmprsk with time dependent covariate
...ter 1
year. Correct me if I m wrong in trying to do so.
First, I have run the following script (R2.7.1 under XPpro) according to previous advices:
library(cmprsk)
attach(LAMrelapse)
fit1<- crr(rel.t, rel.s, treatment, treatment, function(uft)
cbind(ifelse(uft<=1,1,0),ifelse(uft>1,1,0)), failcode=1,
cencode=0, na.action=na.omit, gtol-06, maxiter)
fit1
where:
rel.t = time to event (in years)
rel.s = status , =1 if disease relapse, =2 if death from non disease
related cause (toxicity of previous chemotherapy), =0 if alive &
not in relapse
treatment =
binary covariate (value: 0 or 1) repr...
2013 Oct 18
1
crr question in library(cmprsk)
Hi all
I do not understand why I am getting the following error message. Can
anybody help me with this? Thanks in advance.
install.packages("cmprsk")
library(cmprsk)
result1 <-crr(ftime, fstatus, cov1, failcode=1, cencode=0 )
one.pout1 = predict(result1,cov1,X=cbind(1,one.z1,one.z2))
predict.crr(result1,cov1,X=cbind(1,one.z1,one.z2))
Error: could not find function "predict.crr"
[[alternative HTML version deleted]]
2008 Aug 20
0
cmprsk and a time dependent covariate in the model
...year. Correct me if I m wrong in trying to do so.
First, I have run the following script (R2.7.1 under XPpro) according to previous advices:
library(cmprsk)
attach(LAMrelapse)
fit1<- crr(rel.t, rel.s, treatment, treatment, function(uft)
cbind(ifelse(uft<=1,1,0),ifelse(uft>1,1,0)), failcode=1,
cencode=0, na.action=na.omit, gtol-06, maxiter)
fit1
where:
rel.t = time to event (in years)
rel.s = status , =1 if disease relapse, =2 if death from non disease
related cause (toxicity of previous chemotherapy), =0 if alive &
not in relapse
treatment = binary covariate (value: 0 or 1...
2018 Feb 16
0
Competing risks - calibration curve
...ot;,0,1), c("bern",0.564)), nsit=2)
table(status)
table(cause)
df$cause<-ifelse(is.na(df$cause),0,df$cause)
table(df$cause)
df.w<-crprep("time","cause", data=df, trans=c(1,2), cens=0, id="nid", keep=c("x", "x.1"))
with(df.w,table(failcode,status))
ddist<-datadist(df.w)
options(datadist='ddist')
mod<-cph(Surv(Tstart,Tstop,status==1)~rcs(x,3)+x.1,data=df.w, weight=weight.cens, subset=failcode==1, x=T, y=T, surv=T, time.inc = 2.5) mod2<-cph(Surv(Tstart,Tstop,status==1)~(x.1+rcs(x,3))^2,data=df.w, weight=weight.cens, su...
2009 Jun 23
0
Fractional Polynomials in Competing Risks setting
...time to treatment withdrawal, with.Wcens is
the censoring indictor for the event and all.firstint is the age at
baseline.
To look at the competing risks regression modelling when age in
untransformed, I can use the following code:
fitn<-crr(nearma$with.Withtime,censaeb,as.matrix(nearma$all.age),failcode=2,cencode=0)
where censaeb is the censoring indicator which is coded 1 for the
event of interest (time to treatment failure), 2 for the competing
risk and 0 for the censored value.
Can anyone suggest how I can effectively combine these situations i.e.
is there a way to apply the fractional polynom...
2013 Jan 02
0
Plot of Fine and Gray model
...ate of interest)
I want to investigate if pre has a significant impact on time to event for
patients who died and for those who suffered disease progression (as well
as it's impact on the overall time to event).
The code I have used is as follows:
fitd <- crr(dat1$ccr,dat1$Crcens,dat1$pre,failcode=1,cencode=0)
fitp <- crr(dat1$ccr,dat1$Crcens,dat1$pre,failcode=2,cencode=0)
In these cases I get p-values of 0 and 0.66 respectively.
What I would now like to do, is to plot two cumulative incidence curves -
one for the 'pre' variable status for patients who didn't acheive the eve...
2008 Aug 22
0
Re : Help on competing risk package cmprsk with time dependent covariate
...rying to do so.
>
>
> First, I have run the following script (R2.7.1 under XPpro) according to previous advices:
>
> library(cmprsk)
> attach(LAMrelapse)
> fit1<- crr(rel.t, rel.s, treatment, treatment, function(uft)
> cbind(ifelse(uft<=1,1,0),ifelse(uft>1,1,0)), failcode=1,
> cencode=0, na.action=na.omit, gtol-06, maxiter)
> fit1
>
> where:
> rel.t = time to event (in years)
> rel.s = status , =1 if disease relapse, =2 if death from non disease
> related cause (toxicity of previous chemotherapy), =0 if alive &
> not in relapse
> trea...
2015 May 16
1
That 'make check-all' problem with the survival package
...-------------------------
ERROR
Errors in running code in vignettes:
when running code in ?compete.Rnw?
...
> temp$fstat <- as.numeric(event)
> temp$msex <- with(temp, 1 * (sex == "M"))
> fgfit1 <- with(temp, crr(etime, fstat, cov1 = cbind(age,
+ msex, mspike), failcode = 2, cencode = 1, variance = TRUE))
When sourcing ?compete.R?:
Error: could not find function "crr"
Execution halted
* checking re-building of vignette outputs ... NOTE
Error in re-building vignettes:
...
Warning in coxph(Surv(futime, death) ~ group:age2 + sex + strata(group), :...
2015 May 16
2
That 'make check-all' problem with the survival package
...in vignettes:
>> when running code in ?compete.Rnw?
>> ...
>> temp$fstat <- as.numeric(event)
>>
>> temp$msex <- with(temp, 1 * (sex == "M"))
>>
>> fgfit1 <- with(temp, crr(etime, fstat, cov1 = cbind(age,
>> + msex, mspike), failcode = 2, cencode = 1, variance = TRUE))
>>
>> When sourcing ?compete.R?:
>> Error: could not find function "crr"
>> Execution halted
>>
>> * checking re-building of vignette outputs ... NOTE
>> Error in re-building vignettes:
>> ...
>&g...
2006 May 10
0
using crr in cmprsk
Hi,
I need to fit model using crr, however my covariate is
categorical with 3 levels. I use
crr(time,status,agesplit,failcode=1,cencode=0) where
agesplit is defined as <20,21-29,>30 years, so it
takes 0, 1 or 2 for each patient. I hoped to get
estimated coefficients for the levels 1 and 2 w.r.t
level 0 as in coxph. But, I didn't. Could someone
please help me to use crr in this situation?
Thanks a lot.
Ruwanthi
2015 May 17
0
That 'make check-all' problem with the survival package
...running code in ?compete.Rnw?
>>>???...
>>> temp$fstat <- as.numeric(event)
>>>
>>> temp$msex <- with(temp, 1 * (sex == "M"))
>>>
>>> fgfit1 <- with(temp, crr(etime, fstat, cov1 = cbind(age,
>>> +? ???msex, mspike), failcode = 2, cencode = 1, variance = TRUE))
>>>
>>>???When sourcing ?compete.R?:
>>> Error: could not find function "crr"
>>> Execution halted
>>>
>>> * checking re-building of vignette outputs ... NOTE
>>> Error in re-building vign...