similar to: survival analysis: plot.survfit

Displaying 20 results from an estimated 1000 matches similar to: "survival analysis: plot.survfit"

2002 Jul 30
2
Questions concerning survival analysis
Good morning everyone (or maybe good evening) Is there a counterpart to the s-plus function "probplot" (which provides a qq-plot for "survreg"-objects)? Or do exist other (rather simple) possibilities to check the assumptions of the distribution? I have another question to the author(s) of summary.survreg: Why does summary(...,times=sort(x)) not give the same result as
2006 Mar 16
0
Having trouble with plot.survfit and fun="cloglog"
I'm having trouble getting fun="cloglog" to work with plot on a survfit object. Here are the data I used for the commands that follow. days status 2 0 2 0 5 1 9 0 14 1 16 0 16 0 17 0 29 1 30 0 37 1 37 0 39 1 44 0 44 0 58 0 60 1 67 1 68 1 82 1 82 1 86 0 86 0 89 1 93 0 97 1 100 0 100 0 100 0 > library(survival) Loading required package: splines > eg1.km <-
2009 May 11
1
Warning trying to plot -log(log(survival))
windows xp R 2.8.1 I am trying to plot the -log(log(survival)) to visually test the proportional hazards assumption of a Cox regression. The plot, which should give two lines (one for each treatment) gives only one line and a warning message. I would appreciate help getting two lines, and an explanation of the warning message. My problem may the that I have very few events in one of my strata,
2001 Jun 19
0
Question about command "multicomp"
Dear R-People I did some two way variance analysis and have now the following problem: I''d like to do some multiple Comparisons between different factor levels (two factors, each with some 5 or 6 levels), because there are some significant interactions between these two factors. In S-plus 5, there is the function "multicomp", but in R, there ist no matchable funktion, as far
2006 Apr 18
2
installation of package "randomForest" failed
Hello I'd like to try out some functions in the package randomForest. Therefore, I did install this package. However, it is not possible to load the library, although I have R-Version 2.1.1 (i.e. later than 2.0.0). The commands I used and the Answers/Error from R is as follows: > install.packages("C://Programme//R//rw2011//library//randomForest_4.5-16.zip",
2018 May 20
2
Scale
I would like to get horizontal numbers on the both axes: X and Y. I got horizontal numbers only on the Y axis when adding las=2, How to obtain a horizontal orientation for number on scale also for the X axis (now they are vertical)? Here is my code: plot(survfit(Y~addicts$clinic), fun="cloglog", las=2) [[alternative HTML version deleted]]
2009 Nov 06
1
Survival Plot in R 2.10.0
I would like to produce a complimentary log-log survival plot with only the points appearing on the graph. I am using the code below, taken from the plot.survfit page of help for the the survival package (version 2.35-7). I am running in R 2.10.0 on Windows XP, and the list of packages following the error is loaded. Is there some specific 'type= ' syntax, or an additional parameter that
2009 Aug 21
2
using loglog link in VGAM or creating loglog link for GLM
I am trying to figure out how to apply a loglog link to a binomial model (dichotomous response variable with far more zeros than ones). I am aware that there are several relevant posts on this list, but I am afraid I need a little more help. The two suggested approaches seem to be: 1) modify the make.link function in GLM, or 2) use the loglog or cloglog functions in the VGAM package.
2004 Jun 01
2
GLMM(..., family=binomial(link="cloglog"))?
I'm having trouble using binomial(link="cloglog") with GLMM in lme4, Version: 0.5-2, Date: 2004/03/11. The example in the Help file works fine, even simplified as follows: fm0 <- GLMM(immun~1, data=guImmun, family=binomial, random=~1|comm) However, for another application, I need binomial(link="cloglog"), and this generates an error for me: >
2009 Jan 23
4
glm binomial loglog (NOT cloglog) link
I would like to do an R glm() with family = binomial(link="loglog") Right now, the cloglog link exists, which is nice when the data have a heavy tail to the left. I have the opposite case and the loglog link is what I need. Can someone suggest how to add the loglog link onto glm()? It would be lovely to have it there by default, and it certainly makes sense to have the two opposite
2004 May 29
1
GLMM error in ..1?
I'm trying to use GLMM in library(lme4), R 1.9.0pat, updated just now. I get an error message I can't decipher: library(lme4) set.seed(1) n <- 10 N <- 1000 DF <- data.frame(yield=rbinom(n, N, .99)/N, nest=1:n) fit <- GLMM(yield~1, random=~1|nest, family=binomial, data=DF, weights=rep(N, n)) Error in eval(expr, envir, enclos) : ..1 used in an incorrect
2008 Sep 09
1
Genmod in SAS vs. glm in R
Hello, I have different results from these two softwares for a simple binomial GLM problem. >From Genmod in SAS: LogLikelihood=-4.75, coeff(intercept)=-3.59, coeff(x)=0.95 >From glm in R: LogLikelihood=-0.94, coeff(intercept)=-3.99, coeff(x)=1.36 Is there anyone tell me what I did wrong? Here are the code and results, 1) SAS Genmod: % r: # of failure % k: size of a risk set data
2013 Nov 20
1
Binomial GLM in Stata and R
Hello, I'm not a Stata user so I'm trying to reproduce Stata results that are given to me in R. I would like to use a GLM with a complementary log-log function. The stata code I have is: glm c IndA fia, family(binomial s) link(cloglog) offset(offset) The R code is: glmt <- glm(data=dataset, c ~ IndA + fia, offset = offset, family = binomial(link = cloglog)) Which yields
2000 Jun 08
7
R Equivalent to matlab's find() command?
hi, Just a very simple question: is there an R equivalent to the matlab command find(X) which returns the indices of vector X that store non-zero elements? e.g. > find( [1 0 0 1 0]) ans = 1 4 so, in R, how do I do: ans <- rfind( c(1,0,0,1,0)) so that ans is the vector c(1,4) thanks, stephen -.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.- r-help
2006 Jun 13
1
Slight fault in error messages
Just a quick point which may be easy to correct. Whilst typing the wrong thing into R 2.2.1, I noticed the following error messages, which seem to have some stray quotation marks and commas in the list of available families. Perhaps they have been corrected in the latest version (sorry, I don't want to upgrade yet, but it should be easy to check)? > glm(1 ~ 2,
2007 Oct 29
3
using survfit
hie when i use plot.survfit to plot more than one graph why I only see the last graph how do i see the other graphs.for example n=20 n1=n/2 n2=n/4 a11=4;a12=4 ;a21=4 ;a22=4 t1<-array(1,c(n1)) t2<-array(2,c(n1)) treatgrp=matrix(c(t1,t2))
2001 Dec 18
2
Aranda-Ornaz links for binary data
Hi, I would like apply different link functions from Aranda-Ordaz (1981) family to large binary dataset (n = 2000). The existing links in glm for binomial data (logit, probit, cloglog) are not adequate for my data, and I need to test some other transformations. Is it possible to do this in R? And how? Thank you for your help, /Sharon
2010 Jul 15
1
Standard Error for individual patient survival with survfit and summary.survfit
I am using the coxph, survfit and summary.survfit functions to calculate an estimate of predicted survival with confidence interval for future patients based on the survival distribution of an existing cohort of subjects. I am trying to understand the calculation and interpretation of the std.err and confidence intervals printed by the summary.survfit function. Using the default confidence
2009 Feb 25
3
survival::survfit,plot.survfit
I am confused when trying the function survfit. my question is: what does the survival curve given by plot.survfit mean? is it the survival curve with different covariates at different points? or just the baseline survival curve? for example, I run the following code and get the survival curve #### library(survival) fit<-coxph(Surv(futime,fustat)~resid.ds+rx+ecog.ps,data=ovarian)
2006 May 10
1
Allowed quasibinomial links (PR#8851)
Full_Name: Henric Nilsson Version: 2.3.0 Patched (2006-05-09 r38014) OS: Windows 2000 SP4 Submission from: (NULL) (83.253.9.137) When supplying an unavailable link to `quasibinomial', the error message looks strange. E.g. > quasibinomial("x") Error in quasibinomial("x") : 'x' link not available for quasibinomial family, available links are "logit",