Entering edit mode
Tim Smith
★
1.1k
@tim-smith-1532
Last seen 10.2 years ago
Hi,
I was using Gviz package to create a boxplot. I understand that Gviz
uses "panel.bwplot" to create the boxplot.
Is there any way that I can remove the dashed line surrounding each
pair of boxplots?
Here is some sample code:
#############
library(Gviz)
thisdata <- matrix(sample(1:100,60),nrow=
10,ncol=6)
positions <- sample(1:100,6)
limit1 <- min(positions)-1
limit2 <- max(positions)+1
colnames(thisdata) <- positions
dgroups <- c(rep('sample1',6),rep('sample2',4))
chr <- "chr1"
d4x <- DataTrack(start=positions, width=2,
data=thisdata,chromosome=chr,
name="test",groups = dgroups,type = "boxplot",
box.ratio=0.6,
box.width=1.5
) #"box and whisker plot"
plotTracks(d4x,from=limit1,to=limit2)
###############################
many thanks!
[[alternative HTML version deleted]]
Did you find a solution?