Re: [Rd] suggested minor patch for optim.R

2008-04-05 Thread Ben Bolker
Thomas Petzoldt wrote: Ben, another issue of optim is that I don't see any reason why the REPORT control parameter is evaluated by "BFGS" and "L-BFGS-B" only but not, for example, by "SANN", see: https://stat.ethz.ch/pipermail/r-devel/2008-March/048710.ht

[Rd] FAQ nomination

2008-05-22 Thread Ben Bolker
on :-) ). I just updated the wiki page ( http://wiki.r-project.org/rwiki/doku.php?id=tips:graphics-base:2yaxes ), so the text could be stolen from there if desired. Ben Bolker signature.asc Description: OpenPGP digital signature __ R-devel@r

[Rd] thought for posting guide

2008-05-28 Thread Ben Bolker
etics, or whatever they happen to be doing ... Ben Bolker signature.asc Description: OpenPGP digital signature __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] Listing all possible samples of Size two form Large Population

2008-05-30 Thread Ben Bolker
utomatically, and if I were you I would think seriously about what question you really want to answer and whether there's a less brute-force way of doing it. cheers Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] sd function (PR#11586)

2008-06-06 Thread Ben Bolker
t R tries to run sd() on each column. The first column is coerced to a character, then var() says there are no non-missing observations. This has been discussed (and complained about) previously. (I'd like to add my vote for reversion of this behavior,

[Rd] update on dnbinom with large "size"

2008-07-03 Thread Ben Bolker
to test and return NA under these circumstances? function (x, size, prob, mu, log = FALSE) { ~if (!missing(mu)) { ~if (!missing(prob)) ~stop("'prob' and 'mu' both specified") ~prob <- size/(size + mu) ~} ~.Internal(d

[Rd] dnbinom unreliable for absurdly large "size" parameter

2008-07-03 Thread Ben Bolker
time wanted to alert people to this "feature" ... (it looks like I will have to go through dnbinom and dbinom_raw to see where the problem is ...) Ben Bolker signature.asc Description: OpenPGP digital signature __ R-devel@r-project.org mai

Re: [Rd] update on dnbinom with large "size"

2008-07-04 Thread Ben Bolker
=1,size=x),from=5e14,to=1e16,log="x",ylim=c(0.32,0.37)) ~ Ben Bolker Prof Brian Ripley wrote: | On Fri, 4 Jul 2008, Martin Maechler wrote: | |>>>>>> "BDR" == Prof Brian Ripley <[EMAIL PROTECTED]> |>>>>>> on Fri, 4 Jul 2008 09:0

[Rd] closing View windows after multiple View(x) crashes

2008-07-29 Thread Ben Bolker
could write to R-SIG-MAC about it ...] Ben Bolker signature.asc Description: OpenPGP digital signature __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] closing View windows after multiple View(x) crashes

2008-07-29 Thread Ben Bolker
That works like a charm. Thanks! Ben Bolker Bill Dunlap wrote: On Tue, 29 Jul 2008, Ben Bolker wrote: > sessionInfo() R version 2.8.0 Under development (unstable) (2008-07-07 r46046) i686-pc-linux-gnu ... x = cbind(a=1:10,b=1:10) View(x) View(x) View(x) View(x) then try to cl

Re: [Rd] closing View windows after multiple View(x) crashes

2008-07-30 Thread Ben Bolker
I'm using Gnome. Ben Prof Brian Ripley wrote: We have found elsewhere that the need to use XSync is very dependent on the window manager. What manager were you using? I'll add the call in any case. On Tue, 29 Jul 2008, Bill Dunlap wrote: On Tue, 29 Jul 2008, Ben Bo

Re: [Rd] Numerical optimisation and "non-feasible" regions

2008-08-06 Thread Ben Bolker
stance from the feasible region, if that is reasonably straightforward to compute -- that way your function will get gently pushed back toward the feasible region. Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] Suggestion for the optimization code

2008-08-09 Thread Ben Bolker
more easily plug in alternative optimization procedures. My version of mle (mle2, in bbmle) does something like this, but in an ad hoc way -- it can use optim, nlm, nlminb, or constrOptim as an optimization backend. (I will also take a look at Robert Gentleman

[Rd] wishlist: par(ann=FALSE) applied to hist?

2008-08-12 Thread Ben Bolker
par(ann=FALSE) appears to have no effect on hist.default; it would be nice if it did ... (boxplot, which plots via bxp, which calls internal do_title, does -- in a quick search I can't figure out where the value of ann takes effect ...) thanks Ben Bolker signature.asc Descri

Re: [Rd] wishlist: par(ann=FALSE) applied to hist?

2008-08-12 Thread Ben Bolker
Prof Brian Ripley wrote: On Tue, 12 Aug 2008, Ben Bolker wrote: par(ann=FALSE) appears to have no effect on hist.default; it would be nice if it did ... (boxplot, which plots via bxp, which calls internal do_title, does -- in a quick search I can't figure out where the value of ann

[Rd] messing with ...

2008-08-13 Thread Ben Bolker
?) (4) capture ... as arglist <- list(...), manipulate the arguments as necessary, then pass them along to optim as do.call("optim",arglist) (ugh but maybe the best solution?) any thoughts? thanks Ben Bolker signature.asc Description: OpenPGP digital signature _

Re: [Rd] messing with ...

2008-08-13 Thread Ben Bolker
that the use of do.call() can completely blow out memory usage) - to avoid manually duplicating arg lists, use constructs like names(formals(optim)) and pmatch to find args that below to the optimizer function vs the objective function -- Tony Plate thanks Ben Bolker The ugh factor ref

[Rd] extending the derivs table/fools rushing in

2008-08-14 Thread Ben Bolker
Constant(-2.))), - PP(D(CADR(expr),var))); - UNPROTECT(8); It seems to work: > D(quote(plogis(a)),"a") exp(-a) * (1 + exp(-a))^-2 > D(quote(plogis(a+b*x)),"x") exp(-(a + b * x)) * (1 + exp(-(a + b * x)))^-2 * b Any thoughts? I'm sure there

Re: [Rd] extending the derivs table/fools rushing in

2008-08-14 Thread Ben Bolker
http://www.zoology.ufl.edu/bolker/deriv_patch2.txt has this change added as well. However, I'm not as confident that this is the right thing to do? Should curly brackets even be appearing in mathematical expressions? Ben Gabor Grothendieck wrote: > While you are at it could you

Re: [Rd] extending the derivs table/fools rushing in

2008-08-14 Thread Ben Bolker
7;t own MASS2 ... The reason behind this is that I was trying to write a simple analytic derivative calculator for formulae of the form (e.g.) y ~ dbinom(prob=plogis(a+b*x),size=N) Obviously in this case I could just tell people to write the formula out as y ~ dbinom(prob=1/(1+exp(-(a+b*x))

Re: [Rd] extending the derivs table/fools rushing in

2008-08-15 Thread Ben Bolker
lly be to implement the derivative rules in native R, which might (?) make it much easier to include the derivative rules as an extendable table. I may play with this some -- it's certainly re-inventing the wheel to reimplement all of the stuff in deriv.c in native R, but it might be worth

[Rd] tiny typo in NEWS

2008-09-12 Thread Ben Bolker
estore the pre-2.7.0 behavior for all-missing data ... Ben Bolker -BEGIN PGP SIGNATURE- Version: GnuPG v1.4.6 (GNU/Linux) Comment: Using GnuPG with Mozilla - http://enigmail.mozdev.org iD8DBQFIyrGoc5UpGjwzenMRAoQ+AJ9AI/WLKERA/VJqwALTspSKx3eHAQCeOh6Q 9lp

[Rd] hostingzero.net down?

2008-10-02 Thread Ben Bolker
It looks like the Tampa, FL mirror (cran.hostingzero.net) is down -- I don't know if there's anything to be done or not. Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

[Rd] problem with cut.Date/date plotting in ggplot2

2008-10-11 Thread Ben Bolker
## OK cut(d[2],"weeks",start.on.monday=FALSE) ## Sunday -- breaks cut(d[3],"weeks",start.on.monday=FALSE) ## OK cut(d[4],"weeks",start.on.monday=FALSE) ## OK The particular line that fails within cut.Date is breaks <- breaks[1:(1 + max(which(breaks < maxx)))]

[Rd] R books: self-serving question

2008-10-29 Thread Ben Bolker
thought someone here might know: how would I go about nominating my book (Ecological Models and Data in R, Princeton University Press 2008) for inclusion in the R books page ... ? I can supply bibliographic data, blurb etc. ... cheers Ben Bolker signature.asc Description: OpenPGP

Re: [Rd] chisq.test with simulate.p.value=TRUE (PR#13292)

2008-11-17 Thread Ben Bolker
thesis (the standard chisq.test() gives p<2.2e-16), so the result of the simulation protocol is always 1/(B+1); that is, as is standard with these protocols, the observed value is added to the ensemble of simulations. Why is the p value "obviously incorrect"? cheers Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] chisq.test with simulate.p.value=TRUE (PR#13292)

2008-11-19 Thread Ben Bolker
chi-squared statistic (the observed value itself is included in the ensemble, so the p-value is given as 1/(B+1) rather that <1/B; you can read about the reasons for this elsewhere [?]). Bottom line: why do you think these results are "obviously incorrect"? Ben Bolker _

Re: [Rd] [R] besselK

2008-11-24 Thread Ben Bolker
I don't really know how this is done in FORTRAN). Does anyone out there have experience in porting code from Netlib and ending up with clean, platform-configured code? (I will go look at the deSolve package next, but since this is a bit of a side project ...) Ben Bolker baptiste auguie wrote:

[Rd] methods not found inside function?

2008-11-30 Thread Ben Bolker
the same object that has been passed to the function no longer calls the S4 method ... Any explanations/workarounds for this ... ? cheers Ben Bolker ## before loading the lme4 package: > summary function (object, ...) UseMethod("summary") ## now load lme4: library(lm

[Rd] rgl.snapshot() on Vista

2008-12-04 Thread Ben Bolker
eates funky gray and white png file rgl.postscript("test.ps") ## hangs Duncan, do you have any ideas? Do you have any reports (positive or negative) from people running rgl.snapshot() on Vista? RSiteSearch("rgl vista") turned up only this thread ... cheers Ben Bolker

[Rd] Florida mirror (cran.hostingzero.net) dead?

2008-12-07 Thread Ben Bolker
2008 http://finzi.psych.upenn.edu/R/Rhelp02a/archive/137451.html Perhaps it's just flaky, and not permanently missing, but it still causes problems (especially for new users who have no idea what's wrong, they just selected the repository that was geographically closest to them). c

Re: [Rd] [R] Some clarificatins of anova() and summary ()

2008-12-14 Thread Ben Bolker
, specifically, the docs should say about these issues ... (Moving to the r-devel list) cheers Ben Bolker John Sorkin wrote: > Ben, > You were quite correct to indicate that Tanmoy should not use the listserver > to get answers to his class assignments. Never the less, I do

[Rd] proposed patch to Uniform.Rd

2009-01-04 Thread Ben Bolker
;s easy if they want it.] cheers Ben Bolker *** Uniform.Rd.orig 2009-01-04 14:10:47.0 -0500 --- Uniform.Rd 2009-01-04 14:12:26.0 -0500 *** *** 49,54 --- 49,58 \code{max = min} or \code{max-min} is small compared to \code{min}, and in particul

[Rd] proposed simulate.glm method

2009-02-12 Thread Ben Bolker
others if that seems necessary. I hereby request comments and suggest that it wouldn't hurt to incorporate it into base R ... (I will write docs for it if necessary, perhaps by modifying ?simulate -- there is no specific documentation for simulate.lm) cheers Ben Bolker simulate.

Re: [Rd] proposed simulate.glm method

2009-02-12 Thread Ben Bolker
ld be included in "vanilla" R ... Also (for better or worse), it looks like sim() also does parametric bootstrapping on the parameter values, whereas simulate.[g]lm() just uses "plug-in" estimates. cheers Ben Bolker Alex D'Amour wrote: > There is functionality simi

Re: [Rd] Generate random numbers in Fortran

2009-02-14 Thread Ben Bolker
tions in the book ... (The wikipedia page also refers to the Gnu Scientific Library, which might be another set of options.) Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] Generate random numbers in Fortran

2009-02-14 Thread Ben Bolker
Ben Bolker ufl.edu> writes: > > vQ > > If one can get the R routines to work, I think they have some > advantages over NAG and Numerical Recipes routines: > > * source code is freely redistributable > * I can't really claim expertise, but I believe there

[Rd] Chunk of text won't show up when compiling Rd file

2009-03-05 Thread Ben Bryant
de to tell it not to do that. I presume it is a very easy fix, but I haven't been able to get at it. I pasted some example explanatory Rd code below. Thanks! -Ben Bryant % Just the Value Section: \value{ Here I have a paragraph giving the general description of the output form. The

Re: [Rd] Chunk of text won't show up when compiling Rd file

2009-03-09 Thread Ben Bryant
address my immediate needs (just including another section in the Rd file). The most helpful I can be with my current level of knowledge is to include a full Rd text that reproduces the error, if someone would like to give it a shot. (below). Thanks, -Ben %FAKE FUNCTION DOCUMENTATION TO

Re: [Rd] Gamma funtion(s) bug

2009-03-31 Thread Ben Bolker
uot;bug report" as asking a question. People are allowed to make mistakes ... While I was reading ?lgamma I noticed that the "See Also" section refers to gammaCody(), which is now defunct. Perhaps remove the sentence? Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] summary for negative binomial GLMs (PR#13640)

2009-04-06 Thread Ben Bolker
e's a bit of a challenge in figuring out the test, because object$family$family is not a fixed string for negative binomial-family objects (e.g. "Negative Binomial(0.4)" in the example below) -- I'm not sure of the cleanest way to detect this case. I think I ag

Re: [Rd] summary for negative binomial GLMs (PR#13640)

2009-04-10 Thread Ben Bolker
Bump? Does anyone else have an opinion on this one? cheers Ben Bolker Ben Bolker wrote: > > oakland.edu> writes: > >> >> Full_Name: Robert Kushler >> Version: 2.7.2 >> OS: Windows XP >> Submission from: (NULL) (69.246.102.98) >>

Re: [Rd] License status of CRAN packages

2009-04-23 Thread Ben Goodrich
t a couple files can't be included under the AGPL and are plain GPL. As far as I can see, R does not give me the option of saying so in a "standard" way, e.g. putting License: AGPL (>= 3) in the DESCRIPTION file would only be 95% accurate and putting Li

Re: [Rd] License status of CRAN packages

2009-04-23 Thread Ben Goodrich
Gabor Grothendieck wrote: > On Thu, Apr 23, 2009 at 4:59 PM, Ben Goodrich > wrote: >> Dirk Eddelbuettel debian.org> writes: >>> As a non-exhautive list with possible misclassifications, cran2deb currently >>> has these packasges as 'maybe not free'

Re: [Rd] License status of CRAN packages

2009-04-24 Thread Ben Goodrich
se." So, I think that CRAN should at least have a canonical spec that covers *this* situation. Other situations may be more complicated to handle elegantly. Thanks, Ben __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] License status of CRAN packages

2009-04-24 Thread Ben Goodrich
of a useR, there is no relevant distinction between these two rare cases and the more common case of GPL3. So why should packages be put in separate repositories based on this non-distinction? A partition based on whether the package is free according to the FSF definition seems more plausible t

Re: [Rd] weights in glm (PR#8720)

2006-03-28 Thread Ben Bolker
ing dispersion" -- could one modify this slightly to warn people against using zero weights? (Are zero weights always a bad idea?) Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

[Rd] head() for tables

2006-06-03 Thread Ben Bolker
;- "matrix" so does head.table <- utils:::head.matrix is it worth making this duplication in the code? Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

[Rd] trivial typo in ?fisher.test

2006-06-03 Thread Ben Bolker
in the comments at the beginning of the first example, line 6: "and the women's guess" should be "and the woman's guess" Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] trivial typo in ?fisher.test

2006-06-03 Thread Ben Bolker
>in the comments at the beginning of the first example, > line 6: "and the women's guess" should be "and the woman's guess" > >Ben Bolker sorry I forgot to say: this and the previous comment apply to 2.3.1 (on W

[Rd] help compiling package with g77

2006-06-06 Thread Ben Bolker
ight libraries or not ... perhaps I should recompile R with F77=/usr/bin/g77 all the way? I have poked around in The Fine Manuals quite a bit ... if anyone has pointers I would be grateful. This'll teach me to upgrade. cheers Ben Bolker -- 620B Bartram Hall

[Rd] further f77/gfortran

2006-06-07 Thread Ben Bolker
ly right. Any clues? cheers Ben Bolker -- 620B Bartram Hall[EMAIL PROTECTED] Zoology Department, University of Floridahttp://www.zoo.ufl.edu/bolker Box 118525 (ph) 352-392-5697 Gainesville, FL 32611-8525

Re: [Rd] further f77/gfortran

2006-06-07 Thread Ben Bolker
QUIVALENCE (RMACH(3),RIGHT(1)) EQUIVALENCE (RMACH(4),DIVER(1)) EQUIVALENCE (RMACH(5),LOG10(1)) http://www.fortran.com/F77_std/rjcnf-8.html#sh-8.2 suggests this should be legal as long as REALs are twice as long as INTEGERs? I'm on the edge of my knowledge here -- don't know

[Rd] separators in data()

2006-06-14 Thread Ben Bolker
quot; as in read.csv() ... cheers Ben Bolker -- 620B Bartram Hall[EMAIL PROTECTED] Zoology Department, University of Floridahttp://www.zoo.ufl.edu/bolker Box 118525 (ph) 352-392-5697 Gainesville, FL 32611-8525

[Rd] Ops.Date: promote characters to Dates?

2006-06-24 Thread Ben Bolker
3") == "1999-06-14" behave as "expected". Does it seem like a good idea? (I was inspired by a student's confusion, and by the fact that Ops.factor does a similar thing -- although in this case it seems more sensible to promote the character to a Date rather than

Re: [Rd] Ops.Date: promote characters to Dates?

2006-06-25 Thread Ben Bolker
e as.Date.numeric <- function(x, ...) { class(x) <- "Date" x } this takes a number of seconds since 1970 and converts it into a Date object ... cheers Ben Gabor Grothendieck wrote: > Note that the first argument still cannot be character >

Re: [Rd] Ops.Date: promote characters to Dates?

2006-06-26 Thread Ben Bolker
Prof Brian Ripley wrote: > On Sun, 25 Jun 2006, Ben Bolker wrote: > > Eh? nchar is non-zero for almost all objects to be passed through here, > including any coercible to Date. (Remember nchar will itself coerce to > character.) And nchar(e1) will be a vector, not a

[Rd] advice on arguments

2006-06-29 Thread Ben Bolker
in the documentation)? (I guess another general solution to this is to ask for lists of arguments, like MoreArgs in mapply(). Another would be to go back and change spheres3d to make size a synonym for radius ... ) any thoughts? Ben Bolker -- 620B Bartram Hall

[Rd] possibly stupid question about RPM building

2006-07-18 Thread Ben Bolker
.) Could this possibly be related to having another (old) instance of R running at the same time? Seems unlikely but ... does anyone have any hints? sincerely Ben Bolker -- 620B Bartram Hall[EMAIL PROTECTED] Zoology Department, University of Flor

Re: [Rd] bug with rpois (PR#9106)

2006-07-27 Thread Ben Bolker
math.siu.edu> writes: > > > The R poisson random generator rpois appears to have a bug for > theta 10 or larger. The sample mean of the pseudo variates is too > small: sample mean approx theta - 0.5. > Certainly fixed by 2.3.1: zsim <- function(nc = 100, nr = 500, theta = 1) + {# check r

[Rd] boxplot, notches, etc.

2006-10-09 Thread Ben Bolker
R. Please feel free to say "this is just cosmetic/isn't an issue, go away" ... cheers Ben Bolker bogdan romocea gmail.com> writes: > > A function I've been using for a while returned a surprising [to me, > given the data] error recently: >Error in plo

Re: [Rd] read.table versus read.csv (PR#9284)

2006-10-10 Thread Ben Bolker
fault quote= argument for read.table(), only double quotes are included in the default for read.csv(). To make read.csv() behave like read.table() in this respect, specify read.csv(...,quote="\"'") a brief search in svn logs, RSiteSearch, etc., doesn't shed any light on *why* this difference is there ... Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] boxplot, notches, etc.

2006-10-17 Thread Ben Bolker
Ben Bolker zoo.ufl.edu> writes: > > Synopsis: boxplot notches look weird when notches > are greater than hinges ((1.58*IQR/sqrt(n)) > approx IQR). > When log="y" this causes an error. Below are several > reproducible examples, some discussion, and a patch again

Re: [Rd] plotting text with very small negative rotation hangs (PR#9301)

2006-10-17 Thread Ben Bolker
ackage triggers it, with a > srt value of -3e-15). > > plot(0:1,0:1) > for (i in 1:10) { > cat(i,"\n") > text(0.5,0.5,"hello",srt=(-10^-i)) > } > > There were some "3D"s inserted after the equals signs

[Rd] help with extended mle package?

2006-10-31 Thread Ben Bolker
got rolled back into stats4. Anyone out there interesting in hacking on this a bit more with me/providing some perspective on which bells and whistles are really necessary and which are unnecessary complications? cheers Ben Bolker signature.asc Descriptio

[Rd] bug in lrect [lattice]?

2006-11-13 Thread Ben Bolker
ckage, but a core/recommended package ... Ben Bolker x = runif(100) y = runif(100) my.lrect <- function (xleft, ybottom, xright, ytop, x = (xleft + xright)/2, y = (ybottom + ytop)/2, width = xright - xleft, height = ytop - ybottom, col = "transparent", border = "b

Re: [Rd] mixed effects model and r-squared

2006-12-08 Thread Ben Bolker
;development" question. The other bad news for you is that I suspect it may be difficult to define r-squared uniquely for a mixed model. The resid() command will give you residuals, and you could take (1-resid()^2)/var(x) -- but how do you decide which var(x) to put in the denominator

[Rd] question about trailing arguments in an S4 method

2006-12-16 Thread Ben Bolker
ble, I'm a bit out of my depth with S4 ...) cheers Ben Bolker signature.asc Description: OpenPGP digital signature __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] question about trailing arguments in an S4 method

2006-12-19 Thread Ben Bolker
I think I'll bite the bullet and define a separate "AICtab" function that takes a list of objects and produces an AIC table. thanks, all Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

[Rd] tiny typo in ?formals

2006-12-21 Thread Ben Bolker
in 2.4.1: under Value, "The replacment [sic] form sets the formals of a function ..." signature.asc Description: OpenPGP digital signature __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

Re: [Rd] model.matrix() may be misleading for "lme" models

2024-09-23 Thread Ben Bolker
> I can't tell whether evaluating object$call$data in environment(object$formula) is a better or worse idea than parent.frame(). I have struggled with this a lot over the years. There is a bunch of wonky code in lme4, e.g. here , that t

Re: [Rd] Exposing native httpd server

2024-12-08 Thread Ben Bolker
I absolutely appreciate the desire for minimalism. On the other hand Rserve has no dependencies other than R >= 1.5.0 (!!!), so you would in any case be cutting your dependencies way down (`servr` has 16 recursive dependencies of which 5 seem to be base/recommended, presumably this is where

Re: [Rd] R_CheckUserInterrupt() can be a performance bottleneck within GUIs

2024-12-17 Thread Ben Bolker
This seems like a great idea. Would it help to escalate this to a post on R-bugzilla, so it is less likely to fall through the cracks? On 12/17/24 09:51, Jeroen Ooms wrote: A more generic solution would be for R to throttle calls to R_CheckUserInterrupt(), because it makes no sense to check 1

[Rd] trivial typo

2024-12-04 Thread Ben Bolker
.. I could submit a patch but that seems like overkill ... cheers Ben Bolker __ R-devel@r-project.org mailing list https://stat.ethz.ch/mailman/listinfo/r-devel

[Rd] binomial()$linkinv no longer accepts integer values

2025-01-08 Thread Ben Bolker
e me the trouble ...) Thoughts, insights? Should I post this to r-bugzilla? Or suck it up and accept it as the new reality? cheers Ben Bolker binomial()$linkinv is: function (eta) .Call(C_logit_linkinv, eta) Here is the body of the function in C code: https://github.com/r-d

Re: [Rd] binomial()$linkinv no longer accepts integer values

2025-01-08 Thread Ben Bolker
Thanks, that makes sense. I guess if it never worked for integers (or hasn't worked in a long time, at least) then it doesn't need to be fixed/changed ... cheers Ben On 2025-01-08 11:20 a.m., Ivan Krylov wrote: On Wed, 8 Jan 2025 10:57:47 -0500 Ben Bolker wrote: I ha

[Rd] request for discussion on lonely doc patch suggestion

2025-04-05 Thread Ben Bolker
The patch file is attached (also available at bugzilla, if it doesn't get through to the list). I find the patch format a little hard to read, so I'm reproducing just the *new* text below. Any ideas or suggestions would be welcome. cheers Ben Bolker src/library/base

Re: [Rd] Patch for RJSONIO

2025-03-25 Thread Ben Bolker
likely the only choice. The > maintainer is "CRAN Team ". > > Duncan Murdoch > > > On 2025-03-25 6:58 p.m., Ben Bolker wrote: > > Maybe https://github.com/duncantl/RJSONIO ? > > > > (That page also points to https://omegahat.org/RJSONIO, which is

Re: [Rd] Patch for RJSONIO

2025-03-25 Thread Ben Bolker
Maybe https://github.com/duncantl/RJSONIO ? (That page also points to https://omegahat.org/RJSONIO, which is now defunct ...) On 3/25/25 18:53, Dirk Eddelbuettel wrote: I can never remember where the canonical sources are for the effectively-CRAN maintained packages so I am dropping it here

Re: [Rd] Request for comment: namespace resolution in terms(, specials=) [::, etc.]

2025-04-14 Thread Ben Bolker
c approach. cheers Ben Bolker On 2025-04-14 5:43 p.m., Mikael Jagan wrote: [CC: maintainers of R packages survival, mgcv, lme4, RItools] Dear R-devel subscribers, If you have never used stats:::terms.formula or its 'specials' argument, then feel free to stop reading or o

[Rd] patch to model matrix to improve error messages

2025-02-19 Thread Ben Bolker
ow/column checking: https://github.com/r-devel/r-svn/blob/63369bfed9330b9461ec1d8b90d7251c0118508f/src/library/stats/src/model.c#L138-L152 nrows() function: https://github.com/r-devel/r-svn/blob/63369bfed9330b9461ec1d8b90d7251c0118508f/src/main/util.c#L81-L94 cheers Ben Bolker _

Re: [Rd] R CMD check and CRAN's Rust policy

2025-03-02 Thread Ben Bolker
st crates to be downloaded? This is a much more fundamental policy decision, which I have no opinion about. cheers Ben Bolker On 2025-03-02 12:21 p.m., Duncan Murdoch wrote: On 2025-03-02 11:03 a.m., Josiah Parry wrote: Well this has surely veered off course! As the one who f

Re: [Rd] Vuori - Due Diligence

2025-02-25 Thread Ben Bolker
rstudio-and-rtools-in-a-corporate-environment/4742/2 https://posit.co/products/ sincerely Ben Bolker (you may get a slew of responses along these lines) On 2025-02-25 2:27 p.m., Geoff Wolkis via R-devel wrote: Hello - My name is Geoff Wolkis and I'm with Vuori's Third Party

Re: [Rd] R CMD check and CRAN's Rust policy

2025-03-31 Thread Ben Bolker
age installation requirements when     expected? > > Using > > > > > On Sun, Mar 2, 2025 at 11:42 AM Duncan Murdoch     mailto:murdoch.dun...@gmail.com> > <mailto:murdoch.dun...@gmail.com     <mailto:murdoch.dun...

[Rd] Inconsistency in paired t.test() interface?

2023-11-06 Thread Mattan S. Ben-Shachar
Hi all, In the next release of R (4.4) the option to obtain a paired t.test with the formula interface for "long" data has been removed: t.test(x ~ group, paired = TRUE) # now results in an error. Exploring how one might obtain a paired t.test, there seems to be some inconsistency between the fo

<    1   2   3   4   5   6