Displaying 20 results from an estimated 31 matches for "ratetables".
Did you mean:
ratetable
2010 Dec 31
3
survexp - example produces error
Dear All,
reposting, because I did not find a solution, maybe someone could
check the example below.
It's taken from the help page of survdiff. Executing it, gives the error
"Error in floor(temp) : Non-numeric argument to mathematical function"
best regards,
Heinz
library(survival)
## Example from help page of survdiff
## Expected survival for heart transplant patients based
2011 May 26
5
Survival: pyears and ratetable: expected events
Dear all,
I am having a (really) hard time getting pyears to work together with a
ratetable to give me the number of expected events (deaths).
I have the following data:
dos, date of surgery, as.Date
dof, date of last follow-up, as.Date
dos, date of surgery, as.Date
sex, gender, as.factor (female,male)
ev, event(death), 0= censored at time point dof, 1=death at time point dof
Could someone
2005 Dec 15
2
survexp ratetables for european contries?
Dear All,
Does someone have, or know of survexp ratetables for european contries,
especially Austria and Germany?
I know only about slopop in the package relsurv.
Thanks in advance
Heinz T??chler
2011 Apr 20
2
survexp with weights
Hello,
I probably have a syntax error in trying to generate an expected
survival curve from a weighted cox model, but I can't see it. I used
the help sample code to generate a weighted model, with the addition
of a "weights=albumin" argument (I only chose albumin because it had
no missing values, not because of any real relevance). Below are my
code with the resulting error
2010 Sep 13
0
using survexp and ratetable with coxph object that includes a factor term
Hello,
I'm attempting to use the ratetable argument to
survexp in the survival package. I use
the example from the ?survexp help page below,
and then slightly modify it to produce an error.
library(survival)
data(pbc)
#fit a model without any factors
pfit1 <- coxph(Surv(time, status > 0) ~ trt + log(bili) +
log(protime) + age + platelet, data=pbc)
#this works as expected
2000 Apr 05
1
problem with survexp in survival5
survexp in survival5 doesn't seem to work for me. see below:
> library(survival5)
Attaching Package "package:survival5":
The following object(s) are masked from package:base :
sort.list
> library(chron)
> data(ratetables)
> survexp(~ratetable(year=julian(6,1,1991),
+ sex=1,age=35*365.24),times=(0:30)/6*365.24)
Error in as.character(as.date(c(min(R[, 3]), max(R[, 3])))) :
couldn't find function "as.date"
I got the same errors from the following platforms:
R-1.0.0, survival5_1.1-1 on AIX,
R-1.0....
2010 Dec 20
0
survexp - unable to reproduce example
Dear All,
when I try to reproduce an example of survexp, taken from the help
page of survdiff, I receive the error message
"Error in floor(temp) : Non-numeric argument to mathematical function"
.
It seems to come from match.ratetable. I think, it has to do with
character variables in a ratetable.
I would be interested to know, if it works for others. With an older
version of
1999 Jul 10
1
who submitted ratetables to CRAN?
Hi,
the ratetables package on CRAN contains no author/maintainer
information whatsoever and I cannot remember who submitted it
... is the creator out there on this list?
The DESCRIPTION file is missing (otherwise I wouldn't have problems
with finding the author) ...
Fritz
-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-...
2009 Jan 19
1
further notes on model.frame issue
This is a follow-up on my note of Saturday. Let me start with two important
clarifications
- I think this would be a nice addition, but I've had exactly one use for it
in the 15+ years of developing the survival package.
- I have a work around for the current case.
Prioritize accordingly.
The ideal would be to change survexp as follows:
fit <- survexp( ~ gender,
2008 Sep 10
2
relsurv package
Dear R-users,
I have a couple of questions about the relsurv package:
1) when I try to run the example:
fit <- rsmul(Surv(time,cens)~sex+as.factor(agegr)+ratetable(age=age*365.24,sex=sex,year=year),ratetable=slopop,data=rdata)
with the datasets in the package (rdata and slopop) it gives me an error:
Error in nrow(x) : object "x" not found
2)
If I have a date format
2009 May 21
1
Changelog for the survival package
...print.survfit, plot.survfit and seemingly in the structure
> of ratetabels effect some of my syntax files.
> Is there somewhere a documentation of these changes, besides the code itself?
I agree, the Changelog.09 file is not as comprehensive as one would like.
Specific comments:
1. The ratetables were recently changed to accomodate a new option. I thought
that I had made them completely backwards compatable with the old -- please let
me know specifics if I overlooked something.
The routines that make use of the rate tables can now use multiple date types,
but they still support the ol...
2010 Nov 11
3
Evaluation puzzle
The survexp function can fail when called from another function. The "why" of
this has me baffled, however.
Here is a simple test case, using a very stripped down version of survexp:
survexp.test <- function(formula, data,
weights, subset, na.action, rmap,
times, cohort=TRUE, conditional=FALSE,
ratetable=survexp.us, scale=1, npoints, se.fit,
2001 Nov 12
2
check() warnings for survival-2.6
I am not sure if this is the right place for that kind of questions, but
I wondered
that the recommended package survival did not pass R's check procedure
without
warnings:
1) unbalanced braces:
* Rd files with unbalanced braces:
* man/Surv.Rd
* man/cluster.Rd
* man/cox.zph.Rd
* man/coxph.Rd
* man/coxph.detail.Rd
* man/date.ddmmmyy.Rd
* man/lines.survfit.Rd
*
2012 Feb 24
1
package relsurv
Dear R-Users,
I've recently used relsurv package for relative survival analysis. In particular I've tried to reproduce the examples proposed in the R-documentation about rsadd, rsmul and rstrans functions in R latest version (R 2.14.1). These examples don't run and the error message is always the following:
data(slopop)
data(rdata)
2012 Nov 30
1
Baffled with as.matrix
I'm puzzled by as.matrix. It appears to work differently for Surv objects.
Here is a session from my computer:
tmt% R --vanilla
> library(survival)
Loading required package: splines
> ytest <- Surv(1:3, c(1,0,1))
> is.matrix(ytest)
>[1] TRUE
> attr(ytest, 'type')
[1] "right"
> attr(as.matrix(ytest), 'type')
[1] "right"
>
2012 Apr 30
0
need help with avg.surv (Direct Adjusted Survival Curve), Message-ID:
Well, I would suggest using the code already in place in the survival
package. Here is my code for your problem.
I'm using a copy of the larynx data as found from the web resources for
the Klein and Moeschberger book.
larynx <- read.table("larynx.dat", skip=12,
col.names=c("stage", "time", "age", "year",
2010 Nov 03
1
model.frame problem
A few weeks ago I reported a problem with model.frame, whose root lay
in a formula expression "....+ ratetable(x1=x1, x2=x2, ....x100=x100)"
that was really long and caused model.frame to fail. Brian had some
indefinite ideas on what might need to change in the base code to handle
it.
In survival_2.36-1 the bit of code that generated the offending
expression has been changed (mostly
2002 Oct 10
0
help ! calculating relative mortality using survival5
Hi All,
I am relatively new to R (took a class 2 yrs ago ...), and am hoping someone can point me in the right direction for a problem I'd like to solve in R :
I would like to calculate the relative mortality of a particular impairment, relative to the standard population.
I.e. I'm trying to find S_relative(t) in the eqn below :
S_impar(t) = S_standard(t) * S_relative(t)
where
2024 Sep 15
1
Possible update to survival
I got good feedback from the list about a scope issue, so I am coming back for more.
Prior issue: users who type survival::coxph(survival::Surv(time, status) ~ x1 + x2 + surv ival::strata(group), data=mydata)
This messes up the character string matching for strata, done via tt <- terms(formula, specials= ?strata?). The code runs, and gives the wrong answer (group is treated as an ordinary
2010 Oct 07
1
model.frame deficiency
The model.frame function has trouble with a certain type of really long
formula. Here is a test:
tname <- paste('var', 1:50, sep='')
tmat <- matrix(rnorm(500), ncol=50, dimnames=list(NULL, tname))
tdata <- data.frame(tmat)
temp1 <- paste( paste(tname, tname, sep='='), collapse=', ')
temp2 <- paste("~1 + cbind(", temp1, ")")