search for: rowpo

Displaying 20 results from an estimated 20 matches for "rowpo".

Did you mean: rowpos
2004 Nov 28
1
Is this a bug in the parser? (PR#7395)
...(after finishing it) to # your favorite email program and send it to # # r-bugs@r-project.org # ###################################################### <<insert bug report here>> Is this a bug in the parser? Specifically, the trace lines Browse[1]> x [[1]] [1] "factor(-(rowpos <= 2) + (rowpos >= 6), labels = c(\"1:2\", \"3:5\", " [2] " ~\"6:8\"))" suggest that a single statement was arbitrarily cut into two pieces, neither of which makes syntactic sense, when the...
2010 May 24
1
lattice 'scales' option help
...draw boxplots. I'm having a hard time to get "ticks labels" on multiple panels using 'alternating' option. # R Code: # May not be the best example, please just look into 'scales' option library(lattice) data(OrchardSprays) dta <- subset(OrchardSprays, OrchardSprays$rowpos %in% c(1,2,3)) # Original # This works fine, as you can see Y-AXIS labels (0,50,100) on both Panel-1 and Panel-3, and # X-AXIS lables (A,B,C,...) on both Panel-1 and Panel-2 bwplot(decrease ~ treatment | factor(rowpos), data=dta, pch="|", scales=list(y=list(alternating=1)) # default...
2010 Mar 19
1
One main title and One legend for multiple lattice plots
Hi All, Can anyone please help me with getting a "single title" and "legend" for both the plots in the following R code. I'll eventually be using .wmf file. # R code: library(lattice) p1 <- xyplot(decrease ~ treatment, OrchardSprays, groups = rowpos, type = "a", main="Same title / legend", auto.key = list(space = "right", points = FALSE, lines = TRUE)) p2 <- xyplot(decrease ~ treatment, OrchardSprays, groups = rowpos, type = "a", main="Same title / legend", auto....
2009 Apr 17
0
Margins in lattice and device resolution
...ging resolution? ---- Example: ..... ###This give a totally squished graph, where the actual plotting area is minimal CairoPNG("example.png",width = 480, height = 480, dpi=600, pointsize = 12, bg = "white") bwplot(decrease ~ treatment, OrchardSprays, groups = rowpos, panel = "panel.superpose", panel.groups = "panel.linejoin", xlab = "treatment", key = list(lines = Rows(trellis.par.get("superpose.line"), c(1:7, 1)), text = list(lab = as.character(unique(Orch...
2002 Aug 13
1
interaction.plot() legend too narrow when mfcol > 2 (PR#1899)
...l space for the legend is not flexible enough. ## Call a new graphics window {with default par()s !}: get(getOption("device"))() par(mfrow = c(2,2)) ## part of example(interaction.plot) _improved_ using with() : data(OrchardSprays) with(OrchardSprays, { interaction.plot(treatment, rowpos, decrease) interaction.plot(rowpos, treatment, decrease) }) data(esoph) with(esoph, { interaction.plot(agegp, alcgp, ncases/ncontrols) interaction.plot(agegp, tobgp, ncases/ncontrols, trace.label="tobacco", fixed=TRUE) }) -------------------------------...
2013 May 03
1
print multiple plots to jpeg, one lattice and one ggplot2
...succeed the first plot (bwplot) print to the defined position, but the second (ggplot) doesn't Any idea? Thanks a lot Christophe # Example: #------------------------------------- library(ggplot2) library(lattice) library(grid) one <- bwplot(decrease ~ treatment, OrchardSprays, groups = rowpos, panel = "panel.superpose", panel.groups = "panel.linejoin", xlab = "treatment", key = list(lines = Rows(trellis.par.get("superpose.line"), c(1:7, 1)), text = list(lab = as.character(unique(Orch...
2012 Oct 10
2
se's and CI's for fitted lines in multivariate regression analysis
...only get the differences in standard error between lines. Also by running confint(model), I have the same problem. How can I get standard error per or the CI-interval for each fitted line? I?ve attached the coding underneath. Thank you, Sigrid > data(OrchardSprays) > model<-lm(decrease~rowpos+colpos+treatment+treatment:colpos) > summary(model) -- View this message in context: http://r.789695.n4.nabble.com/se-s-and-CI-s-for-fitted-lines-in-multivariate-regression-analysis-tp4645703.html Sent from the R help mailing list archive at Nabble.com.
2011 Sep 13
1
stupid lm() question
I feel bad even asking, but: Rgames> data(OrchardSprays) Rgames> model<-lm(decrease~.,data=OrchardSprays) Rgames> model Call: lm(formula = decrease ~ ., data = OrchardSprays) Coefficients: (Intercept) rowpos colpos treatmentB treatmentC 22.705 -2.784 -1.234 3.000 20.625 treatmentD treatmentE treatmentF treatmentG treatmentH 30.375 58.500 64.375 63.875 85.625 Rgames> levels(OrchardSprays$treatment) #just double-check...
2005 Aug 12
1
Problem with lme4
...ng object(s) are masked from package:nlme : getCovariateFormula getResponseFormula groupedData Error in autoloader(name = "confint", package = "MASS") : autoloader did not find 'confint' in 'MASS' > (fm1 <- lmer(decrease ~ treatment + (1|rowpos) + (1|colpos), + OrchardSprays)) Error: couldn't find function "lmer" > Is this a bug with the lme4 package for Debian (r-cran-lme4)? Peter ######################### R : Copyright 2005, The R Foundation for Statistical Computing Version 2.1.1 (...
2010 Mar 18
2
multiple print commands in win.metafile()
...int commands at once (please see below). Is there an alternative to get plots file which can be used in powerpoint/word? # R code: # this does not work; but same thing works with pdf() library(lattice) win.metafile("test.wmf") p1 <- xyplot(decrease ~ treatment, OrchardSprays, groups = rowpos, type = "a", auto.key = list(space = "right", points = FALSE, lines = TRUE)) p2 <- xyplot(sunspot.year ~ 1700:1988, xlab = "", type = "l", scales = list(x = list(alternating = 2)), main = "Yearly Su...
2013 Feb 14
1
Alternate tick labels in xyplot
Dear Rhelp, I would like to get alternate tick labels for the xyplot: library(lattice) library(grid) xy <-xyplot(decrease ~ treatment, OrchardSprays, ??? main= "Some plot", ??????? groups = rowpos, type = "a", ??? ??????????? page???? = function(n){ ???????????????????????? grid.text(LETTERS[j], ???????????????????????? y = 0.95, ???????????????????????? x = 0.15, ???????????????????????? default.units = "npc", ???????????????????????? just = c("left"), ???????...
2009 Apr 03
2
Titles on lattice colorkey
..., its a question. Is it possible to add titles to colorkey legends? As far as I can tell, there is a command to do it for normal "key" legends, but not for "colorkeys". eg it works for a normal key, created through auto.key xyplot(decrease ~ treatment, OrchardSprays, groups = rowpos, type = "a", auto.key = list(space = "right", points = FALSE, lines = TRUE,title="Key title")) but there is no comparable command for a colorkey x <- seq(pi/4, 5 * pi, length = 100) y <- seq(pi/4, 5 * pi, length = 100) r <- as.vector(sqrt(oute...
2009 Apr 24
1
How to custom the tick and type in bwplot
Dear R users I use bwplot to plot some figures. There are two troubles: 1. How to change the dot of the mean to a line, like the style in boxplot 2. How to hide some tick marks. For example, I have seven tick: A, B, C, D, E, F, G, but I want show four marks: A, C, E, G on the x-axis. Thanks! -- Kind Regards, Guanghong [[alternative HTML version deleted]]
2013 Jul 30
2
Xyplot
Estimados, tengo una consulta acerca de gráficas con xyplot. Tengo una base de datos con dos perfiles de concentracion por sujeto, ya que a cada sujeto se le administraron dos formulaciones. Con la función xyplot he podido graficar cada perfil separando sujetos y formulaciones: pl <- xyplot (DV~TIME | factor(ID)+factor(FORM), data=tab, type = 'l',
2009 Apr 25
4
dotplot: labeling coordinates for each point
Hi all, I used dotplot to draw a graph for a dataset with size of 100. Since the x-axis are all texts, so they are mixed up and not readable. Is there any way to make it readable or how can I add labels to all the points with its (x,y) coordinates? Thanks for your help. Best, Tony [[alternative HTML version deleted]]
2006 Mar 26
2
range and bwplot
Hi, is there an equivalent to the 'range' option of the boxplot function to be found in the bwplot function of the trellis package? regards Vincent [[alternative HTML version deleted]]
2013 Feb 27
0
xyplot and barplot in the same page
Dear Rhelp, I am trying to get multiple xyplots and barplots in the same page.? I couldn't get it work. Example code: library(lattice) library(grid) xy <-xyplot(decrease ~ treatment, OrchardSprays, ??? main= "Some plot", ??????? groups = rowpos, type = "a", ??? scales=list(x=list(at=seq(1,8,1),labels=c('A','','C','','E','','G',''))), ??? ??????????? page???? = function(n){ ???????????????????????? grid.text(LETTERS[j], ???????????????????????? y = 0.95, ???????????...
2013 Jul 30
0
Xyplot
Hola, Lo puedes hacer utilizando el parámetro "groups=ID". Mira el ejemplo de xyplot equivalente: xyplot(decrease ~ treatment, OrchardSprays, *groups = rowpos*, type = "a", auto.key = list(space = "right", points = FALSE, lines = TRUE)) Saludos, Carlos Ortega www.qualityexcellence.es El 30 de julio de 2013 17:47, Manuel Ibarra <mibarra@fq.edu.uy> escribió: > Estimados, tengo una consulta acerca de g...
2009 Jan 21
1
Text Outside Lattice Plot
Dear R users I created the graph at the bottom using xyplot in the lattice package. I added a title using the main="Title" command in xyplot, however it is plotted too close to the legend for my liking. To remedy this I increased the upper margin of the plot using plot(data, position = c(0,0,1,.9)) and attempted to move "SNA" upwards and to the right. I have tried using a
2009 Jul 21
2
Adjusting x/y text labels for a bwplot using cex.lab
Searched for this and found some help, but I still can't figure it out. I have trying to enlarge the x and y labels on my box plot. I understand that you can do this using "cex.lab", but it does not seem to be working for me. I must be adding it in the wrong spot. Any help would be greatly appreciated. Here is my code: bwplot(hr~Herd, data=telemetry, notch=T, ylab="Home