Questions tagged «ggplot2»

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

3
如何使用grid.arrange布置任意数量的ggplots?
这是交叉发布在ggplot2 Google组上 我的情况是我正在使用一个函数,该函数可以输出任意数量的绘图(取决于用户提供的输入数据)。该函数返回n个图的列表,我想以2 x 2的形式排列这些图。我正在为同时存在的问题而苦苦挣扎: 如何允许将灵活性分配给任意(n)个图? 我还要如何指定我想要的布局2 x 2 我当前的策略使用grid.arrange了该gridExtra软件包。这可能不是最佳的,尤其是因为这是关键,所以它完全不起作用。这是我评论过的示例代码,尝试了三个图: library(ggplot2) library(gridExtra) x <- qplot(mpg, disp, data = mtcars) y <- qplot(hp, wt, data = mtcars) z <- qplot(qsec, wt, data = mtcars) # A normal, plain-jane call to grid.arrange is fine for displaying all my plots grid.arrange(x, y, z) …
93 r  ggplot2 

1
ggplot geom_text字体大小控制
我尝试ggplot2通过执行以下操作将条形图的标签的字体更改为10 : ggplot(data=file,aes(x=V1,y=V3,fill=V2)) + geom_bar(stat="identity",position="dodge",colour="white") + geom_text(aes(label=V2),position=position_dodge(width=0.9), hjust=1.5,colour="white") + theme_bw()+theme(element_text(size=10)) ggsave(filename="barplot.pdf",width=4,height=4) 但是结果图像的条形图标签的字体大小超大。 然后我想到geom_text()用这个修改: geom_text(size=10,aes(label=V2),position=position_dodge(width=0.9), hjust=1.5,colour="white") 标签字体更大... 我可以将大小更改为geom_text3,现在看起来像字体10,类似于轴标签。 我想知道发生了什么事?确实theme(text=element_text(size=10))并不适用于标签? 为什么10 in的尺寸与in的尺寸geom_text()不同theme(text=element_text())?
93 r  ggplot2 


3
geom_smooth()有哪些可用的方法?
我正在使用geom_smooth()中ggplot2。 在Hadley Wickham的书(“ ggplot2-用于数据分析的优雅图形”)中,有一个示例(第51页)method="lm"被使用。在在线手册中,没有method论据。我看到有人在使用Google的其他结果(和此处的问题)method='loess'。 是否有详尽的清单可以解释这些选项? 从我所看到的,'lm'画一条直线,'loess'画一条非常平滑的曲线。我假设还有其他人在参考点之间绘制了更多的锯齿线? 该se示例中的参数也不在帮助或在线文档中。 FWIW这是我的代码。 p <- ggplot(output8, aes(age, myoutcome, group=id, colour=year_diag_cat2)) + geom_line() + scale_y_continuous(limits = c(lwr,upr)) p + geom_smooth(aes(group=year_diag_cat2), method="loess", size=2, se=F)
92 r  ggplot2 

5
如何使用grid.arrange排列变量的可变列表?
library(ggplot2) df <- data.frame(x=1:10, y=rnorm(10)) p1 <- ggplot(df, aes(x,y)) + geom_point() plist <- list(p1,p1,p1,p1,p1) # In my real example,a plot function will fit a ggplot to a list of datasets #and return a list of ggplots like the example above. 我想使用grid.arrange()中来安排地块gridExtra。 如果地块数量多,我该怎么办 plist可变,? 这有效: grid.arrange(plist[[1]],plist[[2]],plist[[3]],plist[[4]],plist[[5]]) 但是我需要一个更通用的解决方案。有什么想法吗?
92 r  ggplot2 

3
删除ggplot2中的多余图例
我有一个简单的数据框,正在尝试使用进行组合的线和点图ggplot2。假设我的数据如下所示: df <- data.frame(x=rep(1:10,2), y=c(1:10,11:20), group=c(rep("a",10),rep("b",10))) 我正在尝试绘制一个图: g <- ggplot(df, aes(x=x, y=y, group=group)) g <- g + geom_line(aes(colour=group)) g <- g + geom_point(aes(colour=group, alpha = .8)) g 结果看起来不错,只有一个例外。它有一个额外的图例,显示了alpha我的geom_point图层。 如何使图例显示组颜色,而不显示图例设置?
91 r  ggplot2  legend 

5
更改ggplot2中的字体
从前,我改变了我的 ggplot2使用windowsFonts(Times=windowsFont("TT Times New Roman"))来更改字体。现在我无法摆脱它。 在尝试设置时family="",ggplot2 theme()我似乎无法生成字体更改,因为我使用不同的字体系列编译以下MWE。 library(ggplot2) library(extrafont) loadfonts(device = "win") a <- ggplot(mtcars, aes(x=wt, y=mpg)) + geom_point() + ggtitle("Fuel Efficiency of 32 Cars") + xlab("Weight (x1000 lb)") + ylab("Miles per Gallon") + theme(text=element_text(size=16, # family="Comic Sans MS")) # family="CM Roman")) # family="TT Times New Roman")) # family="Sans")) family="Serif")) …

3
按ggplot2中的两列分组
是否可以按两列分组?那么叉积是由geom_point()和绘制的geom_smooth()? 例如: frame <- data.frame( series <- rep(c('a', 'b'), 6), sample <- rep(c('glass','water', 'metal'), 4), data <- c(1:12)) ggplot(frame, aes()) # ... 这样的点6和12共享一个组,但不能与3。
90 r  ggplot2 

4
R ggplot2:stat_count()不得与条形图中的美学错误一起使用
我在绘制条形图时遇到此错误,但我无法摆脱它,我尝试了qplot和ggplot,但仍然是相同的错误。 以下是我的代码: library(dplyr) library(ggplot2) #Investigate data further to build a machine learning model data_country = data %>% group_by(country) %>% summarise(conversion_rate = mean(converted)) #Ist method qplot(country, conversion_rate, data = data_country,geom = "bar", stat ="identity", fill = country) #2nd method ggplot(data_country)+aes(x=country,y = conversion_rate)+geom_bar() 错误: stat_count() must not be used with a y …
89 r  ggplot2  bar-chart 

4
解释ggplot2警告:“删除了包含缺失值的k行”
当我尝试使用生成图时,收到此警告ggplot。 在线研究了一段时间后,许多人建议我的数据库通常包含空值或缺少数据,事实并非如此。 在这个问题上,可接受的答案如下: 警告表示某些元素已删除,因为它们不在指定范围内 我想知道此范围到底指的是什么,有人为了避免所有警告如何手动增加此范围?
89 r  ggplot2 

7
如何为ggplot2对象提取绘图轴的范围?
我有一个物体ggplot2,比如说myPlot,如何确定x和y轴的范围? 它似乎不是数据值范围的简单倍数,因为它可以重新缩放绘图,修改轴的范围等等。 findFn(来自sos)和Google似乎没有找到相关结果,除了如何设置坐标轴的范围。
88 r  ggplot2 

3
如何固定ggplot中的宽高比?
我正在尝试调整绘图的大小以适合我的文档,但是在将绘图绘制成正方形时遇到困难。 例: pdf(file = "./out.pdf", width = 5, height = 5) p <- ggplot(mydata, aes(x = col1, y = col2)) print(p) aux <- dev.off() 尽管x和y的限制相同,但结果中的图不是正方形。我想R使封闭面板的尺寸为5x5“,但是并不关心实际的图表尺寸。 如何解压图表?
88 r  ggplot2 

7
如何添加不同大小和颜色的ggplot2字幕?
我正在使用ggplot2来改善降水量。 这是我想要实现的可复制示例: library(ggplot2) library(gridExtra) secu <- seq(1, 16, by=2) melt.d <- data.frame(y=secu, x=LETTERS[1:8]) m <- ggplot(melt.d, aes(x=x, y=y)) + geom_bar(fill="darkblue") + labs(x="Weather stations", y="Accumulated Rainfall [mm]") + opts(axis.text.x=theme_text(angle=-45, hjust=0, vjust=1), title=expression("Rainfall"), plot.margin = unit(c(1.5, 1, 1, 1), "cm"), plot.title = theme_text(size = 25, face = "bold", colour = "black", vjust …
87 r  ggplot2  subtitle 

9
如何使用ggplot2在轴上仅显示整数值
我有以下情节: library(reshape) library(ggplot2) library(gridExtra) require(ggplot2) data2<-structure(list(IR = structure(c(4L, 3L, 2L, 1L, 4L, 3L, 2L, 1L ), .Label = c("0.13-0.16", "0.17-0.23", "0.24-0.27", "0.28-1" ), class = "factor"), variable = structure(c(1L, 1L, 1L, 1L, 2L, 2L, 2L, 2L), .Label = c("Real queens", "Simulated individuals" ), class = "factor"), value = c(15L, 11L, …
87 r  ggplot2 

1
ggplot2绘图区域边距?
有没有一种简单的方法来增加打印标题与其下方的打印区域(带有数据的框)之间的空间。同样,我希望在轴标题和轴标签之间留一些空间。 换句话说,是否有办法“将标题稍微上移,将y轴标题稍微向左移,将x轴标题向下移”?

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.