similar to: formula behaviour in model.matrix

Displaying 20 results from an estimated 10000 matches similar to: "formula behaviour in model.matrix"

2009 Jul 30
3
update.formula and backticked colons
I just noticed the following in update.formula and I'm wondering if this behavior is the intention of the developers. Here's an example: update(`a: b` ~ x, ~ . + y) Note now that the response has no backticks and is interpreted as a:b (i.e. ":" is now an operator). This is because in update.formula the call to terms.formula uses simplify = TRUE. I'm working with data that
2006 Jun 20
1
changes to terms.formula in 2.3.x
Hi, all, I just recently noticed a change in terms.formula from 2.2.1 to 2.3.1 (possibly 2.3.0, but I didn't check). Here's the problem: ## 2.2.1 > update(~ x | y, z ~ .) z ~ x | y ## 2.3.1 > update(~ x | y, z ~ .) z ~ (x | y) and in the NEWS for 2.3.1 o terms.formula needed to add parentheses to formulae with terms containing '|'. (PR#8462) So, there must be
2009 Jan 17
2
DierckxSpline segfault
I've just encountered a segfault when using DierckxSpline::percur function. Below is the minimal example which triggers the error: --- library(DierckxSpline) x <- 1:10 y <- rep(0, 10) pspline <- percur(x, y) --- *** caught segfault *** address (nil), cause 'memory not mapped' Traceback: 1: .Fortran("percur", iopt = as.integer(iopt), m = as.integer(m), x =
2004 Sep 30
1
Vectorising and loop (was Re: optim "a log-likelihood function")
>From: Sundar Dorai-Raj <sundar.dorai-raj at PDF.COM> >Reply-To: sundar.dorai-raj at PDF.COM >To: Zhen Pang <nusbj at hotmail.com> >CC: r-help at stat.math.ethz.ch >Subject: Vectorising and loop (was Re: [R] optim "a log-likelihood >function") >Date: Wed, 29 Sep 2004 18:21:17 -0700 > > > >Zhen Pang wrote: > >> >>I also use
2005 Jul 11
2
building packages on Windows
Hi, all, I just recently upgraded my computer though I'm using the same OS (XP). But now I'm having difficulty building packages and I cannot seem to solve the problem. I'm using R-2.1.1pat on Windows XP. Here is what I tried: D:\Users\sundard\slib\sundar\R>R CMD CHECK sundar * checking for working latex ... OK * using log directory
2003 Feb 13
2
multi-color plot
hi all, i am trying to make multi-color plots. that is, i generally use, plot(x, y, type="n") text(x, y, labels=class) here, the vector class denotes the class of each point. there are usually 3-4 classes of points. how may i display the different classes in different colors? thanks for any help. -- saurav
2008 Oct 30
3
using yscrollcommand in tkcanvas crashes R (PR#13231)
Full_Name: Sundar Dorai-Raj Version: 2.8.0 OS: Windows Submission from: (NULL) (76.220.41.126) The following code crashes R: library(tcltk) tt <- tktoplevel() tc <- tkcanvas(tt, yscrollcommand = function(...) tkset(ts, ...)) > sessionInfo() R version 2.8.0 (2008-10-20) i386-pc-mingw32 locale: LC_COLLATE=English_United States.1252;LC_CTYPE=English_United
2002 Apr 22
2
lattice help
I'm new to lattice and can't figure out what the problem is with the following example: ######################### > library(lattice) Loading required package: grid Attaching package `lattice': The following object(s) are masked _by_ .GlobalEnv : xyplot The following object(s) are masked from package:base : levels > test.data <- data.frame(x=rnorm(100), +
2003 Feb 06
5
options(chmhelp = TRUE)
Hi all, Here's a curosity I ran into since upgrading to 1.6.2 (precompiled for Windows). When using the chm help I get the following warning. I saw a recent post regarding this as a new warning (``dyn.load warning message in R1.6.2 on Windows XP'' dated 1/28/03), but not in the context of the help system. The warning only appears once and does not prevent the chm file from
2004 Jan 27
8
distance between two matrices
Hi all, Say I have a matrix A with dimension m x 2 and matrix B with dimension n x 2. I would like to find the row in A that is closest to the each row in B. Here's an example (using a loop): set.seed(1) A <- matrix(runif(12), 6, 2) # 6 x 2 B <- matrix(runif(6), 3, 2) # 3 x 2 m <- vector("numeric", nrow(B)) for(j in 1:nrow(B)) { d <- (A[, 1] - B[j, 1])^2 + (A[,
2006 Aug 01
2
deleting a directory
Hi, all, I'm looking a utility for removing a directory from within R. Currently, I'm using: foo <- function(...) { mydir <- tempdir() dir.create(mydir, showWarnings = FALSE, recursive = TRUE) on.exit(system(sprintf("rm -rf %s", mydir))) ## do some stuff in "mydir" invisible() } However, this is assumes "rm" is available. I know of
2007 May 30
5
determining a parent function name
Hi, All, I'm writing a wrapper for stop that produces a popup window using tcltk. Something like: error <- function(...) { msg <- paste(..., sep = "") if(!length(msg)) msg <- "" if(require(tcltk, quiet = TRUE)) { tt <- tktoplevel() tkwm.title(tt, "Error") tkmsg <- tktext(tt, bg = "white") tkinsert(tkmsg,
2008 Oct 02
1
using bquote to construct function
Hi, R-help, (sessionInfo at the end) I'm trying to construct a function using bquote and running into a strange error message. As an example, what I would like to do is this: z <- 2 eval(bquote(function(x, y) { x^.(z) + y }))(2, 3) However, I get the following: Error in eval(expr, envir, enclos) : invalid formal argument list for "function" However, if I change the
2004 Nov 01
2
stacking imported data
Hi all, I have a question that I don't have a good answer for (note the word "good"; I have an answer, but I consider it not "good"). Take the following data in a single tab-delimited text file: <text> A Labels Value SE 2.5% 97.5% R90 0.231787 1.148044 0.035074 1.531779 R0 0.500861 0.604406 0.185336 1.353552 B Labels Value SE 2.5% 97.5% (Intercept) 1.367514
2009 May 06
2
convert large integers to hex
Hi, I'm wondering if someone has solved the problem of converting very large integers to hex. I know about format.hexmode and as.hexmode, but these rely on integers. The numbers I'm working with are overflowing and losing precision. Here's an example: x <- "6595137340052185552" # stored as character as.integer(x) # warning about inaccurate conversion
2004 Oct 25
2
Revision: post on Intro to R lecture
Hi All: This follows my earlier post on webized slides on lecture presentation on introducing R. I learned that in Mozilla (Firefox) browsers, the slides did not show up. Sorry for the no show. As a reluctant windows user, I kind of carelessly clicked through Powerpoint to convert the presentation file to its html form, unwittingly leading to the mess. See if it got corrected now (I do not have
2005 Jan 17
2
bwplot: how not to draw outliers
RenE J.V. Bertin wrote: > Hello, and (somewhat belated) best wishes for 2005. > > Can one order not to draw outliers in bwplot, or at least exclude them from the vertical axis scaling? If so, how (or what doc do I need to consult)? > The options that have this effect in boxplot() do not appear to have any effect with bwplot (although outline=FALSE in boxplot does *not* change the
2002 Apr 22
2
lattice x(y)lab and expression
Another question about lattice: Is there a way to use plotmath in the labels and strips? E.g. xyplot(y~x|group,data=test.df, panel=function(x,y,subscripts,df) { llines(x,y,col="black",lwd=2) llines(x,df[subscripts,"lowerCI"],lty=2,col="#aaaaaa") llines(x,df[subscripts,"upperCI"],lty=2,col="#aaaaaa") },
2005 May 05
6
Need some quick help with lattice - barchart
For the following code below, the x-axis ticks are 1,2,3,4,5,6,7 when I was expection them to be 1,2,8,9,10,11,12. Please help me figure out where is the mistake. library(lattice) testdata <- as.data.frame(t(structure(c( 1,2005,9.24,6.18,634, 2,2005,8.65,6.05,96, 8,2004,6.81,6.51,16, 9,2004,9.0,7.29,8, 10,2004,8.84,6.18,524, 11,2004,8.54,6.35,579, 12,2004,9.97,6.3,614, 12,2005,8.75,5.84,32,
2001 Oct 24
1
mixed fonts
Any way of mixing bold and plain fonts in text() (or mtext(), etc.)? I'm looking for a solution that doesn't require manually spacing two calls of text(). For example: text(x=0,y=0,labels="bold(Figure 1.) plain(This is a picture.)") where "Figure 1." is bold-faced and "This is a picture." is plain-faced. I've tried to trick plotmath into doing this but