Displaying 7 results from an estimated 7 matches for "dcol".
Did you mean:
col
2013 May 02
3
Lattice xyplot multipanels
...sh
q <-
data.frame(G=rep(paste("G",1:3,sep=""),each=50),D=rep(paste("D",1:5,sep=""),each=30),a=rep(1:15,each=10),t=rep(seq(10),15),b=round(runif(150,10,20)))
q$grp <- paste(q$D,q$a,sep=":")
q$grp <- ordered(q$grp, levels=unique(q$grp))
q$dcol <- unlist(sapply(q$D,function(x)
switch(x,"D1"="orange","D2"="blue","D3"="red", "D4"="seagreen",
"D5"="black")))
q2 <- q[order(q$G,q$D,q$a,q$t),]
ref3 <- subset(q2, !duplicated(a))...
2012 Oct 02
5
smoothScatter plot
Hi, I want to make a plot similar to sm1 (attached). The code I tried is: dcols <- densCols(x,y)
smoothScatter(x,y, col = dcols, pch=20,xlab="A",ylab="B")
abline(h=0, col="red")
But it turned out to be s1 (attached) with big dots. I was wondering if anything wrong with my code. Thanks,Zhengyu
-------------- next part -------------...
2013 Jun 10
1
Using Lattice, LatticeExtra - Hide right and top axes in multipanel plots
...e 2
q <-
data.frame(G=rep(paste("G",1:3,sep=""),each=50),D=rep(paste("D",1:5,sep=""),each=30),a=rep(1:15,each=10),t=rep(seq(10),15),b=round(runif(150,10,20)))
q$grp <- paste(q$D,q$a,sep=":")
q$grp <- ordered(q$grp, levels=unique(q$grp))
q$dcol <- unlist(sapply(q$D,function(x)
switch(x,"D1"="orange","D2"="blue","D3"="red", "D4"="seagreen",
"D5"="black")))
q2 <- q[order(q$G,q$D,q$a,q$t),]
xyplot(b~t|G,data=q2,groups=grp,type=&...
2013 Apr 30
0
Grouped spaghetti plots in multipanel graphs
.....
q <-
data.frame(G=rep(paste("G",1:3,sep=""),each=50),D=rep(paste("D",1:5,sep=""),each=30),a=rep(1:15,each=10),t=rep(seq(10),15),b=round(runif(150,10,20)))
q$grp <- paste(q$D,q$a,sep=":")
q$grp <- ordered(q$grp, levels=unique(q$grp))
q$dcol <- unlist(sapply(q$D,function(x)
switch(x,"D1"="orange","D2"="blue","D3"="red", "D4"="seagreen",
"D5"="black")))
q2 <- q[order(q$G,q$D,q$a,q$t),]
ref3 <- subset(q2, !duplicated(a))...
2012 Jun 08
1
Saving estimates after nested loops
Hi R-listers,
Savings regression results after a loop is straightforward. But what about when you have nested loops?
I am running a regression of the form
lm(y~1+x+M+ D[,i] + D[,j] + D[,k])
where x is the variable of interest. M and D are vectors with other covariates.
Vectors "M" and "x" are included in every regression. Then i loop over the columns of D to use all
2014 Jun 13
2
no x label using axis.Date
...els[xlabels$mday==1]
axis.Date(1,at=xlabels,format="%b-%Y")*
The above section is used in the following plot:
par(mfrow=c(4,1))
par(mar=c(0.8,0,0,0))
par(oma=c(2,4.5,3,2))
plot(totaldays$totaldays,totaldays$y,type="n",ylim=c(0,Dmax),xaxt="n")
points(D$date,D$TSP,col=Dcol,type="p",pch=16,lwd=2,xaxt="n")
text(mdate,Dmax-20,labels="DM1'",cex=1)
legend("topright",pch=16,cex=0.8,col=colLegend,
legend=ALegend)
abline(h=Target,col="red",lwd=2)
plot(totaldays$totaldays,totaldays$y,type="n",ylim=c(0,Bma...
2007 Aug 07
5
Extending RAIDZ.
Yeah:)
I''d like to work on this. Here are my first observations:
- We need to call vdev_op_asize method with additonal ''offset'' argument,
- We need to move data to new disk starting from the very begining, so
we can''t reuse scrub/resilver code which does tree-walk through the
data.
Below you can see how I imagine to extend RAIDZ. Here is the legend: