Displaying 20 results from an estimated 6000 matches similar to: "dotplot, dropping unused levels of 'y'"
2010 Aug 24
1
drop unused levels in lattice dotplot axis?
Hi list, I have a data set - something like this
dfr <- data.frame(A=factor(letters[1:25]),B=runif(25), C=sample(LETTERS[1:4],25,replace=TRUE))
and I want to create a dotplot:
library(lattice)dotplot(A ~ B | C, data=dfr, scales=list(y=list(relation="free")))
but this puts uneven spaces along the y-axis in each panel. drop.unused.levels=TRUE will drop conditioning
2010 Jan 14
1
lattice dotplot with missing levels in factor variable
Hi,
I am trying to create a dotplot where each panel shows levels vs.
responses; the levels are sorted by responses but levels vary from one
panel to another. However, I run into problems with controlling the
y-limits and y-labels.
In particular, suppose I have a data frame
rsp <- c(10,2,4,0,2,3)
lvl <-
2006 Sep 16
2
dotplot/Dotplot: connecting points within factor level across time
For each level of the factor in dotplot, I have time points I'd like to
connect with a line. In the example below, 'x' represents a starting
time and 'd' a duration, and I wish to connect 'x' to 'x+d'. Ordinarily
I would use Dotplot from hmisc for this, but I have not been able to
find a time class that Dotplot will allow. I can get lattice dotplot to
put
2010 May 25
2
segplot (latticeExtra)
Hi,
I'm having a bit of trouble with 'scales="free"' in the segplot()
function of latticeExtra. Say we need panels for each year, showing
only those counties that are represented in each one:
---<--------------------cut here---------------start------------------->---
library(latticeExtra)
data(USCancerRates)
uscr.w <- subset(USCancerRates, state ==
2006 Oct 02
2
xyplot Graphic Help
I have the following graphic where I drop unused factors in the x axis, however I cannot get the first point on the second panel. It seems shifted. Any ideas?
The example is below:
data <- data.frame(
Room=as.factor(c(132,132,132,132,132,132,132,132,132,196,196)),
2004 Aug 16
1
Dotplot with nested factors
I am using the dotplot function from the lattice package to
display a quantitative variable versus two factors, say 'a' and
'b'. The levels of 'a' are nested within levels of 'b'. The
issue is that dotplot includes all the levels of 'a' in each panel
(conditioning on 'b'), even though many are empty in any given
panel. A toy example is
dat
2006 Oct 11
1
panel-dependent distribution in qqmath
In qqmath, how would one go about having 'distribution' change with
panel.number? I've tried
set.seed(1)
mydata <- data.frame(ind = factor(rep(2:4, each = 100)))
mydata$val <- rt(300, df=rep(2:4, each = 100))
plot<-qqmath(~ val | ind,
layout=c(3,1),
data = mydata,
prepanel = function(x, distribution, ...) {
2013 Feb 15
3
lattice 3x3 plot: force common y-limits accross rows and align x-axes
Good afternoon,
I would like to ask for help in controlling y-axis limits and labels in
lattice doplots. Unfortunately, the problem is somewhat convoluted,
please bear with the long explanation.
I would like to create a 3x3 lattice of dotplots, say subject ~ count.
The plot is conditioned on variables treatment and risk: subject ~ count
| treatment + risk. In the experiment, not all subjects
2006 Oct 12
2
adding error bars to lattice plots
Dear R users,
About a year ago Deepayan offered a suggestion to incorporate error bars
into a dotplot using the singer data as an example
<<http://finzi.psych.upenn.edu/R/Rhelp02a/archive/63875.html>>.
When I try to utilize this code with a grouping variable, I get an error
stating that the subscripts argument is missing. I have tried to insert
them in various ways, but cannot
2011 Aug 02
1
lattice: index plot
Dear all,
How can I make an index plot with lattice, that is plotting a vector
simply against its particular index in the vector, i.e. something
similar to
y <- rnorm(10)
plot(y)
I don't want to specify the x's manually, as this could become
cumbersome when having multiple panels.
I tried something like
library(lattice)
mp <- function(x, y, ...) {
x <- 1:length(y)
2006 Mar 01
2
lattice-Internal
Hi,
The functions prepanel.default.bwplot() and lpretty() are not running in Deepayan's
barley example concerning vertical bars with the lattice function barchart().
Why, is there a restricted use for the package lattice-Internal?
Urs Simmen
mailto:usimmen at dtc.ch
2007 Jan 08
1
finer control of scales in xyplot
When plotting over multiple pages in lattice, I'd like to be able to
have "same" scales within a page, but "free" scales between pages. In
other words, something like:
z<-data.frame(x=1:100,
y=runif(100),
d=rep(1:2,50),
p=rep(1:2,each=50))
plot<-xyplot(y~x|d*p,
data=z,
2012 Sep 20
3
lattice dotplot reorder contiguous levels
my reproducible example
test<-structure(list(site = structure(c(1L, 1L, 1L, 1L, 1L, 1L, 2L,
2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 2L, 3L,
3L, 3L, 3L, 3L, 3L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L,
4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 4L, 5L), .Label = c("A",
"B", "C", "D", "E"), class = "factor"),
2003 Jan 15
2
[lattice] lines for stripplot (like dotplot) or jitter for dotplot?
I'd like to use stripplot for some plots because I want to use
the jitter parameter. On the other hand, I'd like to use dotplot
because I'd like to have the horizontal lines that it includes.
dotplot doesn't have a jitter option and I'm not having any
success with getting panel.grid(h=-1) with stripplot. Can anyone
show me how to make dotplot-like lines on a stripplot? Or
2004 Feb 10
2
Dotplot: y-labels from rownames
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, xlab="G",
ylab=row.names(h2inqerrg02st)[og], main="")
I have tried doing it with mtext() as well, but there is not enough space
besides
2010 Feb 18
3
Can R make an usual dotplot
Dear R experts,
Can R make an usual dotplot just like Minitab and other softwares?
I have the following data, and can use dotchart to graph a dotplot:
y=c(2.873438152e-01, -8.732895642e-01,
4.579001889e-01, 1.047395204e+00,
8.491182299e-02 , -1.938007105e+00,
-1.273708343e+00, 9.848010588e-05,
7.238490734e-01, -1.490552717e+00)
dotchart(y, xlab="10 observations from
2009 Feb 19
2
dotplot points color
Dear list,
is it possible to change the background color of dotplot's points? I tried
in many ways but unsuccessfully
Thanks in advance
Gianandrea
require(lattice)
dotplot(variety ~ yield | site, data = barley, groups = year, pch=21)
dotplot(variety ~ yield | site, data = barley, groups = year, pch=21,
bg=c("2","3")) ??!!!
--
View this message in context:
2001 Jan 18
2
dotplot: character size of labels
Dear R users,
using dotplot (R1.2.0, WinNT4.0), I am trying to change the character size
of the labels of the points:
> # example
> data(VADeaths)
> dotplot(VADeaths, main = "Death Rates in Virginia - 1940")
> # I'd like to have smaller character size of the labels (for age and
population groups)
> ?dotplot
> # for argument "cex", this says:
2007 May 16
2
Abline in dotplot
Hello,
I have trouble adding an abline to a dotplot() from "lattice" package.
For example, I would like to draw a line at x=3:
> library(lattice)
> x<-1:5
> names(x) <- c("a", "b", "c", "d", "e")
> dotplot(sample(x))
> panel.abline(v=3)
Produces a line on the left hand side of the origin. What would be a
correct
2006 Jul 07
2
dotplot (lattice) with panel.segments and groups
Hi,
The following produces almost exactly what I needed. The problems are
that the 'panel.dotplot' call (commented) generates the error 'Error in
NextMethod("[") : argument "subscripts" is missing, with no default'. The
other problem is that the colors alternate between the levels of the 'site'
variable, rather than 'year'.
barley$yield2