search for: notyetused

Displaying 18 results from an estimated 18 matches for "notyetused".

2001 Jul 20
2
angle/density in barplots/polygon
I'm trying to convert some S-Plus code which generates barplots and other shaded area plots to R. If I specify that I want hatching using the angle and density arguments, the messages 1: argument `density' is not used (yet) in: .NotYetUsed("density", error = FALSE) 2: argument `angle' is not used (yet) in: .NotYetUsed("angle", error = FALSE) so apparently these features have yet to be implemented. Is there a newer version of R in which hatching has been implemented? If not, is there a timetable for implem...
2004 Aug 19
0
suggesting a new feature for unique()
...ted.R Thu Aug 19 14:50:38 2004 *************** *** 34,50 **** ## NB unique.default is used by factor to avoid unique.matrix, ## so it needs to handle some other cases. ! unique.default <- function(x, incomparables = FALSE, ...) { if(!is.logical(incomparables) || incomparables) .NotYetUsed("incomparables != FALSE") z <- .Internal(unique(x)) if(is.factor(x)) ! factor(z, levels = seq(len=nlevels(x)), labels = levels(x), ! ordered = is.ordered(x)) else if(inherits(x, "POSIXct") || inherits(x, "Date")) ! structure...
2007 Nov 02
0
applying duplicated, unique and match to lists?
...os<-match(z,zt); all(sapply(seq(along=pos), function(i)identical(z[i],zt[pos[i]])))}) rm(x) } duplicated.matrix <- duplicated.array <- function (x, incomparables = FALSE, fromLast = FALSE, MARGIN = 1, hashFUN=list, ...) { if (!is.logical(incomparables) || incomparables) .NotYetUsed("incomparables != FALSE") ndim <- length(dim(x)) if (length(MARGIN) > ndim || any(MARGIN > ndim)) stop("MARGIN = ", MARGIN, " is invalid for dim = ", dim(x)) temp <- apply(x, MARGIN, hashFUN) d <- dim(temp) dn <- dimnames(t...
2001 Mar 23
1
order() and na.last
Hello: I'm not sure what is going on in these two statements. the first seems to be right, but the second is a problem: > order(c(3,2,4,NA),na.last=TRUE) [1] 2 1 3 4 > order(c(3,2,4,NA),na.last=FALSE) Error in .NotYetUsed("na.last != TRUE") : argument `na.last != TRUE' is not used (yet) > order(c(3,2,4,NA)) I am using R 1.2.2 under Windows NT. Thanks. Tom -.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.- r-help mailing list -- Read http://www.ci.tuwien.ac.at/~horni...
2001 Sep 08
0
barplot forces xpd=TRUE (PR#1088)
..., horiz = FALSE, col = heat.colors(NR), border = par("fg"), main = NULL, sub = NULL, xlab = NULL, ylab = NULL, ! xlim = NULL, ylim = NULL, xpd = TRUE, axes = TRUE, axisnames = TRUE, inside = TRUE, plot = TRUE, ...) { if (!missing(inside)) .NotYetUsed("inside", error = FALSE) --- 5,11 ---- legend.text = NULL, beside = FALSE, horiz = FALSE, col = heat.colors(NR), border = par("fg"), main = NULL, sub = NULL, xlab = NULL, ylab = NULL, ! xlim = NULL, ylim = NULL, axes = TRUE, a...
2001 Nov 20
2
is match slow?
I'm doing m <- match(matriz, origen, 0) where matriz is a 270x900 matrix and origen a 11675 elements vector, and is taking a very long time. Is match a function implemented in C? If not, would a C code be faster? Thanks Agus Dr. Agustin Lobo Instituto de Ciencias de la Tierra (CSIC) Lluis Sole Sabaris s/n 08028 Barcelona SPAIN tel 34 93409 5410 fax 34 93411 0012 alobo at ija.csic.es
2008 Nov 07
0
barplot can put legend in wrong place, request option to override that (PR#13265)
...xlim = NULL, ylim = NULL, xpd = TRUE, log = "", axes = TRUE, axisnames = TRUE, cex.axis = par("cex.axis"), cex.names = par("cex.axis"), ! inside = TRUE, plot = TRUE, axis.lty = 0, offset = 0, add = FALSE, ...) { if (!missing(inside)) .NotYetUsed("inside", error = FALSE)# -> help(.) --- 25,32 ---- xlim = NULL, ylim = NULL, xpd = TRUE, log = "", axes = TRUE, axisnames = TRUE, cex.axis = par("cex.axis"), cex.names = par("cex.axis"), ! inside = TRUE, plot = TRUE, axis.lty =...
2009 Mar 30
1
duplicated fails to rise correct errors (PR#13632)
Full_Name: Wacek Kusnierczyk Version: 2.8.0 and 2.10.0 r48242 OS: Ubuntu 8.04 Linux 32 bit Submission from: (NULL) (129.241.110.161) In the following code: duplicated(data.frame(), incomparables=NA) # Error in if (!is.logical(incomparables) || incomparables) .NotYetUsed("incomparables != FALSE") : # missing value where TRUE/FALSE needed the raised error is clearly not the one intended to be raised. ?duplicated says: " incomparables: a vector of values that cannot be compared. 'FALSE' is a special value, meaning that all valu...
2004 Dec 13
2
R: functions problem
hi all how can i see the code inside a particular function? i know one can simply type the function, eg ls, but sometimes when this is done one will get "UseMethod("some function name"). (One could also use "body" but i have the same problem in this case. )How does one see the code in this case?
2004 Apr 12
1
question on isoMDS
Hello everyone, I have a question on isoMDS. My data set (of vegetation) with 210 samples is in this way: Rotfoehrenau Lavendelweidenau Silberweidenau .... 067_Breg.7 0 2 0 .... 071_Dona.4 0 2 6 .... ... I want to do an isoMDS-analysis with the dissimilarity index
2004 Sep 17
1
R CMD check does not checks for superfluous documentation (PR#7231)
Hi! Due to package maintenance I have removed some functions but forgot to update the coresponding Rd files. If R CMD check is checking for missing documentation entries why it does not check for documentation entries which tell the user about nonexisting funcitons? In my opinion checking for documentation entries that document non-existing functions is much more important than the other way
2002 Sep 19
0
Barplot() with log axis scaling and other features
...et errors indicating that the function is not in the load table. This would seem to be a cleaner approach at first glance, since it would result in consistent default axis interval behavior when not plotting grid lines. I am open to pointers or other thoughts on this. Finally, there are two .NotYetUsed arguments in barplot(). First is "border", which defaults to par("fg"). I presume that this is simply meant to be the "border" argument to rect()? If so, I can make that change easily. Second is the "inside" argument. If I read the help file correctly,...
2010 Jan 12
1
barplot: border color when stacked
Dear R-users, I am using R version 2.10.1 under windows. In a barplot, I want to mark one of the bars with a special border color. For example: barplot(c(3, 7, 11), border = c(NA, "red", NA)) But how to do this when the bars are stacked? for example: barplot(matrix(1:6, ncol=3)) # border of second bar (i.e. the one with total height = 7) should be red again, I try: barplot(matrix(1:6,
2008 Jun 05
0
bug in barplot.default (graphics) (PR#11585)
...im =3D NUL= L, xpd =3D TRUE, log =3D "", axes =3D TRUE, axisnames =3D TRUE, cex.axis = =3D par("cex.axis"), cex.names =3D par("cex.axis"), inside =3D TRUE, plot =3D TRUE, axis.lty =3D 0, offset =3D 0, add =3D FALSE, ...) { if (!missing(inside)) .NotYetUsed("inside", error =3D FALSE) if (is.null(space)) space <- if (is.matrix(height) && beside) c(0, 1) else 0.2 space <- space * mean(width) if (plot && axisnames && is.null(names.arg)) names.arg <- if (is.matrix(h...
2002 Nov 01
8
R-1.6.1 is released
...() has a new argument `axis.lty', which if set to 1 allows the pre-1.6.0 behaviour of plotting the axis and tick marks for the categorical axis. (This was apparently not intentional, but axis() used to ignore lty=0.) The argument `border' is no longer ".NotYetUsed". BUG FIXES o hist(<datetime>, cex.axis = f) now works for x-axis too. o prompt() gave wrong \usage{.} for long argument default expressions. o summary(x) gives more information when `x' is a logical (or a data frame with a logical column which is now...
2002 Nov 01
8
R-1.6.1 is released
...() has a new argument `axis.lty', which if set to 1 allows the pre-1.6.0 behaviour of plotting the axis and tick marks for the categorical axis. (This was apparently not intentional, but axis() used to ignore lty=0.) The argument `border' is no longer ".NotYetUsed". BUG FIXES o hist(<datetime>, cex.axis = f) now works for x-axis too. o prompt() gave wrong \usage{.} for long argument default expressions. o summary(x) gives more information when `x' is a logical (or a data frame with a logical column which is now...
2006 Jul 27
6
Any interest in "merge" and "by" implementations specifically for sorted data?
Hi Developers, I am looking for another new project to help me get more up to speed on R and to learn something outside of R internals. One recent R issue I have run into is finding a fast implementations of the equivalent to the following SAS code: /* MDPC is an integer sort key made from two integer columns */ MDPC = (MD * 100000) + PCO; /* sort the dataset by the key */ PROC SORT;
2009 Apr 01
0
回复: R-help Digest, Vol 73, Issue 32
...that the parameter 'incomparables' is defunct in duplicated.data.frame, which you can see in its source code (below), or in the following example:     # data as above, or any data frame     duplicated(data, incomparables=NA)     # Error in if (!is.logical(incomparables) || incomparables) .NotYetUsed("incomparables != FALSE") :     #   missing value where TRUE/FALSE needed the error message here is *confusing*.  the error is raised because the author of the code made a mistake and apparently haven't carefully examined and tested his product;  the code goes:     duplicated.data.f...