search for: steelblu

Displaying 20 results from an estimated 27 matches for "steelblu".

Did you mean: steelblue
2007 Nov 05
1
Help with Error Message
...> # These are the symbols and colors to use for each phenotype in the model and test sets > # model samples: square symbols > # color symbol phenotype > legend.list <- c("green", 22, # ALL-B + "steelblue", 22, # ALL-T + "red", 22, # AML + # test samples: cicle symbols + # color symbol phenotype + "lightgreen", 21, # ALL-B +...
2013 Feb 11
2
How to plot doubles series with different location using plotCI
...p), cex=0.7)   ##mean and error second data series tmp <- split(tab1$value2,tab1$typo) means <- sapply(tmp, mean) stdev <- sapply(tmp, sd) n <- sapply(tmp,length) ciw <- qt(0.975, n) * stdev / sqrt(n) ##the problem: plotting second dataseries plotCI(x=means, uiw=stdev, col="steelblue", barcol="steelblue", lwd=2, pch=18, cex=2, xaxt="n", yaxt="n", ylab='qualite',xlab='type', yaxs = 'i',add=T)  ##this series of data is now superposed, but would like to put them horizontally shifted next to the red values Thanks in advan...
2008 Mar 31
1
Reorder the x-axis using lattice
...ng 64.62264 16 Kvinnor VT 2-utskrivning 51.97531 bwplot(Medelvärde ~ Skalor| Kön , kt, panel = "panel.superpose", groups = Tillfälle,scales = list(x = list(rot = 45),cex=0.7,alternating=2), panel.groups = "panel.linejoin",lty=c(1:3),lwd=3,col=c("steelblue","grey50","green4"), ylab = list(label = "skalpoäng (0-100)", cex = 0.8), xlab = list(label = "skalor", cex = 0.8), key = list(lines = Rows(list(col=c("steelblue","grey50","green4"),lty=c(1:3)),...
2007 Mar 08
2
curve of density on histogram
...wing curve densities don't appear correctly on the histograms. Thank you for your help library(lattice) library(grid) resp <- rnorm(2000) group <- sample(c("G1", "G2", "G3", "G4"), replace = TRUE, size = 1000) histogram(~ resp | group, col="steelblue", panel = function(x, ...){ std <- if(length(x) > 0) format(round(sd(x), 2), nsmall = 2) else "NA" n <- length(x) m <- if(length(x) > 0) format(round(mean(x), 2), nsmall = 2) else "NA" panel.histogram(x, ...) panel.mathdensity(dmath = d...
2017 Jun 21
1
fitting cosine curve
...data=lidata, start=list(A=coef(linFit)[1],B=coef(linFit)[2],C=0,omega=.04), trace=TRUE) co <- coef(fullFit) fit <- function(x, a, b, c, d) {a*cos(b*x+c)+d} plot(x=t, y=y) curve(fit(x, a=co['A'], b=co['omega'], c=co['C'],d=co['B']), add=TRUE ,lwd=2, col="steelblue") jstart <- list(A=20, B=100, C=0, omega=0.01) jfit <- nlxb(y ~ A*cos(omega*t+C) + B, data=lidata, start=jstart, trace=TRUE) co <- coef(jfit) fit <- function(x, a, b, c, d) {a*cos(b*x+c)+d} plot(x=t, y=y) curve(fit(x, a=co['A'], b=co['omega'], c=co['C&...
2007 Sep 20
1
help with making a function of scatter plot with multiple variables
...ue", cex=1) legend("topright",lbels,col=c("orange","green4","navyblue","red","darkviolet","blue"), text.col=c("orange","green4","navyblue","red","darkviolet","steelblue"), pch=c("v","A","B","C","D","E"),bg='gray100',cex=0.7,box.lty=1,box.lwd=1) abline(h = -1:9, v = 0:8, col = "lightgray", lty=3) par(op) --------------------------------- Jämför pris...
2017 Jun 20
5
fitting cosine curve
...linFit)[1],B=coef(linFit)[2],C=0,omega=.4)) #omega cannot be set to 1, don't know why. co <- coef(fullFit) fit <- function(x, a, b, c, d) {a*cos(b*x+c)+d} plot(x=t, y=y) curve(fit(x, a=co['A'], b=co['omega'], c=co['C'],d=co['B']), add=TRUE ,lwd=2, col="steelblue") -------------- next part -------------- A non-text attachment was scrubbed... Name: curve1.pdf Type: application/pdf Size: 29634 bytes Desc: not available URL: <https://stat.ethz.ch/pipermail/r-help/attachments/20170620/a99f7d8f/attachment.pdf>
2013 Aug 07
2
Agrupar los terminos de la leyenda
Hola Neo, esto es lo mejor que me ha salido. A ver si por lo menos te ayuda. Un saludo colores<-c("black", "green", "red", "steelblue", "purple") #creamos el vector de 5 colores que usaremos para unificar luego la leyenda y el grafico xyplot(V5 ~ dia | sol, groups=con, layout=c(1, 3), type= "l", pch=1, par.settings=simpleTheme(col=colores, col.line=colores), auto.key=list(title= "Con",sp...
2012 May 09
1
white lines in barplot
Dear R-helpers, I would like to draw white lines in my barplots to improve the visualization. I include an example: barplot(sample(1:100,15),width=0.59,horiz=T,col="steelblue",border="NA",axes=F,ylim=c(0,10),xlim=c(0,100)) abline(v = seq(10, zehnind, by = 10), col = "white") axis(1,at=ticks,las=1,labels=paste(ticks,"%",sep="")) my problem is, that the white lines are not long enough at the top. I also tried the function...
2012 Jul 02
2
Heat Maps
Hello Everyone I am new to R I have drawn indifference curves using the program below (Contour Plot) u <- function(x, y) x^0.5 + y^0.5 x <- seq(0, 1000, by=1) y <- seq(0, 1000, by=1) a <- c(10, 20, 30) contour(x, y, outer(x, y, u),levels=a,col="blue") Now can any body please tell me how to draw Heat maps and that too on the same indifference curve plot (contour)
2017 Jun 20
0
fitting cosine curve
...=0,omega=.4)) #omega cannot > be set to 1, don't know why. > co <- coef(fullFit) > fit <- function(x, a, b, c, d) {a*cos(b*x+c)+d} > plot(x=t, y=y) > curve(fit(x, a=co['A'], b=co['omega'], c=co['C'],d=co['B']), add=TRUE > ,lwd=2, col="steelblue") > > ______________________________________________ > R-help at r-project.org mailing list -- To UNSUBSCRIBE and more, see > https://stat.ethz.ch/mailman/listinfo/r-help > PLEASE do read the posting guide http://www.R-project.org/posting-guide.html > and provide commented,...
2017 Jun 21
1
fitting cosine curve
If you know the period and want to fit phase and amplitude, this is equivalent to fitting a * sin + b * cos > >>> > I don't know how to set the approximate starting values. I'm not sure what you meant by that, but I suspect it's related to phase and amplitude. > >>> > Besides, does the method work for sine curve as well? sin is the same as cos with
2010 Oct 28
1
Heatmap construction problems
...ould like it so that I can have a little more complex gradient ranging from 0% to the highest relative abundance that I observe in the above table (65.1%). The default scale I get using the link above is just a relative intensity scale ranging from 1 to 5 (where white represent low percentages and steelblue represented high percentages). This is alright but for phyla that are present at relative abundance of less than 5% all appear to be white (or non-existant). Is there anyway to fix this? Any help would be greatly appreciated. Thanks, Chris
2017 Jun 21
0
fitting cosine curve
I'm trying the different parameters, but don't know what the error is: Error in nlsModel(formula, mf, start, wts) : singular gradient matrix at initial parameter estimates Thanks for any suggestions. On Tue, Jun 20, 2017 at 7:37 PM, Don Cohen <don-r-help at isis.cs3-inc.com> wrote: > > If you know the period and want to fit phase and amplitude, this is > equivalent to
2005 Jun 22
1
legend
...ngth=n) BM<-c(0,cumsum(rnorm(n-1,mean=0,sd=sqrt(to/n)))) cbind(x,BM) } gbm <- function(bm,S0=1,sigma=0.1,mu=1) { gbm=S0 for (t in 2:length(bm[,1])) { gbm[t]=S0*exp((mu-sigma^2/2)*bm[t,1]+sigma*bm[t,2]) } cbind(bm[,1],gbm) } set.seed(9826064) cs=c("dark green", "steelblue", "red", "yellow") #png(filename = "GBM.png", width=1600, height=1200, pointsize = 12) par(bg="lightgrey") x=seq(from=0,to=1,length=500) plot(x=x, y=exp(0.7*x), type="n", xlab="Zeit", ylab="", ylim=c(1,3.5)) polygon(x=c(x,...
2012 Feb 02
9
Modelo senoidal de datos temporales de radiación y prueba de Thom
Hola a todos: Estoy intentado realizar un modelo senoidal de unos datos de radiación solar con el fin de afrontar el relleno de la serie y aplicar la prueba de Thom para verificar su homogeneidad [0]. De momento me encuentro con los siguientes problemas: 1- ¿Existe la prueba de Thom en R? ¿O debo crearme mi propia función? 2- Para la realización del modelo senoidal estoy siguiendo los pasos
2010 Nov 05
1
__Legend_para_varios_gr�ficos
...ar(new=T, mfrow=c(1,1), mar=c(0,4,2,2), oma=c(1,1,0,1)) plot(-1,type="n",axes=F,xlab='',ylab='') legend("top",legend=c("N(0,1)","t(df=3)","Cauchy","t(df=1)"),fill=c("green","red","orange","steelblue"),cex=0.5) y ya aparece la leyenda donde yo quería. ¡Muchas gracias! Guillermo > Aqui está el código > > como ves, lo crucial es el new > > Saludos > > > png(filename = '3_2-pastis-castella.png' > , width = 500, height = 500, units = 'px'...
2013 Aug 09
1
Agrupar los terminos de la leyenda
...los Ortega > www.qualityexcellence.es <http://www.qualityexcellence.es> > > #--------------------------------------------------------- > library(lattice) > # Separate panels for each "sol" > colores<-c("black", "green", "red", "steelblue", "purple") > > dec.df <- mat[mat$sol=="dec",] > dec.gr <http://dec.gr> <- xyplot( >                   V5 ~ dia >                  ,groups=con >                  ,data=dec.df >                  ,type="l", pch=1 >               ...
2012 Feb 15
3
(sin asunto)
Hola Alguien me podría decir como hacer una grafica del tipo persp() de la densidad de una distribucion normal bivariante estandarzada con correlacion 0.5?? gracias [[alternative HTML version deleted]]
2013 Aug 07
0
Agrupar los terminos de la leyenda
...tice, la función no es igual a la "xyplot()". Saludos, Carlos Ortega www.qualityexcellence.es #--------------------------------------------------------- library(lattice) # Separate panels for each "sol" colores<-c("black", "green", "red", "steelblue", "purple") dec.df <- mat[mat$sol=="dec",] dec.gr <- xyplot( V5 ~ dia ,groups=con ,data=dec.df ,type="l", pch=1 ,main="DEC" ,par.settings=simpl...