[Gsdesign-commits] r237 - in pkg: gsDesign/R gsDesignGUIReview/osx

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Tue Dec 22 01:40:02 CET 2009


Author: keaven
Date: 2009-12-22 01:40:02 +0100 (Tue, 22 Dec 2009)
New Revision: 237

Modified:
   pkg/gsDesign/R/gsMethods.R
   pkg/gsDesign/R/gsqplot.R
   pkg/gsDesignGUIReview/osx/gsDesign_2.2-1.tar.gz
   pkg/gsDesignGUIReview/osx/gsDesign_2.2-1.zip
Log:
Plotting bug with xlab

Modified: pkg/gsDesign/R/gsMethods.R
===================================================================
--- pkg/gsDesign/R/gsMethods.R	2009-12-21 23:17:57 UTC (rev 236)
+++ pkg/gsDesign/R/gsMethods.R	2009-12-22 00:40:02 UTC (rev 237)
@@ -270,7 +270,7 @@
 	if (x$ratio==1) cat("Equal randomization:          ratio=1\n")
 	else cat("Randomization (Exp/Control):  ratio=", x$ratio, "\n", sep="")
 	if (x$type=="rr"){
-		cat("Sample size based on hazard ratio=", round(x$lambda2/x$lambda1,3), ' (type="rr")\n',sep="") 
+		cat("Sample size based on hazard ratio=", round(x$lambda2/x$lambda1,3), ' (type="rr")\n', sep="") 
   	}else{
 		cat('Sample size based on risk difference=', round(x$lambda1 - x$lambda2,3), ' (type="rd")\n', sep="")
 		if (x$approx) cat("Sample size based on H1 variance only:  approx=TRUE\n")

Modified: pkg/gsDesign/R/gsqplot.R
===================================================================
--- pkg/gsDesign/R/gsqplot.R	2009-12-21 23:17:57 UTC (rev 236)
+++ pkg/gsDesign/R/gsqplot.R	2009-12-22 00:40:02 UTC (rev 237)
@@ -93,7 +93,7 @@
 }
 # qplots for z-values and transforms of z-values
 "qplotit" <- function(x, xlim=NULL, ylim=NULL, geom=c("line", "text"), zround=2, lty=c(1,1), col=c(1,1),
-                     lwd=c(1,1), nlabel="TRUE", xlab="", ylab="", fn=function(z,i,x,...){z},
+                     lwd=c(1,1), nlabel="TRUE", xlab=NULL, ylab=NULL, fn=function(z,i,x,...){z},
                      ratio=1, delta0=0, delta=.05, cex=1, base=FALSE,...)
 {  lty <- lty * c(1,1)
    col <- col * c(1,1)
@@ -101,11 +101,11 @@
    if(x$n.I[x$k] < 3) 
    {   nround <- 3 
        ntx <- "r="
-       if (xlab=="") xlab <- "Information relative to fixed sample design"
+       if (is.null(xlab)) xlab <- "Information relative to fixed sample design"
    } else 
    {   nround <- 0
        ntx <- "n="
-       if (xlab=="") xlab <- "N"
+       if (is.null(xlab)) xlab <- "N"
    }
    z <- fn(z=c(x$upper$bound,x$lower$bound), i=c(1:x$k, 1:x$k), x=x,
                ratio=ratio, delta0=delta0, delta=delta)
@@ -180,11 +180,11 @@
 	if(x$n.I[x$k] < 3) 
 	{	nround <- 3 
 		ntx <- "r="
-		if (xlab=="") xlab <- "Information relative to fixed sample design"
+		if (is.null(xlab)) xlab <- "Information relative to fixed sample design"
 	}else 
 	{	nround <- 0
 		ntx <- "n="
-		if (xlab=="") xlab <- "N"
+		if (is.null(xlab)) xlab <- "N"
 	}
 	test.type <- ifelse(is(x,"gsProbability"), 3, x$test.type)    
 	y <- gsBoundCP(x, theta=theta)
@@ -319,7 +319,7 @@
 		{	legend(x=c(.0, .43), y=x$alpha * c(.85, 1), lty=lty, col=col, lwd=lwd, legend=legtext)
 			par(new=TRUE)
 			plot(t, x$lower$sf(x$beta, t, x$lower$param)$spend,
-					ylim=c(0, x$beta), type="l", ylab="", main="",
+					ylim=c(0, x$beta), type="l", ylab=NULL, main=NULL,
 					yaxt="n", xlab=xlab, lty=lty[2], lwd=lwd[2], col=col[2],...)
 			axis(4)
 			mtext(text=ylab2,  side = 4, outer=TRUE)

Modified: pkg/gsDesignGUIReview/osx/gsDesign_2.2-1.tar.gz
===================================================================
(Binary files differ)

Modified: pkg/gsDesignGUIReview/osx/gsDesign_2.2-1.zip
===================================================================
(Binary files differ)



More information about the Gsdesign-commits mailing list