Displaying 20 results from an estimated 30 matches for "darkgrey".
Did you mean:
darkgray
2009 Mar 09
1
Adding text to both grid and base graphs
...ify these graphs later on with a bit of
identifying text (e.g. a date and some comments). Adding text to these
graphs cannot be done using a common system if you want to save them as emf
files. I now use:
mtext("labelling
text",outer=TRUE,at=0.5,adj=0.5,line=-1.1,side=1,cex=0.7,col="darkgrey")
for base graphs and
grid.text("labelling text",x=0.5,y=0.005,just="bottom",gp=gpar(fontsize=8,
col="darkgrey"))
for grid graphs.
Unfortunately if I were to use mtext on a grid graph and copy to emf, I get
the error:
Error in dev.copy(win.metafile, pltfile)...
2010 Aug 14
1
is it possible to map 2 plots(c and d) in a single output plot?
is it possible to map 2 plots(c and d) in a single output plot?
library(ggplot2)
c <- ggplot(mtcars, aes(qsec, wt))
d <- ggplot (mtcars, aes(qsec, wt))
c + stat_smooth(fill="darkgrey", colour="blue", size=2, alpha = 0.2)
d + stat_smooth(fill="darkgrey", colour="red", size=2, alpha = 0.2)
--
View this message in context: http://r.789695.n4.nabble.com/is-it-possible-to-map-2-plots-c-and-d-in-a-single-output-plot-tp2325023p2325023.html
Sent from...
2023 Jan 12
1
Reg: ggplot error
...read correctly
ICUData <- read.csv(file = "ICUData.csv", stringsAsFactors = TRUE)
ICUData.neuro <- ICUData[ICUData$surgery == "neuro",]
2. ggplot(ICUData, aes(x=ICUData.neuro$LOS)) +
geom_histogram(aes(y=after_stat(density)), binwidth = 5,
fill = "darkgrey")
gives me error
Error in `check_aesthetics()`:
! Aesthetics must be either length 1 or the same as the data (500): x
Run `]8;;rstudio:run:rlang::last_error()rlang::last_error()]8;;` to see where the error occurred.
which, I believe, resulted from using whole ICUData in ggplot but only ICUD...
2008 Aug 25
1
lattice : using both strip and strip.left
...> # lattice version
> lattice.options(default.theme = canonical.theme(color = T))
> trellis.par.set("strip.border" = list(col="white"))
> trellis.par.set("background" = list(col="white"))
> trellis.par.set("axis.line" = list(col="darkgrey"))
> trellis.par.set("strip.background" = list(col="darkgrey"))
> trellis.par.set("plot.symbol" = list(col = myColors, pch=16, cex=0.8))
>
>
> p2 <- xyplot(value ~ x | condition1 + condition2, data=df, groups =
> variable,
> strip=strip....
2004 Aug 06
1
Lattice: how to index in a custom panel function?
...r Linux
panel.txt = function(sometxt,x,y,...){
grid.text(sometxt,x,y)
}
xyplot(data = Pdata, P ~ DAS | FactorA,
groups = FactorB,
type ="s",
col = c("red","blue"),
panel = function(x,y,...){
panel.abline(h = 100, lty = 5, lwd =0.5, col = "darkgrey")
panel.txt(mytext, 0.2, 0.8)
}
--
======================================================================
Joris De Wolf
CropDesign N.V.
Plant Evaluation Group
Technologiepark 3
B-9052 Zwijnaarde
Belgium
Tel. : +32 9 242 91 55
Fax : +32 9 241 91 73
=========================...
2009 May 14
2
How to do a pretty panel plot?
...6.4, 16.12, 18.04, 18.46, 18.86, 20.24, 23.53)), .Names = c("date",
"cospi", "cospi.PE"), row.names = 209:232, class = "data.frame")
par(mfrow=c(2,1)) # try to get two plots, one above the other
plot(M$date, M$cospi, type="l", col="darkgrey", log="y",
xaxs="i", yaxs="i", axes=FALSE,
ylab="Cospi level")
axis(1, col="lightgrey", at=NULL, labels=FALSE)
axis(2, col="lightgrey", labels=TRUE)
plot(M$date, M$cospi.PE, type="l", col="darkgrey", log...
2009 Dec 23
5
iid.test
I downloaded the iid.test, but I can't run it. I get the following message:
Error: could not find function "iid.test"
Where am I supposed to save this package in order that it works?
Thanks,
EZ
[[alternative HTML version deleted]]
2013 Feb 18
2
continuous shading in plots
...SE, xaxs="i", yaxs="i",bty="L" )
polygon(c(0,18,18), c(0,6,0), col='light grey', border = NA)
polygon(c(0,18,18), c(0,2,0), col='grey', border = NA) However, I would like to make such a plot, but where there is a continuous shading changing fom white to darkgrey. Can anyone give me any suggsetions how to do this in R? Thank you, Elisabeth
[[alternative HTML version deleted]]
2013 Mar 13
1
expression exponent labeling
...# simulated data, somewhat similarly distributed to my real data:
set.seed(12); d <- rbeta(1e6, 0.2,2)*150 ; d <- d[d>1e-8]
hist( d? , breaks=100)
# now on a logarithmically scaled axis:
hist(log10(d), breaks=100, xaxt="n")
abline(v= log10(1:10*10^rep(-9:3, each=10)), col="darkgrey" ); box()
hist(log10(d), breaks=100, col="forestgreen", add=T)
axis(1, log10(1:10*10^rep(-9:3, each=10)), labels=F)
axis(1, -2:2, format(10^(-2:2), scient=3, drop0trailing=T) )
# the labels with lower values should be in the form of 10^x:
axis(1, -8:-3, expression( 10^(-8:-3)) )# doe...
2006 Oct 13
3
Barplot legend position
Dear useRs,
I'm trying to create a barplot like so:
x=matrix(1:10,2,5)
barplot(x,leg=c("left","right"),besid=T)
The legend is placed in default position topright, however the data are
plotted there too. I tried controlling the legend position by adding
x="topleft" but this results in an error that x matches multiple formal
arguments.
Leaving out the legend
2010 Nov 30
2
Error bars in lattice barchart with groups
..."SD"]] <- 5
PLOT <- barchart(data=barley, yield~variety|site, groups=year,origin=0,
as.table=TRUE,
scales=list(x=list(relation="same",
rot=30),
y=list(alternating=3,tck=-1)),
col=c("grey","black"),
panel=function(...) {
panel.grid(h=-1, v=0,col="darkgrey");
panel.barchart(...,reference=FALSE)}
)
PLOT
#this works fine
#No, i tried to add error bars using the following code:
PLOT2 <- barchart(data=barley, yield~variety|site, groups=year,origin=0,
as.table=TRUE,
scales=list(x=list(relation="same",
rot=30),
y=list(alternating=3,tc...
2006 Aug 24
1
help: trouble using lines()
...reat:year+ year:treat:mtf+(1|fybrood), data = A)
then I wanted to plot the results of the three way interaction using
lines() as follows...
tmp<-as.vector(fixef(model))
graph1<-plot(mtf,fitted(f2), xlab=list("Brood Size"), ylab=list("Early
growth rate"), pch=16, col="darkgrey", bg="yellow")
lines(y,exp(tmp[1]+tmp[2]))
but no matter what I try I always get the error message
"Error in xy.coords(x, y) : 'x' and 'y' lengths differ"
Can anyone shed some light please?
I am basically copying the methods of the pdf entitled "Linea...
2008 Oct 09
1
Altering the cube around a wireframe plot.
...s.par.set('axis.line', list(col='transparent'))trellis.par.set('box.3d', list(col='transparent'))
wireframe(Data ~ Freqq*Time, scales=list(arrows=FALSE, cex=0.75, col='black', tck=1), screen=list(z=-10, x=-70, y=0), xlim=c(0, max(Freqq)), zoom=0.85, col='darkgrey', aspect=c(1.75,.65), xlab=list(label='Frequency (Hz)'), ylab='Time (Sec)', perspective=FALSE, zlab=list(label=expression(lb[f]), just=-1), par.box = list(col=c(1,1,NA,1,1,NA,1,1,1)))
I found that the par.box option controls multiple lines in the plot not just one at a time. I...
2006 Nov 07
2
wrong fill colors in polygon-map
...t
regions), same problem. I tried to check whether there is any problem
with the match of data and district ids, but everything seemed to be
fine.
Sample code:
****************
brks.pat<-quantile(patenting$patbus)
#palette.pat<-c("green", "blue", "grey", "darkgrey", "red")
palette.pat<-c(rep("green", 4), "red")
plot(iab7.poly, col=palette.pat[findInterval(patenting$patbus,
brks.pat)])
legend(1200, -200, fill=palette.pat, legend=round(brks.pat,2), cex=0.6)
title(main="patenting activity in german districts")
Da...
2011 Apr 13
2
FW: how to enclose two xyplot
Dear R-users,
I have to plot two xyplot, and I wish to enclose this two graphs with just one headline, the same x scale, the same grid etc.
These parameters should tie in, in order to obtain, visually, a unique graph formed by two xyplot.
I try to give an idea:
xyplot1: |_|_|_|
xyplot2: |_|_|_|
what i want: | | | |
|_|_|_|
I tried to use the command
2010 Dec 06
2
ggplot2: Controlling line width of panel borders
...) # deletes the minor grid
lines
## Now i would like to increase the width of all remaining lines (bottom,
left, top, right border of all panels and stripes) in the plot, as a
certain minimum lines width is required by many journals
last_plot() +
opts(panel.grid.major=theme_line(colour="darkgrey",size=0.71))
# that works fine
last_plot() + opts(panel.border=theme_rect(colour="black",size=0.71))
# that only changes the bottom and right border of the panel
last_plot() +
opts(strip.background=theme_rect(colour="black",fill="grey90",size=0.71))
# that only c...
2012 Mar 20
3
Wrong output due to what I think might be a data type issue (zoo read in problem)
Here's the small scale version of the R script:
http://pastebin.com/sEYKv2Vv
Here's the file that I'm reading in:
http://r.789695.n4.nabble.com/file/n4487682/weatherData.txt weatherData.txt
I apologize for the length of the data. I tried to cut it down to 12 lines,
however, it wasn't reproducing the bad output that I wanted to show.
The problem is that my whole data set
2008 Sep 13
2
Symbols on a capscale object plot
Hi, I'm a beginner with R, but I'm getting excellent results with it.
Well I've got an capscale object (vegan package) and I want to made a biplot
with symbols representing six groups of areas.
With the plot.cca function and some par attributes (like 'labels') I was
able to substitute the samples names for keyboard symbols ('x','o','#',ect),
but it's
2010 Nov 24
3
Custom ticks on x axis when dates are involved
...uary 2010
# number of seconds in a year - but does not take into consideration the leap years
t <- 365*24*60*60
axis(1, at = seq((range(d1)[1]-s1), (range(d1)[2]+s2), t), las = 2, labels = paste(seq(1984, 2010, 1)))
abline(v= seq((range(d1)[1]-s1), (range(d1)[2]+s2), t), lty = 2, col = "darkgrey")
Now the graph looks very close to what i want, but i know that my ticks actually are not exactly at 01/01/yyyy as i would like, although i suppose my error is not that much in this instance. However i would really appreciate if i can get the ticks on my x axis how i want in a much more ele...
2010 Nov 02
0
spatial plots maps-ssplot
...;Latitude(?)",add=T,scales=list(draw=T),main="Seasonal change DJF
MIUB", font.main=4)
map('rivers', xlim=c(minlon,maxlon),ylim= c(minlat,maxlat),
col="blue",add=T)
map('worldHires', xlim = c(minlon, maxlon), ylim = c(minlat, maxlat),
add = T, col =
"darkgrey",wrap=T)
Regards,
Saskia van Pelt