Questions tagged «ggplot2»

ggplot2是Hadley Wickham根据“图形语法”的原则编写的,为R积极维护的开源图形绘图包。它部分替换了R的基本图和点阵包,同时提供了一个干净,强大,正交且有趣的API。

6
使用ggplot2时持续出现无效的图形状态错误
我相信我的数据框还可以,我的代码也可以。实际上,我已经消除了数据框的一部分和大多数图形代码,以使事情变得尽可能基本。但是,我仍然得到: Error in .Call.graphics(C_palette2, .Call(C_palette2, NULL)) : invalid graphics state 怎么了 数据如下: date trt var val 1/8/2008 cc sw5 0.2684138 1/8/2008 cc sw15 0.2897586 1/8/2008 cc sw5 0.2822414 2/8/2008 cc sw5 0.2494583 2/8/2008 cc sw5 0.2692917 2/8/2008 cc sw15 0.2619167 2/8/2008 cc sw5 0.204375 3/8/2008 cc sw5 0.2430625 3/8/2008 cc …
119 r  ggplot2 

1
重新排列geom_bar ggplot2中的栏
我正在尝试制作一个条形图,其中该图按从miRNA最高value到miRNA最低的顺序排序。为什么我的代码不起作用? > head(corr.m) miRNA variable value 1 mmu-miR-532-3p pos 7 2 mmu-miR-1983 pos 75 3 mmu-miR-301a-3p pos 70 4 mmu-miR-96-5p pos 5 5 mmu-miR-139-5p pos 10 6 mmu-miR-5097 pos 47 ggplot(corr.m, aes(x=reorder(miRNA, value), y=value, fill=variable)) + geom_bar(stat="identity")
118 r  ggplot2 


3
在ggplot2中使用facet_wrap和scales =“ free”设置单个轴限制
我正在创建一个多面图,以与预测值与残差的图并排查看预测值与实际值。我将shiny使用不同的训练参数来帮助探索建模工作的结果。我用85%的数据训练模型,对剩余的15%进行测试,然后重复5次,每次都收集实际/预测值。计算完残差后,我data.frame看起来像这样: head(results) act pred resid 2 52.81000 52.86750 -0.05750133 3 44.46000 42.76825 1.69175252 4 54.58667 49.00482 5.58184181 5 36.23333 35.52386 0.70947731 6 53.22667 48.79429 4.43237981 7 41.72333 41.57504 0.14829173 我想要的是: predvs act和predvs的并排图resid predvs. 的x / y范围/限制要act相同,理想情况下min(min(results$act), min(results$pred))为max(max(results$act), max(results$pred)) 在X / Y范围/对限制pred与resid 不被通过我做什么实际与预测的情节影响。x仅对预测值和y余数范围进行绘图就可以了。 为了并排查看两个图,我融合了数据: library(reshape2) plot <- melt(results, id.vars = "pred") …
116 r  ggplot2  facet 

1
ggplot:如何增加多面图之间的间距?
我有几个刻面的直方图(通过下面的命令获得),它们很好地绘制在另一个下。我想增加它们之间的间隔,但是它们很紧。 我查看了该文档,但没有为此找到参数。 qplot (Happiness.Level, Number.of.Answers, data=mydata, geom="histogram") + facet_grid (Location ~ .)
113 r  ggplot2 

3
如何删除ggplot2中轴与面积图之间的空间?
我有以下数据框: uniq <- structure(list(year = c(1986L, 1987L, 1991L, 1992L, 1993L, 1994L, 1995L, 1996L, 1997L, 1998L, 1999L, 2000L, 2001L, 2002L, 2003L, 2004L, 2005L, 2006L, 2007L, 2008L, 2009L, 2010L, 2011L, 2012L, 2013L, 2014L, 1986L, 1987L, 1991L, 1992L, 1993L, 1994L, 1995L, 1996L, 1997L, 1998L, 1999L, 2000L, 2001L, 2002L, 2003L, 2004L, 2005L, 2006L, 2007L, …
113 r  plot  ggplot2 

2
在ggplot2中的堆叠条形图上显示数据值
我想在ggplot2的堆叠条形图中显示数据值。这是我尝试的代码 Year <- c(rep(c("2006-07", "2007-08", "2008-09", "2009-10"), each = 4)) Category <- c(rep(c("A", "B", "C", "D"), times = 4)) Frequency <- c(168, 259, 226, 340, 216, 431, 319, 368, 423, 645, 234, 685, 166, 467, 274, 251) Data <- data.frame(Year, Category, Frequency) library(ggplot2) p <- qplot(Year, Frequency, data = Data, …
112 r  graphics  ggplot2 


5
删除ggplot中的图例标题
我正在尝试在中删除图例的标题ggplot2: df <- data.frame( g = rep(letters[1:2], 5), x = rnorm(10), y = rnorm(10) ) library(ggplot2) ggplot(df, aes(x, y, colour=g)) + geom_line(stat="identity") + theme(legend.position="bottom") 我已经看到了这个问题,那里的所有解决方案似乎都不适合我。大多数人会给出关于如何opts弃用和使用的错误theme。我也尝试了各种版本theme(legend.title=NULL),theme(legend.title=""),theme(legend.title=element_blank)等典型的错误信息是: 'opts' is deprecated. Use 'theme' instead. (Deprecated; last used in version 0.9.1) 'theme_blank' is deprecated. Use 'element_blank' instead. (Deprecated; last used in version 0.9.1) ggplot2自版本0.9.3发行以来,我是第一次使用该工具,我发现很难浏览某些更改...
111 r  ggplot2 

2
ggplot2图例到底部和水平
如何将ggplot2图例移至图的底部并水平旋转? 样例代码: library(reshape2) # for melt df <- melt(outer(1:4, 1:4), varnames = c("X1", "X2")) p1 <- ggplot(df, aes(X1, X2)) + geom_tile(aes(fill = value)) p1 + scale_fill_continuous(guide = guide_legend()) 所需(近似)结果:
109 r  ggplot2 

3
如何将垂直的geom_vline设置为上课日期的x轴?
即使我在POSIXct和的google组中找到了Hadley的帖子geom_vline,也无法完成。我有一个时间序列,例如1998年,2005年和2010年,我想画一条垂直线。我尝试了ggplotand qplot语法,但仍然看不到任何垂直线,或者在第一个垂直网格上绘制了垂直线,整个系列向右有些奇怪。 gg <- ggplot(data=mydata,aes(y=somevalues,x=datefield,color=category)) + layer(geom="line") gg + geom_vline(xintercept=mydata$datefield[120],linetype=4) # returns just the time series plot I had before, # interestingly the legend contains dotted vertical lines 我的日期字段格式为“ 1993-07-01”,属于class Date。
109 r  date  ggplot2  time-series 



10
如何画一个空图?
我需要作一个空图。这是我能想到的最好的方法。 plot(0, xaxt = 'n', yaxt = 'n', bty = 'n', pch = '', ylab = '', xlab = '') 还有更简单的解决方案吗? PS:完全空,无轴等。
106 r  ggplot2  plot 

1
在不删除数据的情况下限制ggplot2轴(外部限制):缩放
如果在ggplot中指定轴限制,则将删除偏远点。这对点很好,但是您可能希望绘制与指定范围相交的线,但是ggplot range或xlim/ylim方法会删除这些线。还有另一种方法可以指定绘图轴范围而不删除外围数据吗? 例如 require(ggplot2) d = data.frame(x=c(1,4,7,2,9,7), y=c(2,5,4,10,5,3), grp=c('a','a','b','b','c','c')) ggplot(d, aes(x, y, group=grp)) + geom_line() ggplot(d, aes(x, y, group=grp)) + geom_line() + scale_y_continuous(limits=c(0,7)) ggplot(d, aes(x, y, group=grp)) + geom_line() + ylim(0,7)
106 r  ggplot2  zoom  limits 

By using our site, you acknowledge that you have read and understand our Cookie Policy and Privacy Policy.
Licensed under cc by-sa 3.0 with attribution required.