similar to: conflicts Var names

Displaying 20 results from an estimated 40000 matches similar to: "conflicts Var names"

2003 Apr 22
2
Handling of upper/lowercase in package names (PR#2816)
Hi, This is (presumably?) a bug in R 1.7.0 under Windows. I have not tested it on other systems. Attachment of packages is case sensitive but not library(), resulting in multiple loadings of the same package if the library name is spelled differently. The following example loads the `tools' package, once as `tools' and once as `Tools'. This behavior is the same with all packages and
2006 Apr 11
1
Time Series information in formulae
Dear List The UKgas data is stored as an object of class 'ts'. I am trying to use "UKgas" in a formula as argument to a function. However, I do not know how to access the 'time series' information in the response (such as start() end() etc.). Here is a boiled down example. ssm <- function(formula, data = list(),subset=NULL) { cl <- match.call() if
2003 Jul 11
1
getAnyhwhere behavior
I would have expected the function getAnywhere to have behaved differently in the following: > search() [1] ".GlobalEnv" "file:C:/R/Rdata/miya/.Rdata" [3] "package:boot" "package:methods" [5] "package:ctest" "package:mva" [7] "package:modreg"
2003 Sep 30
2
dump/source problem with hclust object (PR#4361)
library(mva) data(USArrests) hc <- hclust(dist(USArrests), "ave") plot(hc) # OK dump(c("hc"), "tst") rm(hc) source("tst") plot(hc) # Error in plot.hclust(hc) : invalid dendrogram input The same problem occurs with dput/dget --please do not edit the information below-- Version: platform =
2005 Apr 04
4
acf segfault (PR#7771)
Test case: z <- ts(matrix(rnorm(200),10,20), start=c(1961,1)) acf(z,lag.max=1) This segfaults for me. Maybe it shouldn't? cheers dave --please do not edit the information below-- Version: platform = i386-pc-linux-gnu arch = i386 os = linux-gnu system = i386, linux-gnu status = major = 2 minor = 0.1 year = 2004 month = 11 day = 15 language = R Search Path: .GlobalEnv,
2003 Jul 29
1
OpenBSD-alpha and R-1.7.1 problem
I'm trying to get R running on OpenBSD/alpha. I've applied some configure patches which I've previously sent to the R-devel list to allow R to compile on an OpenBSD ELF platform (which OpenBSD/alpha is, as the i386 port soon will be). The patched source compiles without problems, and appears to run and perform properly apart from two (possibly unrelated) problems. 1) On startup
2003 Jun 12
3
defaults in R: packages, .Rhistory
With the current version (rw1070), every time I start R it loads a whole bunch of packages, many of which I do not need in a typical session: > search() [1] ".GlobalEnv" "package:methods" "package:ctest" "package:mva" [5] "package:modreg" "package:nls" "package:ts" "Autoloads" [9]
2006 Apr 09
2
type converters not being saved to workspace
Any one can explain why this happens or any work arounds? > setClass('foo') [1] "foo" > setAs('foo', 'character', function(from) from) > showMethods('coerce') Function "coerce": from = "ANY", to = "array" from = "ANY", to = "call" from = "ANY", to = "character" from =
2006 Apr 09
2
type converters not being saved to workspace
Any one can explain why this happens or any work arounds? > setClass('foo') [1] "foo" > setAs('foo', 'character', function(from) from) > showMethods('coerce') Function "coerce": from = "ANY", to = "array" from = "ANY", to = "call" from = "ANY", to = "character" from =
2008 May 04
1
S4 / S3 / Sweave problem
I'm not sure if this as a bug or something I am doing wrong. It occurs in both 2.7.0 and 2.6.2. require("methods") setClassUnion("OptionalPOSIXct", c("POSIXct", "NULL")) setClass("TSmetax", representation(serIDs="character", ExtractionDate="OptionalPOSIXct" )) setGeneric("TSmetax", def= function(x,
2003 Mar 12
1
cex.axis in boxplot (PR#2628)
Hi, the graphical parameter "cex.axis" does not have any affect for "boxplot": data(iris) boxplot(iris[,1:4], ylab="y", cex.lab=2, cex.axis=2) The patch is simply adding "cex.axis" to the search for axis relevant parameters in "bxp": ax.pars <- pars[names(pars) %in% c("xaxt", "yaxt", "las",
2003 Apr 28
1
ylab in time series plot (PR#2869)
You get a warning message when you specify a ylab parameter while plotting data whose x's are POSIXct values. Apparently the `axis.POSIXct' method tries to reset the ylab---via the ... parameter---after it has already been set by higher level methods. Here is a function that illustrates the problem. ylabProblem <- function() { x <- ISOdate(2003, 4, 1:10) # POSIXct
2003 Dec 18
1
qbinom when probability is 1 (PR#5900)
Full_Name: Jonathan Swinton Version: 1.8.0 OS: Windows 2000 Submission from: (NULL) (193.132.159.34) Calling qbinom with a sample probability of 1 returns NaN > qbinom(p=0.95,size=10,prob=1) [1] NaN I believe that this is wrong and that qbinom(p,size,prob=1) should always be size for 0<p<=1. The documentation says that The quantile is defined as the smallest value x such that F(x)
2003 Oct 13
2
Infinite recursion in getGeneric (PR#4561)
> setClass('foo') [1] "foo" > setMethod('is.logical', 'foo', function(x) TRUE) [1] "is.logical" > getGeneric('is.integer') Error in options(x) : evaluation is nested too deeply: infinite recursion? > --please do not edit the information below-- Version: platform = i686-pc-linux-gnu arch = i686 os = linux-gnu system =
2004 Jan 22
1
Bug in termplot?
Hi, Is this a bug in termplot, or (once again) do I just not understand what R is really doing? I am using termplot to contruct partial residual plots, 1. For all terms at once 2. One term at a time but I get different results from these two methods. To give a concrete example, I would have thought the top and bottom rows of the plot constructed with the following code would be identical.
2003 May 30
1
power.t.test needs to check delta==NULL before abs(delta) (PR#3139)
Something like the following should be done for power.t.test to make sure that it doesn't try to evaluate abs(NULL), which results in an error. --- rossini.power.t.test.R 2003-05-30 07:24:49.000000000 -0700 +++ rossini.power.t.test.R.~1~ 2003-05-30 08:47:09.000000000 -0700 @@ -10,7 +10,7 @@ alternative <- match.arg(alternative) tsample <- switch(type, one.sample = 1,
2003 Oct 31
1
solve.Matrix() not found (PR#4887)
# Your mailer is set to "none" (default on Windows), # hence we cannot send the bug report directly from R. # Please copy the bug report (after finishing it) to # your favorite email program and send it to # # r-bugs@r-project.org # ###################################################### Dear R developers, this morning I started experiencing a bizarre problem with the
1999 Dec 16
1
aggregate.ts (PR#376)
I'm having some problems with aggregate.ts, e.g. R> x <- ts(1:20) R> frequency(x) [1] 1 R> aggregate(x, nfreq=1/3) Error in aggregate.ts(x, nfreq = 1/3) : cannot change frequency from 1 to 0.333333333333333 In fact aggregate.ts only accepts a new frequency that is a negative power of two in this example. The problem with the current test for compatible frequencies if
2003 Nov 03
2
Odd r-squared
Hi, I would consider the calculation of r-squared in the following to be a bug, but then, I've been wrong before. It seems that R looks to see if the model contains an intercept term, and if it does not, computes r-squared in a way I don't understand. To my mind, the following are two alternative parametrizations of the same model, and should yield the same r-squared. Any insight much
2002 Aug 15
1
order(1, na.last=NA) fails (PR#1913)
R> order(1, na.last=NA) Error in apply(sapply(z, is.na), 1, any) : dim(X) must have a positive length This bug appears unrelated to PR#1906, and so the fix of 8/15 doesn't help. It comes from the line inside order(): ok <- !apply(sapply(z, is.na), 1, any) where z=list(1) in my example. sapply() returns a single-element vector, not a matrix, making apply() unhappy. This might