s some built in support.
>
> Hadley
>
>
> On Friday, March 17, 2017, Michael Lawrence
> wrote:
>>
>> Interesting idea. Lazy and non-standard evaluation is going to happen; the
>> language needs a way to contain it.
>>
>> I'll extend the proposal so t
There is a difference between the symbol and the function (primitive
or closure) to which it is bound.
This:
mc2 <- as.call(list(`[`,iris,2,"Species"))
Evaluates `[` to its value, in this case the primitive object, and the
primitive itself is incorporated into the returned call.
If you were to d
I think this is a known issue with Java messing with the stack, see
e.g.
http://r.789695.n4.nabble.com/Error-memory-exhausted-limit-reached-td4729708.html.
I'll fix the infinite recursion caused by the methods package.
Michael
On Wed, Apr 19, 2017 at 1:12 AM, Wolfgang Huber wrote:
> Dear Hilma
Thanks for pointing out these issues. I have a fix that I will commit soon.
Btw, I would never have seen the post on Stack Overflow. It's best to
report bugs on the bugzilla.
Michael
On Thu, Apr 20, 2017 at 8:30 AM, Andrzej Oleś wrote:
> Hi all,
>
> I recently encountered some unexpected behavi
in print(a) : object 'b' not found
>
>
> Any chances of fixing this?
>
> Cheers,
> Andrzej
>
>
>
> On Fri, Apr 21, 2017 at 11:40 AM, Andrzej Oleś
> wrote:
>>
>> Great, thanks Michael for you quick response!
>>
>> I started off with a
The result of match.call() should be something that would evaluate
correctly in the frame of the fun0() call. While wrapping things in
parentheses is unlikely to cause any problems, arbitrary calls and
symbols would.
Consider the following:
fun0 <- function(a, ...) {
x <- 2L
fun1(...)
}
f
Thanks for the report. The issue is that one cannot set special attributes
like names, dim, dimnames, etc on S4 objects. I was aready working on this
and will have a fix soon.
> a2 <- new("A2")
> dim(a2) <- c(2, 3)
Error in dim(a2) <- c(2, 3) : invalid first argument
On Mon, Jun 5, 2017 at 6:08
I've fixed this and will commit soon.
Disregard my dim<-() example; that behaves as expected (the class needs a
dim<-() method).
Michael
On Tue, Jun 6, 2017 at 5:16 AM, Michael Lawrence wrote:
> Thanks for the report. The issue is that one cannot set special attributes
>
To do this in C, it would probably be easier and faster to just do the
string manipulation directly. Luckily, there are already packages that
have done this for you. See an example below using the S4Vectors
package.
foo2 <- function(mymat, colnms, tilde=FALSE) {
chars <- colnms[col(mymat)]
gt; wrote:
>>
>> You're right, I must have mixed up my R versions when running the example,
>> as the problem seems to be resolved in R-devel.
>>
>> Sorry for the noise and thanks again for fixing this.
>>
>> Andrzej
>>
>> On Tue, Apr 25,
; setGeneric("f", signature = "...")
>
> # unexpectedly fails to find 'b'
> f()
> ## Error in print(a) : object 'b' not found
>
>
> On Fri, Jul 28, 2017 at 9:15 PM, Michael Lawrence <
> lawrence.mich...@gene.com> wro
The %*% function is a primitive. As it says in the documentation under
?Methods_Details
Methods may be defined for most primitives, and corresponding
metadata objects will be created to store them. Calls to the
primitive still go directly to the C code, which will sometimes
che
On Fri, Sep 22, 2017 at 10:28 AM, Iñaki Úcar wrote:
> 2017-09-22 19:04 GMT+02:00 Michael Lawrence :
>> The %*% function is a primitive. As it says in the documentation under
>> ?Methods_Details
>>
>> Methods may be defined for most primitives, and corresponding
&g
On Wed, Oct 23, 2013 at 8:33 PM, Kasper Daniel Hansen <
kasperdanielhan...@gmail.com> wrote:
> This is about the new note
>
> Depends: includes the non-default packages:
> BiocGenerics Biobase lattice reshape GenomicRanges
> Biostrings bumphunter
> Adding so many packages to the
Hi all,
It seems that there is a use case for obtaining the environment for the
"top" promise. By "top", I mean following the promise chain up the call
stack until hitting a non-promise.
S4 data containers often mimic the API of base R data structures. This
means writing S4 methods for functions
The BiocGenerics package was designed to solve this issue within
Bioconductor. It wouldn't be the worst thing in the world to depend on the
simple BiocGenerics package for now, but ideally the base generics would be
defined higher up, perhaps in the methods package itself. Maybe someone
else has a
ough it
> wouldn't help (as it shouldn't) if the two generics didn't agree on
> signature or both carried methods for the same class signature.
>
> ~G
>
>
> On Wed, Mar 26, 2014 at 4:38 AM, Michael Lawrence <
> lawrence.mich...@gene.com> wrote:
>
>&
On Thu, Apr 3, 2014 at 4:33 AM, Ulrich Bodenhofer
wrote:
> On 03/27/2014 06:31 PM, Hervé Pagès wrote:
>
>> On 03/27/2014 02:13 AM, Ulrich Bodenhofer wrote:
>>
>>> [...]
>>>
>>>
>>> For the time being, it seems I have three options:
>>>
>>> 1) not supplying the sort() function yet (it is not yet in
This went off-list, but a patch has been submitted to fix the issue.
On Mon, Apr 14, 2014 at 4:12 AM, Scott Kostyshak wrote:
> Below is an example of output that changed as a result of r64970. I
> did not see any NEWS item suggesting this change is expected.
>
> Note that the example is contrive
This is because R keeps track of the names of an object, until there are 2
names. Thus, once it reaches 2, it can no longer decrement the named count.
In this example, 'a' reaches 2 names ('a' and 'b'), thus R does not know
that 'a' only has one name at the end.
Luke has added reference counting t
While the change to the symbol lookup is generally useful (e.g., for
finding S4 methods that become available whenever a package is loaded), it
seems that we ultimately want a mechanism by which a package namespace can
formally declare that it is re-exporting a symbol from some package. Then,
for e
06/2014, 3:07 PM, Michael Lawrence wrote:
> > While the change to the symbol lookup is generally useful (e.g., for
> > finding S4 methods that become available whenever a package is loaded),
> > it seems that we ultimately want a mechanism by which a package
> > namespace can fo
On Mon, Jun 30, 2014 at 6:19 AM, Duncan Murdoch
wrote:
> On 30/06/2014 8:51 AM, Michael Lawrence wrote:
>
>> I think it's generally nice to be able to compute on the network of
>> imported and exported symbols, and exportFrom() preserves the information
>> that a s
You might be interested in the BiocGenerics package from Bioconductor. It
defines a bunch of "base" generics, as well as some that are specific to
Bioc needs. Being Bioc-oriented, it's not really meant to be a base4, but
it comes reasonably close, and it could serve as a jumping off point for a
bas
One idea is to wrap system libraries in R packages. This is what Martin did
for zlib with zlibbioc. That's feasible for a tiny library like zlib; for
other things this approach would not be feasible. For imlib2 and
imagemagick, it might be. Someone has to maintain it, and there would need
to be car
I would recommend against maintaining multiple global variables and would
instead take an object-oriented approach. Probably should define a
reference class representing a random number stream (think
java.util.Random). Then define a reference class representing a collection
of them, tracking which
On Sun, Nov 9, 2014 at 8:24 AM, Steven Sagaert
wrote:
> Hi,
> I’ve been using R on and off for a couple of years. I think R is pretty
> great but one thing I’d like to see improved is the way packages are
> organised. Instead of CRAN being a long list of packages having a short &
> usually uninte
On Thu, Nov 27, 2014 at 6:53 PM, Janko Thyson
wrote:
> Well, the benefit lies in the ability to pass along arguments via `...` to
> more than one recipient that use *identical argument names* and/or when
> these recipients are not necessarily located on the same calling stack
> layer.
>
> I'm *no
If we do add an argument to get(), then it should be named consistently
with the ifnotfound argument of mget(). As mentioned, the possibility of a
NULL value is problematic. One solution is a sentinel value that indicates
an unbound value (like R_UnboundValue).
But another idea (and one pretty sim
On Thu, Jan 8, 2015 at 11:57 AM, wrote:
> On Thu, 8 Jan 2015, Michael Lawrence wrote:
>
> If we do add an argument to get(), then it should be named consistently
>> with the ifnotfound argument of mget(). As mentioned, the possibility of a
>> NULL value is problemat
Currently unique() does duplicated() internally and then extracts. One
could make a countUnique that simply counts, rather than allocate the
logical return value of duplicated(). But so much of the cost is in the
hash operation that it probably won't help much, but that might depend on
the sizes of
Just wanted to start a discussion on whether R could ship with more
appropriate GC parameters. Right now, loading the recommended package
Matrix leads to:
> library(Matrix)
> gc()
used (Mb) gc trigger (Mb) max used (Mb)
Ncells 1076796 57.61368491 73.1 1198505 64.1
Vcells 1671329 12.
Note that setMethod() resolves .BasicFunsList in the methods namespace
directly when setting a method on a primitive. Somehow there should be
consistency between genericForPrimitive() and the check in setMethod().
Also, we can probably step away from the use of elNamed(), given that [[
now uses ex
)
>
> stop(gettextf("methods may not be defined for primitive function %s
> in this version of R",
>
> sQuote(f)),
>
> domain = NA)
>
> ans
>
> }
>
> Seems to work just fine.
>
> Yes, "el"
Actually, after reading the comment about it being OK for it being
NULL, it's not a bug after all.
On Thu, Jan 22, 2015 at 5:57 AM, Michael Lawrence wrote:
> I also just noticed that there is a bug: identical(ans, FALSE) should
> be is.null(ans).
>
> So no error is t
On Thu, Jan 22, 2015 at 11:44 AM, wrote:
>
> For default methods there ought to be a way to create those so the
> default method is computed at creation or load time and stored in an
> environment.
We had considered that, but we thought the definition of the function
would be easier to interpret
On Fri, Jan 23, 2015 at 10:11 AM, Hervé Pagès wrote:
> Hi,
>
> On 01/23/2015 07:01 AM, luke-tier...@uiowa.edu wrote:
>>
>> On Thu, 22 Jan 2015, Michael Lawrence wrote:
>>
>>> On Thu, Jan 22, 2015 at 11:44 AM, wrote:
>>>>
>>>>
>>
On Sat, Jan 24, 2015 at 12:58 AM, Mario Annau wrote:
> Hi all,
> this question has already been posted on stackoverflow, however without
> success, see also
> http://stackoverflow.com/questions/27886535/proper-way-to-use-cbind-rbind-with-s4-classes-in-package.
>
> I have written a package using S4
A isNamespaceLoaded() function would be a useful thing to have in
general if we are interested in readable code. An efficient
implementation would be just a bonus.
On Mon, Jan 26, 2015 at 3:36 AM, Martin Maechler
wrote:
>> Winston Chang
>> on Fri, 23 Jan 2015 10:15:53 -0600 writes:
isLoadedNamespace() sounds fine to me..
Thanks for addressing this,
Michael
On Mon, Jan 26, 2015 at 5:51 AM, Martin Maechler <
maech...@lynne.stat.math.ethz.ch> wrote:
> >>>>> Michael Lawrence
> >>>>> on Mon, 26 Jan 2015 05:12:55 -0800 writes:
>
I think ls(, sort=FALSE) would be more explicit and thus clearer. There is
much precedent for having arguments that request less work to be done e.g.
unlist(use.names=FALSE). Yes, the extra typing is a bit painful, but there
is no intuitive reason why names() would be unsorted, while ls() would be
Pete
>
> ________
> Peter M. Haverty, Ph.D.
> Genentech, Inc.
> phave...@gene.com
>
>
> On Tue, Jan 27, 2015 at 7:26 AM, Michael Lawrence
> wrote:
> > I think ls(, sort=FALSE) would be more explicit and thus clearer. There
> is
> > much preced
Would you please clarify your exact use case?
Thanks,
Michael
On Wed, Jan 28, 2015 at 9:02 AM, Roebuck,Paul L
wrote:
> Interrogating some (of my own) code in another package.
>
> >norm.meth <- getMethod("normalize", "MatrixLike")
> >message("str(norm.meth)")
> >str(norm.meth)
>
> >message("show
;vs", "tukey"),
> "calc.medians": TRUE,
> "sweep.cols": calc.medians,
> "recalc.after.sweep": sweep.cols,
> "Š"
> }
>
> not those of the generic:
>
> {
> "object",
> "
On Thu, Jan 29, 2015 at 5:51 AM, Martin Maechler <
maech...@lynne.stat.math.ethz.ch> wrote:
> >>>>> Michael Lawrence
> >>>>> on Tue, 27 Jan 2015 07:59:59 -0800 writes:
>
> > Since the contract of ls() is to sort, there is nothing wrong
On Thu, Jan 29, 2015 at 5:57 AM, John Chambers wrote:
>
> On Jan 28, 2015, at 6:37 PM, Michael Lawrence
> wrote:
>
> At this point I would just due:
>
> formals(body(method)[[2L]])
>
> At some point we need to figure out what to do with this .local()
> confusion.
("x > 3: .QQQ.integer(x, ...) at #5
> > 2: QQQ(3L, 10)
> > 1: QQQ(3L, 10)
> > I think the latter gives the user more guidance on how to fix the
> problem.
> >
> > Perhaps instead of searching for an assignment to '.local' you could
> >
ispatch to
cbind.data.frame if one of the args is a data.frame). There may no longer
be a need for cBind() and rBind().
Michael
On Mon, Jan 26, 2015 at 3:55 AM, Martin Maechler <
maech...@lynne.stat.math.ethz.ch> wrote:
> >>>>> Michael Lawrence
> >>>>> on
gt; for my test cases?
> best,
> mario
>
>
> Am 02/02/15 um 12:32 schrieb Martin Maechler:
> >>>>>> Michael Lawrence
> >>>>>> on Sun, 1 Feb 2015 19:23:06 -0800 writes:
> >
> > > I've implemented the proposed changes in
>
Presumably one could stream over the data twice, the first to get the size,
without storing the data. Slower but more memory efficient, unless I'm
missing something.
Michael
On Tue, Mar 17, 2015 at 2:03 PM, Simon Urbanek
wrote:
> Jorge,
>
> what you propose is not possible because the size of t
There is no important difference between transform() and within(). They
have the same pitfalls. If your general code is unable to guarantee the
scope of the symbol resolution, the behavior of the code is unlikely to be
very predictable.
I've explored some solutions in the S4Vectors package, see th
I would argue that it should be:
first <- function(x, ...) head(x, n=1L, ...)
So it's simpler and we don't have people using first() and head()
interchangeably for non-default 'n'. first() should mean "the" first. That
also avoids forcing 'n' to be in the formals of every generic+method. Of
cours
There are too many arguments in the signature of the my_inla generic. The
signature defaults to every argument in the formals, which are probably
already over-specified. Typically, one defines a generic with the formals
(x, ...), or perhaps in this case (x, model, ...), but more on that below
Unre
I'm guessing you just need to define them in /R/constants.R and then
export() them from the NAMESPACE.
On Fri, May 15, 2015 at 2:32 AM, Christophe Genolini
wrote:
> Hi all,
>
> In my package, I define some constant. In the previous version of R, I
> just define then in "/data/constants.R" but it
The url() function does not seem to decode a URL, at least when creating
local files. For example, if "%20" is used instead of " ", the "%20" will
be included verbatim in the file name. In my opinion, it should perform
the replacement, i.e., the equivalent of URLdecode(). And really, it should
thr
I guess what it boils down to is whether it makes sense for PkgB to have
exportMethods(unique) when PkgB does not export(unique) or have PkgA in
Depends. And whether it makes sense for PkgC to have
importMethodsFrom(PkgB, unique) without importFrom(PkgA, unique). If it is
not feasible/sensible to
Hi,
I've noticed an issue with S4 methods and namespaces which only arises in
particular, difficult to reproduce configurations. One example is the ggbio
package in Bioconductor, which currently emits these warnings when its
namespace is loaded:
--
library(ggbio)
Loading requ
You might be able to take advantage of the ObjectTable support in C, which
is part of R, see R_ext/Callbacks.h.
Michael
On Thu, Jul 19, 2012 at 10:30 AM, Jeroen Ooms wrote:
> I was wondering if anyone knows more about the state of RObjectTables. This
> largely undocumented functionality was intr
There seems to be an issue with passing "..." to callGeneric(), because it
assumes that the call can be evaluated in the parent frame. Due to lazy
evaluation, that is often not going to work for arguments that are simply
passed down via "...".
Here is an example:
setClass("A", contains = "charact
Luke,
Please keep me advised on this, because the Qt interfaces heavily rely on
the ObjectTables (btw, it has worked great for my use cases).
Michael
On Fri, Jul 20, 2012 at 7:32 AM, wrote:
> I believe everyone who has worked on the relevant files has tried to
> maintain this functionality, bu
I've found that reference class objects tend to behave like plain old
environments wrt field access, unless a method on e.g. $<- is explicitly
defined.
Here is a code snippet:
library(methods)
Foo <- setRefClass("Foo")
foo <- Foo$new()
foo$a <- 2 # why does this succeed? not a valid field!
## se
It seems that there is an issue when calling callNextMethod() inside a
method without "..." in its formals but defined on a generic WITH "..." in
its formals. Whenever that method is called with an argument that is not
explicitly named in the generic formals, we get the following error:
setClass("
On Mon, Jan 7, 2013 at 3:23 PM, Chris Jewell wrote:
> Hi All,
>
> I'm currently trying to write an S4 class that mimics a data.frame, but
> stores data on disc in HDF5 format. The idea is that the dataset is likely
> to be too large to fit into a standard desktop machine, and by using
> subscript
It's tough to reliably reproduce, but I often get stack imbalance warnings
when calling max.col() on non-real/double matrix. The code is conditionally
PROTECTing but not incrementing its nprot counter for the eventual
UNPROTECT. Pretty sure this would fix (but I haven't tested it):
Index: array.c
On Thu, Nov 5, 2009 at 9:58 AM, Romain Francois
wrote:
> Hello,
>
> Is it possible to have the effect of UserDefinedDatabase outside of
> "attached" environments ? Can I disguise an environment of the sys.frames()
> as a UserDefinedDatabase ?
>
> This seems to suggest that it might be possible :
>
On Thu, Nov 19, 2009 at 10:54 AM, Romain Francois <
romain.franc...@dbmail.com> wrote:
> On 11/19/2009 06:14 PM, Michael Lawrence wrote:
>
>>
>>
>> On Thu, Nov 5, 2009 at 9:58 AM, Romain Francois
>> mailto:romain.franc...@dbmail.com>> wrote:
>>
On Wed, Dec 2, 2009 at 11:11 PM, Romain Francois wrote:
> On 12/03/2009 12:17 AM, Michael Lawrence wrote:
>
>>
>>
>> On Thu, Nov 19, 2009 at 10:54 AM, Romain Francois
>> mailto:romain.franc...@dbmail.com>> wrote:
>>
>>On 11/19/2009 06:14 PM, M
On Mon, Dec 14, 2009 at 11:36 PM, Romain Francois <
romain.franc...@dbmail.com> wrote:
> Hello,
>
> I'm trying to get S4 dispatch on S3 "connection" objects.
>
> So I do :
>
> setOldClass( "connection" )
>
> and then :
>
> setGeneric( "bling", function(object) standardGeneric( "bling" ) )
> setMet
The cairoDevice package supports getGraphicsEvent(), and seems to work on
all platforms now.
Michael
On Mon, Apr 5, 2010 at 5:24 AM, Christophe Genolini
wrote:
> Hi the list,
> I am using getGraphicsEvent (pakage kml, function 'choice') to build a user
> friendly interface, but it seems that it
Hi,
Is there any good reason not to allow radix sorting via order() over the
entire range of R (32bit) integers, instead of setting a hard limit at
100,000? Many machines have plenty of memory to support this. Seems like it
is just a matter of dynamic allocating the bucket array instead of the
cur
The following is a patch (svn diff) for the R CMD build script that
calculates exclude patterns after the tar/untar step rather than before. The
perl find() function, used in the calculation of the exclude patterns,
ignores symlinks, which meant that directory symlinks were not considered
for exclu
On 10/28/07, Prof Brian Ripley <[EMAIL PROTECTED]> wrote:
>
> The error is:
>
> > Exception in thread "main" java.lang.UnsatisfiedLinkError: no SJava in
> > java.library.path
It sounds like you need to put the directory containing the dll's included
with the SJava package on your java.library.pat
This is likely a result of RGtk2 "piggybacking" on the tcl/tk event loop on
Windows. One workaround in your situation is run gtkMain() at the R console
to force the GTK+ event loop to run. The downside is that the R console will
no longer be responsive. It's tough to keep so many interfaces workin
On Feb 7, 2008 4:49 PM, Mark W Kimpel <[EMAIL PROTECTED]> wrote:
> I'm doing some work on a potential patch to the Bioconductor package
> Rgraphviz and have some questions on code that is contained in engine.c.
> In particular, I am developing some custom shapes using polygon and need
> to make su
Hi,
This is likely an issue with the event loop. If you move your mouse around,
does the image update? Does it animate if you run gtkMain() in the console?
Thanks,
Michael
On Thu, Feb 14, 2008 at 4:20 AM, <[EMAIL PROTECTED]> wrote:
> Full_Name: Hans Dieter
> Version: 2.6.1
> OS: Windows
> Submi
On Sat, Feb 23, 2008 at 3:18 AM, Yuan Jian <[EMAIL PROTECTED]> wrote:
> Hi,
> is it possible to call R functions from visual studio .net such as c#?
>
>
There is at least one existing C# program accessing R:
http://ncrr.pnl.gov/software/dante.stm
They do it using the R(D)COM server, which is un
On Mon, Feb 25, 2008 at 10:56 AM, Prof Brian Ripley <[EMAIL PROTECTED]>
wrote:
> R-devel has new versions of the X11(), png() and jpeg() devices on
> Unix-alikes. The intention is that these are used identically to the
> previous versions (which remain available) but will produce higher-quality
>
t of those will be ironed out as
more win32 programs rely on Cairo (e.g. Firefox 3.0).
>
> Brian
>
>
> On Mon, 25 Feb 2008, Michael Lawrence wrote:
>
> > On Mon, Feb 25, 2008 at 10:56 AM, Prof Brian Ripley <
> [EMAIL PROTECTED]>
> > wrote:
> >
> >&g
On Tue, Feb 26, 2008 at 8:18 AM, Prof Brian Ripley <[EMAIL PROTECTED]>
wrote:
> Revision r44621 supports (in a limited way) cairo 1.0 and hence I believe
> vanilla FC5 -- I found what purports to be a vanilla FC5 box and it works
> quite well there.
>
> Two people have reported that the svg(), cai
Hi,
It seems that promptMethods() was changed in revision 44805 to include a
call to "isGenericFunction" that at least as of revision 44861 does not
exist as far as I can tell.
This results in:
could not find function "isGenericFunction"
when evaluating e.g. promptMethods("myGeneric")
Thanks,
M
Hi Graham,
Your guess is right. The event loop stuff is handled differently on Windows
than on Unix-like OSes. There is a hook, called tcl_do that is hard-coded
into the R Windows GUI. It is called whenever the console is idle. RGtk2 is
able to hook into that to process GTK+ events. The problem is
I am not sure what is included with swig, but have you seen this?
http://www.omegahat.org/RSWIG/
I'm not sure if it's actively maintained, but at the very least it might
help in your efforts at getting an R swig driver working.
Michael
On Fri, Apr 18, 2008 at 3:49 AM, Soeren Sonnenburg <[EMAIL
On Fri, Apr 18, 2008 at 7:17 PM, Herve Pages <[EMAIL PROTECTED]> wrote:
> Hi,
>
> The parser doesn't seem to like this:
>
> somePackage::foo(x) <- value
> somePackage:::foo(x) <- value
>
> where foo() is a replacement function or method defined in package
> somePackage.
>
> For example:
>
>
of us is interested in using a general
> interface code
> | generation mechanism, then perhaps we shouldn't waste too much time on
> such
> | general resources. However, I think it is of value and I think
> | we can fix up the SWIG module with a little collaboration.
>
> There
ave been working on an alternative way to generate
> bindings using
> | | output from GCC (gcc & g++) and exploring how the bindings should work
> |
> | Sure, that is very well for you as a research project,
> ~ Thanks!
> | but Swig is there, is
> | rather mature, und
On Wed, Apr 30, 2008 at 10:26 AM, Maarten Blaauw <[EMAIL PROTECTED]>
wrote:
>
> The now default Cairo results in much prettier graphs, but dense graphs
> such
> as plot(rnorm(1e4)) take considerably longer to plot than using
> X11(type="Xlib"). This has already been mentioned, but I was wondering
The is() function begins with the following code:
cl <- class(object)
if (length(cl) > 1) {
if (is.na(match(cl[[1]], names(getClass("oldClass")@subclasses
return(class2 %in% cl)
As one can see, it uses S3 inheritance if the first element of the class
attribute is a
On Wed, Jun 4, 2008 at 8:05 PM, Michael Lawrence <[EMAIL PROTECTED]> wrote:
> The is() function begins with the following code:
>
> cl <- class(object)
> if (length(cl) > 1) {
> if (is.na(match(cl[[1]], names(getClass("oldClass")@subclasses)
On Tue, Jun 10, 2008 at 8:07 AM, John Chambers <[EMAIL PROTECTED]> wrote:
> It's now perhaps only a historical point, but one motivation for
> introducing show() in S4 was the thought that something other than
> "printing" might evolve to be better for "showing" an object (e.g., a method
> that di
On Mon, Jul 28, 2008 at 6:33 AM, Prof Brian Ripley <[EMAIL PROTECTED]>wrote:
> On Mon, 28 Jul 2008, Felix Andrews wrote:
>
> Hi R-devel
>>
>> I use the packages RGtk2 and cairoDevice. The cairoDevice package has
>> a few stand-alone functions, plus "asCairoDevice" which depends on
>> RGtk2 and ca
Yea I am aware of this. This is because the Ubuntu binary has stack smashing
detection enabled. It's possible to build R without this checking:
export CFLAGS="-fno-stack-protector"
I have not been able to figure out why stack smashing is detected. I'm
cc'ing this to r-devel in case anyone else h
event loop
handling, so that package code is the same across platforms. I understand
that's a non-trivial task.
Michael
>
>
> L.
>
>
>
> 2008/8/13 Michael Lawrence <[EMAIL PROTECTED]>:
> > This is almost certainly due to the lack of tcl_do in R devel. I fi
For processing events, RGtk2 has moved away from using the old tcl_do hack
and now synchronizes on the Windows event loop. In Rgui.exe this works fine
(well mostly), but in Rterm.exe, users report the following warning from
GLib: "main loop already active in another thread". The most obvious way
th
On Thu, Sep 18, 2008 at 6:28 AM, Duncan Murdoch <[EMAIL PROTECTED]>wrote:
> On 18/09/2008 8:59 AM, Michael Lawrence wrote:
>
>> For processing events, RGtk2 has moved away from using the old tcl_do hack
>> and now synchronizes on the Windows event loop. In Rgui.exe thi
On Thu, Sep 18, 2008 at 7:04 AM, Simon Anders <[EMAIL PROTECTED]> wrote:
> Hi Michael,
>
> Michael Lawrence wrote:
> >>> For processing events, RGtk2 has moved away from using the old tcl_do
> hack
> >>> and now synchronizes on the Windows event loop. In
It would be nice to have a more convenient means of exporting multiple
classes from a package namespace. Why not have something like
exportClassPattern() that worked like exportPattern() except for classes?
Thanks,
Michael
[[alternative HTML version deleted]]
There seems to be a bug arising when using multiple S4 generics with "..."
as the signature.
The following code works as expected:
##
> setGeneric("rbind", function(..., deparse.level=1)
standardGeneric("rbind"),
+signature
;numeric")
> foo
Method Definition (Class "derivedDefaultMethod"):
function (..., deparse.level = 1)
.Internal(rbind(deparse.level, ...))
Signatures:
...
target "numeric"
defined "numeric"
> foo(1)
[,1]
[1,]1
>
On Tue, Nov 25, 2008 at
Hi,
I am having a similar issue as reported by Paul, but I don't think Martin's
example is precisely representative of the problem.
Consider a hierarchy A <- B <- C:
> setClass("A")
[1] "A"
> setClass("B", contains="A")
[1] "B"
> setClass("C", contains="B")
[1] "C"
Now define a coerce method:
On Thu, Feb 19, 2009 at 9:27 AM, Sklyar, Oleg (London) <
oskl...@maninvestments.com> wrote:
> Dear Simon,
>
> thanks for comments.
>
> I better give a bit of a background first. We are analysing time series of
> financial data, often multivariate and with say 200K samples. It is quite a
> frequent
101 - 200 of 227 matches
Mail list logo