- html - 出于某种原因,IE8 对我的 Sass 文件中继承的 html5 CSS 不友好?
- JMeter 在响应断言中使用 span 标签的问题
- html - 在 :hover and :active? 上具有不同效果的 CSS 动画
- html - 相对于居中的 html 内容固定的 CSS 重复背景?
我在 RStudio 上工作,试图循环几行 dplyr-ggplot 脚本来识别离群值,然后绘制图表并标记离群值。数据的一个子集如下所示:
miR_373 miR_30 miR_182 type
C1 6.78 -2.88 3.75 control
C2 11.88 0.28 7.26 control
C3 8.55 -4.08 3.37 control
C4 7.60 -2.76 7.60 control
C5 13.18 2.33 13.18 control
P18 12.62 0.37 7.99 treated
P19 4.60 -7.62 -0.52 treated
P23 9.72 0.07 9.72 treated
P24 10.40 -0.68 10.40 treated
P25 11.08 0.81 11.08 treated
N20 7.35 -4.29 2.48 non_treated
N21 3.06 -2.21 4.59 non_treated
N22 6.05 -4.99 2.15 non_treated
N28 10.44 -0.15 10.44 non_treated
N29 10.59 0.36 10.59 non_treated
下面的脚本可以很好地生成一个图:
cts <- as.data.frame(read.csv("c:/Users/dat.csv", header = TRUE, row.names = 1))
is_outlier <- function(x) {
return(x< quantile(x,0.25) - 1.5 * IQR(x) | x>quantile(x,0.75) +1.5 * IQR(x))
}
dat <- cts %>% tibble::rownames_to_column(var="outlier") %>% group_by(type) %>% mutate(is_outlier=ifelse(is_outlier(miR_373), miR_373, as.numeric(NA)))
dat$outlier[which(is.na(dat$is_outlier))] <- as.numeric(NA)
ggplot(dat, aes(y=miR_373, x=factor(type))) + geom_boxplot() + geom_text(aes(label=outlier),na.rm=TRUE,hjust=0.05) + geom_dotplot(binaxis='y', stackdir='center', dotsize=1, binwidth = .5)
制作
但下面的代码无法循环变量(列):
miRs <- names(cts)[c(1,2,3)]
for(i in miRs){
dat2 <- cts %>% tibble::rownames_to_column(var="outlier") %>% group_by(type) %>% mutate(is_outlier=ifelse(is_outlier(i), i, as.numeric(NA)))
dat2$outlier[which(is.na(dat2$is_outlier))] <- as.numeric(NA)
ggplot(dat2, aes(y=i, x=factor(type))) + geom_boxplot() + geom_text(aes(label=outlier),na.rm=TRUE,hjust=0.05) + geom_dotplot(binaxis='y', stackdir='center', dotsize=1, binwidth = .5)
}
Error in mutate_impl(.data, dots) : Evaluation error: non-numeric argument to binary operator.
我知道我在循环中替换 i 不被接受,但我不知道为什么,也没有找到另一种方法来做到这一点。如有任何建议或进一步阅读,我们将不胜感激。
最佳答案
使用 tidyverse
包进行编程需要一些时间来适应。在这种情况下,您将 i
视为一个表达式,而实际上它是一个字符串。您可以将其转换为 quosure
,然后在需要时取消引用,如下所示:
for(i in miRs){
i <- rlang::parse_expr(i)
dat2 <- cts %>%
tibble::rownames_to_column(var="outlier") %>%
group_by(type) %>%
mutate(is_outlier=ifelse(is_outlier(!!i),
!!i,
as.numeric(NA)))
dat2$outlier[which(is.na(dat2$is_outlier))] <- as.numeric(NA)
dev.new()
p <- ggplot(dat2, aes(y=!!i, x=factor(type))) +
geom_boxplot() +
geom_text(aes(label=outlier),
na.rm=TRUE,
hjust=0.05) +
geom_dotplot(binaxis='y',
stackdir='center',
dotsize=1,
binwidth = .5)
print(p)
}
关于r - dplyr Mutate 中的错误 - 遍历列以生成图形,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/54916538/
我有以下数据框: library(dplyr) df % rename_all(funs(stringr::str_replace_all(., "gh", "v"))) 我想结合使用 renam
我有以下数据框: library(dplyr) df % rename_all(funs(stringr::str_replace_all(., "gh", "v"))) 我想结合使用 renam
我有一个数据( df_1 ): df_1 % select_at(.vars = 'var_1') var_1 1 99.47262 10 25.91552 没关系。但: df_1
我正在尝试安装dplyr软件包,但收到一条错误消息,提示“库(dplyr)中存在错误:没有名为dplyr的软件包”。我正在使用窗口系统和Ri386 3.5.2。我尝试按照其他人的建议使用代码insta
假设我想以并行方式申请 myfunction到 myDataFrame 的每一行.假设 otherDataFrame是一个包含两列的数据框:COLUNM1_odf和 COLUMN2_odf出于某些原因
我目前正在构建一个包,我想知道是否有办法调用 %>%来自 dplyr 的操作符,而无需实际附加 dplyr 包。例如,对于从包中导出的任何函数,您可以使用双冒号 ( :: ) 调用它。所以如果我想使用
library(dplyr) mtcars %>% group_by(vs) %>% do(tt=t.test(mpg~am, data=.)) %>% mutate(t=tt$statist
我正在尝试为一组标准曲线构建一系列线性模型。 目前这段代码正在产生我想要的输出(每个线性模型的截距和斜率): slopes % group_by(plate, col, row, conc_ug_mL
我正在寻找替换我的一些使用 dplyr::do 的 R 代码,因为这个函数很快就会被弃用。我的很多工作都需要创建分层 CDF 图。使用 dply:do 时,我分层的变量作为变量传递给结果数据框,然后我
问题 我正在尝试使用 dplyr::mutate()和 dplyr::case_when()在数据框中创建新的数据列,该列使用存储在另一个对象(“查找列表”)中的数据填充,并基于数据框中列中的信息。
最近我发现了很棒的 dplyr.spark.hive启用 dplyr 的软件包前端操作 spark或 hive后端。 在包的 README 中有关于如何安装此包的信息: options(repos =
我正在尝试在 dplyr 链中使用 data.frame 两次。这是一个给出错误的简单示例 df % group_by(Type) %>% summarize(X=n()) %>% mu
当我浏览答案时 here , 我找到了 this solution与 data.frame 完全符合预期. library(dplyr) # dplyr_0.4.3 library(data.tab
我的数据来自一个数据库,根据我运行 SQL 查询的时间,该数据库可能包含一周到另一周不同的 POS 值。 不知道哪些值将在变量中使得自动创建报告变得非常困难。 我的数据如下所示: sample % p
我想定义与“扫帚”包中类似的功能 library(dplyr) library(broom) mtcars %>% group_by(am) %>% do(model = lm(mpg ~ w
set.seed(123) df % group_by(id) %>% mutate(roll.sum = c(x[1:4], zoo::rollapply(x, 5, sum))) # Groups
先来个样本数据 set.seed(123) dat 1 -4 2 6 3 -2 4
我有一个带列的数据框 x1, x2, group我想生成一个带有额外列的新数据框 rank表示x1的顺序在其组中。 有相关问题here ,但已接受的答案似乎不再有效。 到这里为止,很好: librar
我有一个示例 df,如下所示: d% group_by(CaseNo) %>% arrange(desc(Submissiondate)) %>% dplyr::mutate(rank = row_n
我有一个数据框,其中包含一些数据输入错误。 我希望将每组的这些异常值替换为每组最常见的值。 我的数据如下: df % group_by(CODE) %>% mutate(across(c(DOSAGE
我是一名优秀的程序员,十分优秀!