On Friday 23 July 2004 16:28, Jacob Wegelin wrote:
> help.search("groupedData") says that it's part of the lme4 package,
> but it appears not to be there (details below). Is this because lme4
> is new and (perhaps) still under development?
Yes, sort of. The groupedData class in nlme inherits fro
On Friday 23 July 2004 05:36, [EMAIL PROTECTED] wrote:
> Hi
>
> I really hope someone can help me.
>
> I have just started to work with S-plus, and have not yet understood
> how it really works. I am now trying to fit a mixed effects model
> with lme. My goal is to compare four different groups, at
Quoting Patrick Lorch <[EMAIL PROTECTED]>:
> Can anyone explain how to properly use index.cond? I cannot include it
> in the xyplot command and get what I expect. For example,
>
> plot<-xyplot(y ~ x | z, data)
> # let's say z is a factor with six levels
>
> gives a nice plot but I am un
On Wednesday 21 July 2004 09:10 am, Wolski wrote:
> Hi!
>
> Would like to plot two image plots with color scale (like levelplot
> (lattice) implements) in one graphic device. Tried to plot 2 levelplot's
> (lattice) (the data has not much in common) in one graphics device by
> setting par(mfrwo=c(2,
On Tuesday 20 July 2004 06:19, John Hendrickx wrote:
> Couldn't eval be modified to automatically parse arguments if they're
> not expressions? Something like:
> eval2<-function(arg) {
> if (!is.expression(arg)) arg<-parse(text=arg)
> eval(arg)
> }
> Would a construction like eval2 hav
On Monday 19 July 2004 09:37, Wayne Jones wrote:
> Hi there fellow R-users,
>
> I'm stuck on this seemingly trivial problem.
>
> All I want to coerce a character string into a command.
>
> For example:
>
> x<-rnorm(20)
> y<-rnorm(20)
> str<-"lm(y~x)"
>
> I want to evaluate the "str" command.
>
> I
On Sunday 18 July 2004 12:29, Andrew Criswell wrote:
> It also seems to work with two lines of code crossed out.
>
> library(lattice)
> z <- expand.grid(A = LETTERS[1:8], B = letters[1:6], x = 1, y = 1)
>
> trellis.device(png, file = "test%02d.png")
> # par(bg = "white")
> # lset(col.whitebg())
> l
On Sunday 18 July 2004 10:29, Liaw, Andy wrote:
> Seems like a bug to me. I tried setting theme=col.whitebg in
> arguments to trellis.device, same result. Setting
> options(lattice.theme=col.whitebg) also does the same thing. The
> same thing happens win.metafile() for me. This is on WinXPPro,
>
On Friday 16 July 2004 16:32, Patrick Lorch wrote:
> Hello all,
> I am trying to use xyplot to give a six panel plot and to highlight
> only points (in any panel) that meet a certain criterion. With the
> plot command I would do something like:
> plot.default(filein$Site,filein$circ.
On Thursday 15 July 2004 03:01, Antonio Prioglio wrote:
> Hi list,
> As I understand statements within with() are local to what is
> enclosed within its expression.
>
> As some excellent examples given to me previously have illustrated it
> is nevertheless possible to assign the evaluation of an ex
On Friday 09 July 2004 12:05, Ernesto Jardim wrote:
> Yes,
>
> It works.
>
> Thanks
>
> EJ
>
> PS: It's inconsistent with boxplot, which works without making vec2 a
> factor.
Yes, and that's a design decision. In particular, it's controlled by the
horizontal argument in panel.bwplot, which comes
On Monday 05 July 2004 09:57, 8rino-Luca Pantani wrote:
> Dear R users,
> this is my first question to the list.
> I hope it will be not a trivial one.
>
> My problem is to change the order in which the panel are plotted in a
> lattice/Trellis plot.
> I've read the S-plus Trellis Graphics user manu
On Sunday 04 July 2004 21:02, [EMAIL PROTECTED] wrote:
> All,
>
> I have some data of animal movements that I'm plotting using xyplot()
> from lattice. I want to have the date (class POSIXct object) on the
> Y-axis and the animals longitude on X-axis. Eg.
>
> xyplot(date ~ longitude, groups = anima
On Friday 02 July 2004 09:00, Christian Hennig wrote:
> Hi list,
>
> I produced a trellis graphic with qqnorm (R-package lattice, no
> changes in graphical parameters were made).
> 1) The graphic uses some grey and some green colors and I would like
> to have it black and white as usual.
> 2) I wou
On Thursday 01 July 2004 17:24, Pam Goodman wrote:
> Deepayan,
> Thanks for the suggestions for changing the size of the screen
> devices/win.print. They did not work for me.
>
> Mea culpa, I neglected in my orinal email to say that it's just the
> vertical line of the y-axis that does not print, n
Quoting Pam Goodman <[EMAIL PROTECTED]>:
> Greetings,
>
> I am printing lattice plots from the R-interface to a printer, and although
> the y-axes of the left-most panels are visable on the screen, they are not
> present on the paper when there are multiple panels (ie, >1).
>
> For example:
>
On Friday 25 June 2004 09:11, [EMAIL PROTECTED] wrote:
> hi: where would I find facilities to draw circles, ovals, and
> semicircles? (or should I construct them myself using curve?)
The latter probably, but using lines rather than curve (these being
implicit/parametric functions). e.g.
tt =
Quoting Patrick Connolly <[EMAIL PROTECTED]>:
> On Wed, 23-Jun-2004 at 07:32AM -0500, Deepayan Sarkar wrote:
>
> [...]
>
> |> 1. You can specify the limits, tick positions, and axis labels
> |> individually for each panel (see documentation for 'scales&
On Wednesday 23 June 2004 06:36, Ingolfsson, Olafur wrote:
> Dear R group
>
> I am making multiple xyplot, and would like to have tick marks on
> bottom and left in EACH panel, but only tick labels at the bottom and
> left of the whole graph. I have browsed the internet, as well as the
> help page
On Sunday 20 June 2004 15:15, SAURIN wrote:
> Dear R,
>
> I am student at University of new haven, CT.I am trying to run my R
> scripts where I don't have X11() authentication to my account. I run
> those R scripts and when I generate any graphics I get error and it
> comes out from system.
>
> if
On Monday 14 June 2004 15:58, Scott Waichler wrote:
> I'm looking for a way to plot lines on top of a levelplot(),
> where the lines are borders between cells of different values.
> The clines() function provides contours suitable for continuous
> data. I am dealing with discrete values, spatial c
gt; On Jun 17, 2004, at 11:47 PM, Deepayan Sarkar wrote:
> > On Thursday 17 June 2004 22:24, Patrick Bennett wrote:
> >> I neglected to say that I am using the R-Aqua interface and the
> >> MASS, grid, & lattice packages.
> >>
> >> Here is one specific ex
On Thursday 17 June 2004 22:24, Patrick Bennett wrote:
> I neglected to say that I am using the R-Aqua interface and the MASS,
> grid, & lattice packages.
>
> Here is one specific example where I'm having trouble.
>
> After loading the crabs data set, I create the figure with the
> following code (
On Thursday 17 June 2004 19:37, Patrick Bennett wrote:
> I'm trying to learn how to create Trellis multi-panel plots, but I'm
> having some trouble reproducing the graphs shown in Venables & Ripley
> (2002) (e.g., Figs 4.14 & 4.15). Actually, everything looks fine
> except for the fact that I can't
On Thursday 10 June 2004 10:38, [EMAIL PROTECTED] wrote:
> Thanks for the info. Given that I rule out qqmath would the best
> method be to make repeated calls to qqnorm without plotting and then
> overlay the results or is there a more elegant method?
I don't think there's any good way currently.
On Thursday 10 June 2004 09:21, [EMAIL PROTECTED] wrote:
> Does the 'groups' option on qqmath just color the points differently
> in the main distribution or does it actually overlay separate
> quantile plots for each subset? I would like to be able to do the
> latter.
The 'groups' option doesn't
On Wednesday 09 June 2004 01:58, Tom Mulholland wrote:
> While using Lattice I received the following error.
>
> Error in if (xx != 0) xx/10 else z/10 : argument is of length zero
> In addition: Warning messages:
> 1: is.na() applied to non-(list or vector) in: is.na(x)
> 2: is.na() applied to non-
On Sunday 06 June 2004 20:40, Spencer Graves wrote:
> With "image" and "contour", one can get both colors and lines
> to enhance the image of a contour plot. What's the best way to do
> this with Lattice graphics? The following is one ugly hack,
> producing the desired result after much tri
On Sunday 06 June 2004 22:11, Charles and Kimberly Maner wrote:
> Hi. This did not work for me per my R output/session below:
> > library(lattice)
> > win.metafile()
> > trellis.par.set('background', list('white'))
This doesn't make sense; the components need to be named. Should be
trellis.par.
On Sunday 06 June 2004 18:10, Charles and Kimberly Maner wrote:
> Hi folks. It looks like it's stirred some discussion ultimately
> resulting/concluding that this phenomena is a possible bug either in
> the lattice package or in R 1.9.0/1.9.1 itself. So, I'll stay tuned,
> so to speak, for either
On Friday 04 June 2004 23:04, Matthew Walker wrote:
> Hi!
>
> I would like to know, how do you plot more than one data series when
> using "coplot"?
>
> I think I know the answer if "plot" is being used:
> x <- 1:10
> y <- 1:10
> y2 <- 1:10* 1.1
> plot ( y ~ x, type="n" )
> points( y ~ x, type = "b
On Tuesday 01 June 2004 09:01, Talita Leite wrote:
> Hi everybody!
>
> I'm trying to plot a parametric curve (three dimensions) using R but
> I didn't obtain good results. Somebody have already done something
> like that? Please help me!
Could you give us more details ? To me, this would be having
On Tuesday 01 June 2004 17:25, Spencer Graves wrote:
> I'm having trouble using binomial(link="cloglog") with GLMM in
> lme4, Version: 0.5-2, Date: 2004/03/11. The example in the Help file
> works fine, even simplified as follows:
>
> fm0 <- GLMM(immun~1, data=guImmun, family=binomial,
On Saturday 29 May 2004 20:18, Anthony Darrouzet-Nardi wrote:
> I have a followup question. Suppose I want to encode two different
> variables within a panel: one variable encoded by plotting character
> and one variable encoded by symbol color (as if I could use two
> "groups" variables). The dat
On Saturday 29 May 2004 15:24, Anthony Darrouzet-Nardi wrote:
> I'm trying to use plotting character to encode the variable "block"
> from my dataset in a conditioned lattice graphic (R 1.9.0 on Mac OS
> 10.3.3). The data I'm using is the dataframe "dryoutcover" which is
> here (4k):
>
> http://ant
Is this the new experimental lme4 (version 0.6-x) ? If so, this is due
to an error in our use of method dispatch. It has been fixed in the
development version, and there should be a new release in a few days.
On Friday 28 May 2004 19:32, Spencer Graves wrote:
> I'm trying to use GLMM in
On Thursday 27 May 2004 20:18, Greg Tarpinian wrote:
> Actually, it was very recent. I pulled the electronic
> version of the article from the Forbes website:
I would think twice before taking forbes articles too seriously. For
instance, they seem to think that protecting intellectual property
On Thursday 27 May 2004 17:24, Jeff D. Hamann wrote:
> I've been attempting to export a graphics file of my lattice plots
> and no matter what color I use for the bg= argument in the
> bmp/jpeg/png function, the background is grey.
>
> bmp(filename = "c:/my_paper/resids.bmp", width=1024, height=102
On Friday 21 May 2004 09:41, Federico Calboli wrote:
> Dear All,
>
> I would like to ask how to get the Sum of Squares from fitted lme
> model. I appreciate that lme maximises the likelihood (or REML) and
> uses likelihood ratio tests, but I just fail why I could not get the
> SS if I want them. I
On Tuesday 18 May 2004 17:10, Patrick Connolly wrote:
> I've been accustomed to specifying a postscript file and pointsize
> like so:
>
> trellis.device(postscript, file = "something.ps", pointsize = 8)
>
> Using version
> _
> platform i686-pc-linux-gnu
> arch i686
> os linux-gnu
On Sunday 16 May 2004 16:03, Matt Loveland wrote:
> Hi,
>
> I wrote a few days ago about an error message I'm getting when I use
> GLMM from lme4 to do random effects modelling.
> When I add random effects, I get the following error message: Error
> in "EMsteps<-"(`*tmp*`, value = control) : inva
On Wednesday 12 May 2004 18:39, Neil Desnoyers wrote:
> I am attempting to produce a bar chart and am having some trouble
> with the panel.barchart command.
That's not really helpful. If you expect us to help, you will have to
tell us exactly what you did and why you are unhappy with the resul
On Monday 10 May 2004 05:46, Stephan Moratti wrote:
> I tried following commands:
>
> amp~time|subject/trial #this was the grouping structure of the data
>
>
> plot(dip,inner=~condition,layout=c(2,2))
>
> after the plot command I obtained this error message:
>
> Error in if(!any(cond.max.level -
On Wednesday 12 May 2004 16:48, Matt Loveland wrote:
> Hi
>
> I'm using lme4 to do random effects modelling.
>
> I keep getting the following error message:
>
> Error in "EMsteps<-"(*tmp*', value = control) :
> invalid source matrix
>
> I get the error when I include more than one rando
On Monday 10 May 2004 05:46, Stephan Moratti wrote:
> I tried following commands:
>
> amp~time|subject/trial #this was the grouping structure of the data
>
>
> plot(dip,inner=~condition,layout=c(2,2))
>
> after the plot command I obtained this error message:
>
> Error in if(!any(cond.max.level -
On Saturday 08 May 2004 08:45, Patrick Giraudoux wrote:
> Dear all,
>
>
> I'm running into problem in R-1.9.0 that hasn't happened with
> R-1.8.x
>
> If I make a plot with xyplot(), and use the menu to either save to a
> metafile or copy to clipboard as a metafile to export to eg
> Powerpoint, I
On Friday 07 May 2004 16:07, [EMAIL PROTECTED] wrote:
> Hi R-helpers
>
> I would like to plot some planes which are perpendicular to the x-y
> plane, such as x=y. Is there a way to do this in wireframe? I
> realize that I am not plotting a function of x, y since there are
> infinite number of z's
On Thursday 06 May 2004 13:47, [EMAIL PROTECTED] wrote:
> All,
>
> I have long variable names that are being fed through splom (R
> 1.8.1). I'd like to resize the text printed on the diagonals to
> better display the names (unless anyone can suggest another approach
> - creative use of varnames). I
On Tuesday 04 May 2004 05:05 pm, Sean Davis wrote:
> Dear all,
>
> I am using panel graphics to do a stripplot of a variable versus a shingle
> and putting a loess curve on the stripplot. I want the data jittered, but
> I can't seem to get the panel function to work. This jitter's the data,
> but
On Monday 03 May 2004 09:36, Lutz Prechelt wrote:
> Dear Lattice bit-meddlers,
>
> while within a panel function for xyplot, how can I
> find out the values of (effectively) xlim and
> ylim -- no matter whether they have been set
> explicitly or chosen by Lattice itself?
>
> I have just tried for a
On Sunday 02 May 2004 03:30, Patrick Giraudoux wrote:
> Hi,
>
> I am gradually moving from the classical R plot functions to the
> library Lattice
>
> I have some questions about contourplot () and its arguments:
>
> 1/ I am working on geographical coordinates which makes necessary
> that the X (lo
On Saturday 01 May 2004 17:08, William Dieterich wrote:
> Dear List,
>
> I am plotting lmList objects using plot(intervals()) in nlme
> package. I want to make changes to the y-axis labels. When I
> try to change cex of y-axis labels using the following:
>
> fm1 <- lmList(distance ~ age | Subject,
On Thursday 29 April 2004 15:45, Yang, Richard wrote:
> Dear All;
>
> Attempting to reproduce Figure 4.15 of MEMSS (p. 171) in R using
>
> plot(Wafer, outer = ~ Wafer)
>
> yields an error:
> > plot(Wafer, outer = ~ Wafer)
>
> Error in order(na.last, decreasing, ...) :
> A
On Wednesday 28 April 2004 01:35, Yan Wang wrote:
> Thank you for the hints! I have some followup questions.
>
> About the panel function, here is the code I copied from the example:
> xyplot(NOx ~ C | EE, data = ethanol,
> prepanel = function(x, y) prepanel.loess(x, y, span =
>
On Tuesday 20 April 2004 14:31, Wiener, Matthew wrote:
> All --
>
> I am trying to combine trellis plots and having a couple of small
> problems.
>
> I'm trying to combine two trellis plots that display data of
> different kinds. Each has a single row of plots, and I'd like to
> display them over
On Tuesday 20 April 2004 12:16, W. C. Thacker wrote:
> Is there a way to get panel.grid to put the grid lines at specific
> locations? It would be nice to have them correspond to selected tick
> marks.
?panel.grid says:
Arguments:
h,v: For panel.abline, numerical vectors giving y and x loc
Your example is not reproducible. The following gives what I would
expect (even with your modified settings):
data(singer)
bwplot(voice.part ~ height, data=singer,
panel=function(x,y,...) {
panel.abline(v=65)
panel.bwplot(x,y,...)
})
My suspicion is that wha
On Wednesday 14 April 2004 11:13 am, Dave Atkins wrote:
> I am interested to use plotmath functions within a panel function but am
> having some problems getting the code right. Within each panel I am
> plotting the data, fitting a regression line, and would like to print the
> regression equation
On Tuesday 13 April 2004 12:51, Sundar Dorai-Raj wrote:
> Hi all,
>I just installed R-1.9.0 on Windows 2000 from binaries. Yesterday,
> on R-1.8.1 I ran a script that looked like:
>
> library(lattice)
> tmp <- expand.grid(A = 1:3, B = letters[1:2])
> tmp$z <- runif(NROW(tmp))
> trellis.device(p
On Monday 22 March 2004 18:53, Ernesto Jardim wrote:
> Hi,
>
> I'm using lattice (bwplot) to produce some plots. I want to put the
> value of the parameter and use plotmath on the top bar of each plot.
> Is there an easy way to do it ?
What do you mean by 'top bar' ?
The last example in demo(lat
On Monday 22 March 2004 07:15, Michael Dewey wrote:
> I generate a groupedData object
>
> library(nlme)
> obj <- groupedData(mg10 ~ time | gp, data = common, outer = ~pct)
>
> gp has 101 levels, and pct has 3. There are 38, 25, 38 gps in each of
> the levels of pct respectively.
>
> I fit my model
On Monday 22 March 2004 11:55, Steven Lacey wrote:
> Hi,
>
>
>
> I am working with R 1.81. When I call bwplot() it prints the output
> to the windows device as it should. For example,
>
>
>
> d<-data.frame(y=c(2,3,4,5,12,14,16,11),x=c(rep("group1",4),rep("group
>2",4)))
>
> bwplot(y~x,data=d)
>
>
>
On Sunday 21 March 2004 13:23, Marco Chiarandini wrote:
> Thank you a lot! It works exactly as I desired.
>
> I dare to ask you another detail about Trellis multiple display
> plots. I would like to plot vertical lines in correspondence of the
> confidence intervals with the function below in order
On Sunday 21 March 2004 12:08, Marco Chiarandini wrote:
> Dear all,
>
> I would like to plot a multipanel display. Each plot should have the
> curve over time of the solution produced by 10 different algorithms
> (groups of data).
>
> I handle this with:
>
>
> xyplot(quality~time | inst, data=profi
Both auto.key and simpleKey are convenience tools to make key drawing
easy in 'typical' cases. For more flexibility, define the key as a list
(the structure is described under 'key' in ?xyplot). You may want to
look at ?Rows as well, in conjunction with trellis.par.get().
See ?splom and ?cloud
On Tuesday 16 March 2004 09:52, Liaw, Andy wrote:
> > From: Carlos Saavedra
> >
> > Dear R users,,
> >
> > I'm having difficulties when i use the gstat extensions in R
> > especially with the graphical interface, as the
> > variograms plots are depicted with gray background and cyan
> > points for
On Sunday 14 March 2004 08:39, Christian Schulz wrote:
> Hi,
>
> how it's possible to get the level values (not the numeric values!)
> on the x-axis in a lattice histogram? I found nothing related
> in archives and my my attempts didn't success , but AKTIVE is a
> factor?
I guess this would quali
On Tuesday 09 March 2004 05:46, Hernan Dopazo wrote:
> Dear R users,
>
> I have changed my R version to the new 1.8.1 and some problems appears
> when using the previous levelplot code.
>
> This is a simple example:
>
> a <-1:10
> b <-11:20
> j <- rnorm(100)
> grid<-expand.grid(a = a, b = b)
> leve
On Thursday 04 March 2004 14:28, Matt Pocernich wrote:
> Hi,
>
> I am trying to plot different variables from a data.frame using
> lattice's xyplot using code like that below. How do I specify a symbol
> and color for the variable 'prob' and different one's for 'll.prob'?
>
> Thanks, Matt
>
> xyp
On Wednesday 03 March 2004 05:09, [EMAIL PROTECTED] wrote:
> Context: Windows XP, R 1.8.1
>
> I'm studying Venables-Ripley "MASS" book and having a go at the many
> examples in library MASS. The code I'm checking (from script ch04.R) now
> is
>
> ..
> data(swiss)
> splom(~ swiss, aspect = "fil
On Friday 27 February 2004 01:59, Prof Brian Ripley wrote:
> On Fri, 27 Feb 2004, Deepayan Sarkar wrote:
> > There has always been an update() method that's supposed to be used
> > for this. No one uses it much, and it probably has a few bugs (but
> > should be improved
On Thursday 26 February 2004 14:47, Rajarshi Guha wrote:
> Hi I had two questions regarding plots:
>
> * Is there are way to save a plot in the form of an object such that it
> could be displayed/modified later?
Depends on what you want to do. Probably not for regular (base) plots. The
grid packa
On Wednesday 25 February 2004 14:00, Jeff Jorgensen wrote:
> Thanks for putting me on the right track. Sorry to be bothersome with
> another follow-up, but the code that calls the panel function (see
> below) doesn't seem to be working. What am I doing wrong?
You are using this wrong. In particu
On Thursday 26 February 2004 10:13, David Thibault wrote:
> Hello all,
>
> I have a situation where I'd like to plot points from multiple groups of
> data in one plot. I'd like each group's points to be colored a
> different color. I've seen people comment on how you can alternate
> colors by pro
On Wednesday 25 February 2004 08:13, Jeff Jorgensen wrote:
> Deepayan,
>
> Thanks for the quick response. Just to make sure I understand, let me
> explain in a bit more detail what I am trying to do.
>
> I have created a levelplot (with contour lines and colored regions), and
> what I am trying to
On Tuesday 24 February 2004 18:03, Jeff Jorgensen wrote:
> R folks,
>
> I can't seem to find the instructions in the help files for the lattice
> package that explain how to add lines, such as with lines() or ?, to a
> levelplot. I'd be grateful if someone could point me in the proper
> direction.
On Monday 23 February 2004 09:57, Rodrigo Abt wrote:
> Dear R-listers,
>
> I got an error when I try to plot two grouped data into a single
> win.metafile device:
>
> library(lattice)
> trellis.device(device="win.metafile",color=F,filename="Profiles-Var1.wmf
>") par(mfrow=c(1,2))
par() settings h
On Tuesday 17 February 2004 03:51, Luke Keele wrote:
> I am looking for examples of code that demonstrates the
> fine tuning of the strip panels in lattice graphics and
> uses plotmath characters. The code for the graphic is as
> follows:
>
>
>
> xyplot(lagy ~ n | rho1 * rho2, data= data, layout=c
On Monday 16 February 2004 10:37, Martina Pavlicova wrote:
> Hi all,
>
> I would like to draw one picture which would show two
> different types of boxplots using the same axes (kind of
> on top of each other). However, I would like to plot each
> boxplot using a different color or different shad
On Friday 13 February 2004 07:18, Dieter Menne wrote:
[...]
> Dieter Menne:
>
> See also
>
> http://maths.newcastle.edu.au/~rking/R/help/01c/2820.html
>
> Deepayan, at that time I received an e-mail (not in the archives) from you
> saying that this feature was already in the code, but not yet act
On Thursday 12 February 2004 03:12, Wolfram Fischer - Z/I/M wrote:
> How to show panels for factor levels of conditioning variables
> which do have no values?
>
> E.g. there are panels for "Grand Rapids" when they have values:
> data( barley )
> with( barley, dotplot(variety ~ yield | y
On Tuesday 10 February 2004 18:07, Jeff Jorgensen wrote:
> Dear R'ers,
>
> I've scanned available documentation and the web, but I can't seem to
> figure out where I've gone wrong in adding numbers to scale the colorkey in
> levelplot (Lattice package). For example,
>
> levelplot(z, contour=T, lab
On Tuesday 10 February 2004 11:55, [EMAIL PROTECTED] wrote:
> How can I use row.names() as y-labels in Dotplot? How to set horizontal
> orientation for y-lables in lattice()?
>
> Dotplot(stcod1 ~ Cbind(statgh2,statgh2-1.96*segh2,statgh2+1.96*segh2)[og],
> subset=statgh2[og]>0.1, data=h2inqerrg02st,
On Tuesday 10 February 2004 11:27, Wolfram Fischer wrote:
> Is there an easy way to have scales beginning with zero and
> ending with the local maximum data value of each panel
> when using a lattice function with ``scales=list( relation="free" )''?
Add
prepanel = function(x, y, ...) list(xlim
uot;73/1" "77/1" "78/2" "80/2" "81/2" "8/2""83/2" "84/1"
[121] "85/1" "86/1" "87/2" "88/2" "89/2" "90/1" "91/1" "9/2&qu
I would need a real example to figure this out. Could you send me your data as
an rda file (saved using save() and your code ? (No guarantees as to how fast
I can reply, though. I'm somewhat busy with other things.)
On Thursday 05 February 2004 01:52 pm, Umberto Maggiore wrote:
> It works. Howe
On Wednesday 04 February 2004 04:03, Umberto Maggiore wrote:
> Using data from a multicenter study with a parallel-group design comparing
> two treatments, I plotted each subject's time change of X after stratifying
> for center:
>
> xyplot(X ~ time | center, type="l", panel=panel.superpose, groups
On Tuesday 03 February 2004 01:26, Prof Brian Ripley wrote:
> I think you misunderstand what barchart does. It expects a formula, not a
> named vector, as its first argument.
>
> nm <- names(T3)
> z <- factor(nm, levels=nm)
> barchart(z ~ T3, xlab="Mean Values", col="dark blue")
>
> is probably w
On Friday 30 January 2004 06:13, Pascal A. Niklaus wrote:
> Hi all,
>
> I'd like to plot a set of data (x,y,z) as 3D-cloud, and add several line
> plots to the same 3D graph:
>
> Two questions:
>
> 1) How do I connect points to get a line?
>
> > cloud(z~x*y,data=d,zlim=c(0,1))# works
> > cl
On Tuesday 20 January 2004 04:14, Wolfram Fischer wrote:
> How one can add a text (e.g. the labels of an axis)
> in a space between grouped panels which was created
> by using the argument ``between''?
>
> Example:
> data(barley)
> dotplot(variety ~ yield | site * year, data=barley,
>
On Saturday 17 January 2004 08:58, Karl Knoblick wrote:
> Hallo!
>
> I want to plot multiple grouped data in a postscript
> file using a loop. As I use a loop no plot (or just
> one empty plot) is generated. Here an example:
>
> library(nlme)
> data(Loblolly) # example data from nlme
> postscript("
On Friday 16 January 2004 10:02, Laura Quinn wrote:
> I am having problems exporting a plot to a jpg file. I am first setting up
> a basic plot, and then opening up a viewport and overlaying grid.arrows
> onto the plot - I don't seem able to save this plot with the overlaid
> arrows to a file, can
On Friday 16 January 2004 00:51, Mulholland, Tom wrote:
> When I first started using lattice I found the colour schemes a bit
> confusing. So eventually I came up with the colours I wanted.
>
> The code below was one of those attempts. One thing that happened
> however was that I kept shutting down
On Friday 02 January 2004 14:29, Patrick Giraudoux wrote:
> Hello,
>
> I am trying to use "bwplot" to display whisker boxes according to some
> conditioning factors ("age" has two values 1/2). I get the following
> messages:
>
> > library(trellis)
I'm not aware of any such package, but I'll ass
On Friday 19 December 2003 14:23, Waichler, Scott R wrote:
> Can anyone tell me how to obtain a custom scale for
> the colorkey in each levelplot of a lattice? I am using
> lattice and levelplot to plot z = f(x, y) for multiple z
> variables. x and y values are the same across plots, but
> units
On Tuesday 09 December 2003 16:37, Hadley Wickham wrote:
> Hi all,
>
> I've created a custom lattice panel function for levelplot - instead of
> representing z by colour, it plot circles with radius proportional to z
> (in the style of the map plots of Jacques Bertin). I'm happy to email
> an exam
On Thursday 04 December 2003 21:19, Patrick Connolly wrote:
> I'm having a spot of bother using code that worked with R-1.7.1 but
> will not work with 1.8.1.
>
> The beginning of the saga is with grid.polygon ostensibly not
> findable. One does exist in /R-1.8.1/library/grid/R, and when I
> sp
What version of lattice is this ? (try library(help = lattice)). What happens
when you type library(grid) ?
Both grid and lattice are recommended packages, so appropriate versions of
both should have been installed along with R 1.8.1. From your error message
(which mentions /usr/local/lib/R/si
On Thursday 06 November 2003 05:33, AJ Smit wrote:
> Dear all
>
> How does one get a levelplot (lattice library) to plot NAs in a
> different colour to that specified in the default colorkey?
You can't do it. If you don't need to distinguish NA's and missing points
(that is (x,y) pairs that are c
For any matrix, the following definitions hold:
row rank: number of linearly independent rows
column rank: number of linearly independent columns
There is a theorem stating that these 2 numbers must be the same
for any matrix, and (consequently) that number is defined as the
'rank' of the m
701 - 800 of 901 matches
Mail list logo