search for: darkgreen

Displaying 20 results from an estimated 74 matches for "darkgreen".

2011 Jan 05
3
Adding lines in ggplot2
...recurrent question, but I couldn't find any answers that didn't involve the expression "data frame"... so perhaps I'm looking for something new here. I wanted to find a code equivalent to > x=sqrt(1:10) > y=log(1:10) > plot(1:10, x, type="lines", col="darkgreen") > lines(1:10, y, col="red") to use with ggplot2. I've tried > x=sqrt(1:10) > y=log(1:10) > qplot(1:10, x, geom="line", colour=I("darkgreen")) > geom_line(1:10, y, colour="red") Error: ggplot2 doesn't know how to deal with data...
2011 May 02
2
Help with coloring segments on a plot
Hi. I need a very short piece of help regarding colouring segments plotted on a graph. When I am plotting segments for the graph, I am using "red" and "darkgreen for the values "1" and "2" respectively. Heres the relevant line of code in R: + col = c("red", "darkgreen")[line.colour.value]) I just need to extend this to refer to a larger range of numbers from 1 to 10, to plot the segments in ten different colours. Th...
2012 May 10
2
setting global options for a package
...foo <- function(x, col=palette(), ...) {} but the standard palette is not appropriate for my use, and I'd rather not hijack more typical uses Another is to use an explicit list of colors for default, as in bar <- function(x, col=c('red', 'blue', 'brown', 'darkgreen', ...), ...) {} but this must be overridden each time by someone to wants to change the defaults. options() seems like the way to go, but I'm not sure how to implement this. If I use a .onLoad function to set some options, will these be created in the global environment? If not, how t...
2007 Aug 23
1
figure-definition and heatmap question
...","C","D","E","F","G","I","H","J","K","L","M","N","O","P") par(fin=c(8.0,8.0)) cp <- colorRampPalette(c("white","springgreen","darkgreen"),space="Lab") heatmap(x, Rowv = NA, Colv = NA, scale="none", col=cp(200)) I defined the figure region to make sure that each position is a square. But with these settings I get the following output (though it looks nice): > x <- rnorm(256) > nx <- x + abs(m...
2013 Apr 02
2
R Commander and FactoMineR
...nt-and-click method) EuTop100.MCA<-EuTop100[, c("ország", "szektor", "székhely")] res<-MCA(EuTop100.MCA, ncp=5, graph = FALSE) plot.MCA(res, axes=c(1, 2), col.ind="black", col.ind.sup="blue", col.var="darkred", col.quali.sup="darkgreen", label=c("ind", "ind.sup", "quali.sup", "var", "quanti.sup"), invisible=c("", new.plot=TRUE)) plot.MCA(res, axes=c(1, 2), choix="var", col.var="darkred", col.quali.sup="darkgreen", label=c("var&...
2011 Mar 27
0
Help labeling Panels
...ar(mfrow = c(2,2), pin=c(6.45669292,6.45669292), pty="m") lineplot.CI(Week, Pref, group = Drug, data=SM.long, xlab = "Week", ylab ="Proportion Sucrose of Total Fluids", x.leg =1, y.leg=.91, leg.lab= c("Salvia","Control"),col =c("red","darkgreen"),ylim=c(0.48,.95), main = "Preference of Stressed Males") lineplot.CI(Week, Pref, group = Drug, data=SF.long, xlab = "Week", ylab ="Proportion Sucrose of Total Fluids", x.leg =1, y.leg=.60, leg.lab= c("Salvia","Control"),col =c("red"...
2009 Aug 10
2
ggplot: colours to geom_segments
..."), Expense = c(25, 49, 34, 15)), .Names = c("Food", "Expense"), row.names = c(NA, -4L), class = "data.frame") p <- ggplot(xx, aes(x = 0, xend = Expense, y = Food, yend = Food)) pa <- p + geom_point(aes(Expense, Food)) + geom_segment(colour="darkgreen") + xlab("Food") + geom_vline(xintercept=40, colour='red') pa
2012 Sep 24
3
boxplot of different colors
...oxplot(GE_distance~Diet_B, data=dataN,xlab="Diet of Breeding Ground",ylab="", yaxt="n",type="p", pch=1,lwd=0.95, cex.lab=1.4, cex.axis=1.2, font.axis=2, cex=1.5, las=1, bty="l", col=c("forestgreen", "darkgreen","chocolate1","darkorange2","sienna2", "red2","firebrick3", "saddlebrown","coral4","chocolate4","darkblue","navy","grey38")[obs.group])) op = par(mar = c(5,5,4,2) + 0.1) titl...
2007 Jan 08
1
R scripts to plot Taylor Diagram
Dear All, Are there any existing scripts to plot Taylor Diagram (definition see http://www.ipsl.jussieu.fr/~jmesce/Taylor_diagram/taylor_diagram_definition.html ) ? Thanks a lot! Linda [[alternative HTML version deleted]]
2011 Oct 17
2
special language character in a pie chart
...'Electrical and optical equipment', 'Other non-metallic mineral products', 'Basic metals and fabricated metal products', 'Transport equipment','Manufacturing n.e.c.') colors=c('yellow','chocolate4','deeppink','green','darkgreen', 'orange','cyan','lightgoldenrod1','blue','red','blueviolet', 'honeydew3','deeppink4','sandybrown') win.graph(width = 7, height = 4) par(mar=c(0,2.5,0,0)) par(bg='white') par(mfrow=c(1,1)) pie(cz09,col=...
2012 Sep 28
2
changing outlier shapes of boxplots using lattice
...nt the outliers to be empty circles. Please kindly help how to modify the code to change the outlier shapes. Thank you. code package (lattice) dataN <- data.frame(GE_distance=rnorm(260), Diet_B=factor(rep(1:13, each=20))) Diet.colors <- c("forestgreen", "darkgreen","chocolate1","darkorange2", "sienna2","red2","firebrick3","saddlebrown","coral4", "chocolate4","darkblue","navy","grey38") levels(dataN$Diet_B) &l...
2012 Aug 15
4
boxplot help
...2011 - 2012. my code at the moment is: > boxplot(Temp~Month, data=eagle, at = 1:12 - 0.5, boxwex=0.25, subset=Roof > == "TT6", col = "green") > boxplot(Temp~Month, data=eagle, add=TRUE, at = 1:12 - 0.1, boxwex = 0.25, > subset=Roof == "TT13", col = "darkgreen") > boxplot(Temp~Month, data=eagle, add=TRUE, boxwex=0.25, at = 1:12 + 0.2, > subset=Roof == "BARE", col = "red") > smartlegend(x="left",y="top", inset = 0, c("green 1", "green 2", "bare"), > fill = c("green...
2018 Jan 09
1
barplot_add=TRUE
...;Mittlere Temperatur (?C)", cex=0.8, col="blue") par(new=T) plot(climate$Week,climate$Frick_Feuchte.mittel, type="n", axes=F, ylim=c(0,100), ylab="", xlab="", xaxt="n") lines(climate$Week, climate$Frick_Feuchte.mittel, lty=2, lwd=2, col="darkgreen") axis(4,las=1, line=5.5, cex.axis=0.8, col="darkgreen") mtext(side=4, line=7.5, "Mittlere Feuchte (%)", cex=0.8, col="dark green") Am 09.01.2018 um 09:30 schrieb Gerrit Eichner: > Hi, Sibylle, > > since you write '"mathematically" add...
2009 Apr 07
2
heatmap.2 no reordering of the columns and rows
...<- commandArgs(); inputfile <- args[2] imgfile   <- args[3] bitmap(imgfile, height=15, width=15, res=100, pointsize=9) library(gplots) library(RColorBrewer) data <- read.table(inputfile) matrix <- as.matrix(data) cp <- colorRampPalette(c("red","yellow","darkgreen"),space="Lab", bias=1.5) heatmap.2(matrix, Colv=1:ncol(matrix), dendogram="row", hclustfun=function(m) hclust(m,method="complete"),col=cp(25),scale="none",trace="none",keysize=1,margins=c(5,12), cexCol=1, cexRow=1) q() dev.off() The alternativ...
2006 Jul 10
2
Setting the colors of lines in a trellis plot...
...e colors I want. I've managed to make the symbols of the actual plot use the colors I want. But I have been unable to find the correct incantation to make the lines of the actual plot use the colors I want. Here's the relevant section of code: mycolors <- c("black", "darkgreen", "red") mylines <- Rows(superpose.line, 1:numlines); mylines$col <- mycolors mysymbols <- Rows(superpose.symbol, 1:numlines); mysymbols$pch <- c(15:18)[1:numlines] mysymbols$col <- mycolors print(xyplot( panel = panel.superpose, log10(states)...
2012 Apr 06
4
Legend based on levels of a variable
I have a bivariate plot of axis2 against axis1 (data below). I would like to use different size, type and color for points in the plot for the point coming from different region. For some reasons, I cannot get it done. Below is my code. col <- rep(c("blue", "red", "darkgreen"), c(16, 16, 16)) ## Choose different size of points cex <- rep(c(1, 1.2, 1), c(16, 16, 16)) ## Choose the form of the points (square, circle, triangle and diamond-shaped pch <- rep(c(15, 16, 17), c(16, 16, 16)) plot(axis1, axis2, main="My plot", xlab="Axis 1", ylab=...
2001 Oct 23
0
problems with postscript device
...aste("Sampling dist. of mean of ", xname), main = "") bringToTop() if (norm) { n <- length(x) mu <- mean(x) sd <- sqrt(var(x)/n) ps <- seq(xlims[1], xlims[2], len = 100) lines(ps, dnorm(ps, mu, sd), col = "darkgreen") } lines(CImean, rep(ymax/2, 3)) points(CImean[2], ymax/2, cex = 2, col = "black") screen(2) plot(hmeds, freq = FALSE, col = "lightblue", xlim = xlims, ylim = c(0, ymax), xlab = paste("Sampling dist. of median of ", xname...
2011 Jan 07
0
Fitting an Inverse Gamma Distribution to Survey Data
...20,add=T,col="red",lwd=2) curve(dgamma(x,scale=1/edm_gm$estimate["rate"],shape=edm_gm$estimate["shape"]),from=0,to=20,add=T,col="blue",lwd=2) curve(dlnorm(x,meanlog=edm_ln$estimate["meanlog"],sdlog=edm_ln$estimate["sdlog"]),add=T,col="darkgreen",lwd=2) legend("center",c("Gamma Dist.","???Inv. Gamma Dist.???","Log-normal Dist."),col=c("red","blue","darkgreen"),lwd=2,bty="n") -- View this message in context: http://r.789695.n4.nabble.com/Fitting-an-I...
2006 Oct 02
0
Arrowheads at line-ends
..."Partielt molart volum", bty="o", xaxs="i", yaxs="i", xaxp=c(0,1,10), yaxp=c(10,80,20), penel.first = grid(20,20,lty=1) ) points(xA[2:7],Va[2:7], type="o", col="blue",pch=5,lend=1) points(xA[1:6],Vb[1:6], type="o", col="darkgreen",pch=5) arrows(xA[2],Va[2],xA[1],Va[1],col="blue") arrows(xA[6],Vb[6],xA[7],Vb[7],col="darkgreen")
2009 Apr 27
1
Changing color of points in violin plot
Hello, I am trying to graph a violin plot like the example in panel.violin(lattice) with the singer data - see below Does anyone know how to change the color of the boxplot on the graph from blue to green? I tried a number of changes, but to no avail. Thanks for your help, John bwplot(voice.part ~ height, singer, panel = function(..., box.ratio) {