[Vegan-commits] r366 - in branches/1.13: . R inst

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Thu May 22 10:34:05 CEST 2008


Author: jarioksa
Date: 2008-05-22 10:34:05 +0200 (Thu, 22 May 2008)
New Revision: 366

Modified:
   branches/1.13/DESCRIPTION
   branches/1.13/R/factorfit.R
   branches/1.13/R/inertcomp.R
   branches/1.13/R/intersetcor.R
   branches/1.13/R/ordicluster.R
   branches/1.13/R/ordiellipse.R
   branches/1.13/R/ordispider.R
   branches/1.13/R/ordisurf.R
   branches/1.13/R/orglspider.R
   branches/1.13/R/vectorfit.R
   branches/1.13/inst/ChangeLog
   branches/1.13/inst/NEWS
Log:
merged r365 to branches/1.13

Modified: branches/1.13/DESCRIPTION
===================================================================
--- branches/1.13/DESCRIPTION	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/DESCRIPTION	2008-05-22 08:34:05 UTC (rev 366)
@@ -1,7 +1,7 @@
 Package: vegan
 Title: Community Ecology Package
-Version: 1.13-0
-Date: May 21, 2008
+Version: 1.13-1
+Date: May 22, 2008
 Author: Jari Oksanen, Roeland Kindt, Pierre Legendre, Bob O'Hara, Gavin L. Simpson, 
   M. Henry H. Stevens  
 Maintainer: Jari Oksanen <jari.oksanen at oulu.fi>

Modified: branches/1.13/R/factorfit.R
===================================================================
--- branches/1.13/R/factorfit.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/factorfit.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -2,6 +2,7 @@
     function (X, P, permutations = 0, strata, choices = c(1, 2),
               display = c("sites","lc"), w = weights(X),  ...) 
 {
+    weights.default <- function(object, ...) NULL
     display <- match.arg(display)
     w <- eval(w)
     P <- as.data.frame(P)

Modified: branches/1.13/R/inertcomp.R
===================================================================
--- branches/1.13/R/inertcomp.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/inertcomp.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -4,6 +4,8 @@
 {
     display <- match.arg(display)
     statistic <- match.arg(statistic)
+    if (!inherits(object, "cca"))
+        stop("can be used only with objects inheriting from 'cca'")
     if (inherits(object, "capscale") && display == "species")
         stop("cannot analyse species with 'capscale'")
     pCCA <- object$pCCA$Fit

Modified: branches/1.13/R/intersetcor.R
===================================================================
--- branches/1.13/R/intersetcor.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/intersetcor.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -1,5 +1,7 @@
 intersetcor <- function(object) 
 {
+    if (!inherits(object, "cca"))
+        stop("can be used only with objects inheriting from 'cca'")
     w <- weights(object)
     wa <- sweep(object$CCA$wa, 1, sqrt(w), "*")
     cor(qr.X(object$CCA$QR), wa)

Modified: branches/1.13/R/ordicluster.R
===================================================================
--- branches/1.13/R/ordicluster.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/ordicluster.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -2,6 +2,7 @@
     function (ord, cluster, prune=0, display="sites", w = weights(ord, display),
               ...)
 {
+    weights.default <- function(object, ...) NULL
     w <- eval(w)
     mrg <- cluster$merge
     ord <- scores(ord, display = display, ...)

Modified: branches/1.13/R/ordiellipse.R
===================================================================
--- branches/1.13/R/ordiellipse.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/ordiellipse.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -5,6 +5,7 @@
 {
     if (!require(ellipse))
         stop("Requires package `ellipse' (from CRAN)")
+    weights.default <- function(object, ...) NULL
     kind <- match.arg(kind)
     draw <- match.arg(draw)
     pts <- scores(ord, display = display, ...)

Modified: branches/1.13/R/ordispider.R
===================================================================
--- branches/1.13/R/ordispider.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/ordispider.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -2,6 +2,7 @@
     function (ord, groups, display = "sites", w = weights(ord, display),
               show.groups, ...)
 {
+    weights.default <- function(object, ...) NULL
     if (inherits(ord, "cca") && missing(groups)) {
         lc <- scores(ord, display = "lc", ...)
         wa <- scores(ord, display = "wa", ...)

Modified: branches/1.13/R/ordisurf.R
===================================================================
--- branches/1.13/R/ordisurf.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/ordisurf.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -3,6 +3,7 @@
               col = "red", thinplate = TRUE, add = FALSE, display = "sites", 
               w = weights(x), main, nlevels = 10, levels, labcex = 0.6,  ...) 
 {
+    weights.default <- function(object, ...) NULL
     GRID = 25
     w <- eval(w)
     if (!is.null(w) && length(w) == 1) 

Modified: branches/1.13/R/orglspider.R
===================================================================
--- branches/1.13/R/orglspider.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/orglspider.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -2,6 +2,7 @@
     function (object, groups, display = "sites",
               w = weights(object, display), choices = 1:3, ...) 
 {
+    weights.default <- function(object, ...) NULL
     if (inherits(object, "cca") && missing(groups)) {
         lc <- scores(object, display = "lc", choices = choices, ...)
         wa <- scores(object, display = "wa", choices = choices, ...)

Modified: branches/1.13/R/vectorfit.R
===================================================================
--- branches/1.13/R/vectorfit.R	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/R/vectorfit.R	2008-05-22 08:34:05 UTC (rev 366)
@@ -2,6 +2,7 @@
     function (X, P, permutations = 0, strata, choices = c(1, 2), 
               display = c("sites", "lc"), w = weights(X), ...) 
 {
+    weights.default <- function(object, ...) NULL
     display <- match.arg(display)
     w <- eval(w)
     X <- scores(X, display = display, choices, ...)

Modified: branches/1.13/inst/ChangeLog
===================================================================
--- branches/1.13/inst/ChangeLog	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/inst/ChangeLog	2008-05-22 08:34:05 UTC (rev 366)
@@ -2,6 +2,11 @@
 
 VEGAN DEVEL VERSIONS at http://r-forge.r-project.org/
 
+Version 1.13-1 (opened May 22, 2008)
+
+	* merged r365: workaround to failure of weights.default in R 2.7.0
+	when object had no weights.
+	
 Version 1.13-0 (released May 21, 2008) 
 
 	* Branched version 1.12-15 (rev 354) for a new release.

Modified: branches/1.13/inst/NEWS
===================================================================
--- branches/1.13/inst/NEWS	2008-05-22 08:21:30 UTC (rev 365)
+++ branches/1.13/inst/NEWS	2008-05-22 08:34:05 UTC (rev 366)
@@ -3,6 +3,20 @@
 			VEGAN RELEASE VERSIONS 
 		       	======================
 
+		       CHANGES IN VEGAN 1.13-1
+
+    - ordicluster, ordiellipse, ordispider, orglspider, ordisurf,
+      factorfit and vectorfit could fails with non-vegan ordination
+      objects in R 2.7.2 whose weights.default function gave error if
+      object had no weights (used to return NULL in R 2.6.2 and
+      earlier). 
+
+    - intersetcor and inertcomp now check that input really is from
+      constrained ordination instead of giving obscure error
+      messages. 
+
+		       CHANGES IN VEGAN 1.13-0
+
 GENERAL
 
     - Based on development version 1.12-15 (revision 354 at



More information about the Vegan-commits mailing list