[Vegan-commits] r1912 - pkg/vegan/R

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Wed Sep 28 17:57:08 CEST 2011


Author: jarioksa
Date: 2011-09-28 17:57:08 +0200 (Wed, 28 Sep 2011)
New Revision: 1912

Modified:
   pkg/vegan/R/print.commsim.R
   pkg/vegan/R/print.nullmodel.R
   pkg/vegan/R/print.oecosimu.R
   pkg/vegan/R/print.simmat.R
Log:
use [sd]Quote()

Modified: pkg/vegan/R/print.commsim.R
===================================================================
--- pkg/vegan/R/print.commsim.R	2011-09-28 15:43:27 UTC (rev 1911)
+++ pkg/vegan/R/print.commsim.R	2011-09-28 15:57:08 UTC (rev 1912)
@@ -1,8 +1,8 @@
 print.commsim <- function(x, ...) {
-    cat("An object of class \"", class(x)[1L] , "\"\n", sep="")
+    cat("An object of class", dQuote(class(x)[1L]), "\n")
     isSeq <- ifelse(x$isSeq, "sequential", "non-sequential")
     binary <- ifelse(x$binary, "binary", "count")
-    cat("\"", x$method, "\" method (", 
+    cat(sQuote(x$method), " method (", 
         binary, ", ", isSeq, ", ", x$mode, " mode)\n\n", sep="")
     invisible(x)
 }

Modified: pkg/vegan/R/print.nullmodel.R
===================================================================
--- pkg/vegan/R/print.nullmodel.R	2011-09-28 15:43:27 UTC (rev 1911)
+++ pkg/vegan/R/print.nullmodel.R	2011-09-28 15:57:08 UTC (rev 1912)
@@ -1,8 +1,8 @@
 print.nullmodel <- function(x, ...) {
     isSeq <- ifelse(x$commsim$isSeq, "sequential", "non-sequential")
     binary <- ifelse(x$commsim$binary, "binary", "count")
-    cat("An object of class \"", class(x)[1L], "\"\n", sep="")
-    cat("\"", x$commsim$method, "\" method (", 
+    cat("An object of class", dQuote(class(x)[1L]), "\n")
+    cat(sQuote(x$commsim$method), " method (", 
         binary, ", ", isSeq, ")\n", sep="")
     cat(x$nrow, "x", x$ncol, "matrix\n")
     if (x$commsim$isSeq)

Modified: pkg/vegan/R/print.oecosimu.R
===================================================================
--- pkg/vegan/R/print.oecosimu.R	2011-09-28 15:43:27 UTC (rev 1911)
+++ pkg/vegan/R/print.oecosimu.R	2011-09-28 15:57:08 UTC (rev 1912)
@@ -3,7 +3,7 @@
 {
     attr(x$oecosimu$method, "permfun") <- NULL
     cat("oecosimu with", ncol(x$oecosimu$simulated), "simulations\n")
-    cat("simulation method", x$oecosimu$method)
+    cat("simulation method", sQuote(x$oecosimu$method))
     if (length(att <- attributes(x$oecosimu$simulated)) > 1) {
         att$dim <- NULL
         cat(" with", paste(names(att), att, collapse=", "))

Modified: pkg/vegan/R/print.simmat.R
===================================================================
--- pkg/vegan/R/print.simmat.R	2011-09-28 15:43:27 UTC (rev 1911)
+++ pkg/vegan/R/print.simmat.R	2011-09-28 15:57:08 UTC (rev 1912)
@@ -2,8 +2,8 @@
     isSeq <- ifelse(attr(x, "isSeq"), "sequential", "non-sequential")
     binary <- ifelse(attr(x, "binary"), "binary", "count")
     d <- dim(x)
-    cat("An object of class \"", class(x)[1L], "\"\n", sep="")
-    cat("\"", attr(x, "method"), "\" method (", 
+    cat("An object of class", dQuote(class(x)[1L]), "\n")
+    cat(sQuote(attr(x, "method")), " method (", 
         binary, ", ", isSeq, ")\n", sep="")
     cat(d[1L], "x", d[2L], "matrix\n")
     cat("Number of permuted matrices =", d[3L], "\n")



More information about the Vegan-commits mailing list