33

我需要绘制一个散点图,其中通过列号而不是名称来寻址变量,即ggplot(dat, aes(x=Var1, y=Var2))我需要类似ggplot(dat, aes(x=dat[,1], y=dat[,2])). (我说“某事”是因为后者不起作用)。

这是我的代码:

showplot1<-function(indata, inx, iny){
  dat<-indata
  print(nrow(dat)); # this is just to show that object 'dat' is defined
  p <- ggplot(dat, aes(x=dat[,inx], y=dat[,iny]))
  p + geom_point(size=4, alpha = 0.5)
}

testdata<-data.frame(v1=rnorm(100), v2=rnorm(100), v3=rnorm(100), v4=rnorm(100), v5=rnorm(100))
showplot1(indata=testdata, inx=2, iny=3)
# Error in eval(expr, envir, enclos) : object 'dat' not found
4

7 回答 7

24

你的问题是aes不知道你的函数的环境,它只在global environment. 因此,dat函数中声明的变量对's函数不可见,除非您将其显式传递为:ggplot2aes

showplot1<-function(indata, inx, iny) {
    dat <- indata
    p <- ggplot(dat, aes(x=dat[,inx], y=dat[,iny]), environment = environment())
    p <- p + geom_point(size=4, alpha = 0.5)
    print(p)
}

注意命令中的environment = environment()参数ggplot()。它现在应该可以工作了。

于 2013-03-10T14:53:49.457 回答
15

我强烈建议使用aes_q而不是将向量传递给aes(@Arun 的答案)。它可能看起来有点复杂,但它更灵活,例如更新数据时。

showplot1 <- function(indata, inx, iny){
  p <- ggplot(indata, 
              aes_q(x = as.name(names(indata)[inx]), 
                    y = as.name(names(indata)[iny])))
  p + geom_point(size=4, alpha = 0.5)
}

这就是为什么它更可取的原因:

# test data (using non-standard names)
testdata<-data.frame(v1=rnorm(100), v2=rnorm(100), v3=rnorm(100), v4=rnorm(100), v5=rnorm(100))
names(testdata) <- c("a-b", "c-d", "e-f", "g-h", "i-j")
testdata2 <- data.frame(v1=rnorm(100), v2=rnorm(100), v3=rnorm(100), v4=rnorm(100), v5=rnorm(100))
names(testdata2) <- c("a-b", "c-d", "e-f", "g-h", "i-j")

# works
showplot1(indata=testdata, inx=2, iny=3)
# this update works in the aes_q version
showplot1(indata=testdata, inx=2, iny=3) %+% testdata2

注意:ggplot2 v2.0.0 aes_q()开始,已替换aes_()为与其他包中 NSE 功能的 SE 版本一致。

于 2015-06-03T11:27:24.407 回答
13

尝试:

showplot1 <- function(indata, inx, iny) {
    x <- names(indata)[inx] 
    y <- names(indata)[iny] 
    p <- ggplot(indata, aes_string(x = x, y = y))
    p + geom_point(size=4, alpha = 0.5)
}

编辑以显示正在发生的事情 - aes_string 使用带引号的参数,名称使用您的数字获取它们。

于 2013-03-10T14:43:05.733 回答
8

使用以下新功能对@Shadow 的回答进行了变体ggplot2 V3.0.0

showplot <- function(indata, inx, iny){
  nms <- names(indata)
  x <- nms[inx]
  y <- nms[iny]
  p <- ggplot(indata, aes(x = !!ensym(x), y = !!ensym(y)))
  p + geom_point(size=4, alpha = 0.5)
}   

testdata <- data.frame(v1=rnorm(100), v2=rnorm(100), v3=rnorm(100), v4=rnorm(100), v5=rnorm(100))
names(testdata) <- c("a-b", "c-d", "e-f", "g-h", "i-j")
showplot(indata=testdata, inx=2, iny=3)

ensym从包含在变量中的字符串创建一个符号(因此我们首先必须在函数的开头创建这些变量),然后!!取消引用它,这意味着它将像您提供函数原始名称一样工作。

!!仅在旨在支持它的函数的上下文中工作,通常是 tidyverse 函数,否则它只是意味着“不是”(类似于as.logical)..

于 2018-11-06T09:57:07.313 回答
2

为了完整起见,我认为使用列名而不是索引更安全,因为数据框中的列位置可能会更改,从而导致意外结果。

下面的plot_duo函数(取自这个答案)可以使用输入作为字符串或裸列名

library(rlang)
library(purrr)
library(dplyr)
library(ggplot2)

theme_set(theme_classic(base_size = 14))
set.seed(123456)
testdata <- data.frame(v1 = rnorm(100), v2 = rnorm(100), v3 = rnorm(100), 
                       v4 = rnorm(100), v5 = rnorm(100))

plot_duo <- function(df, plot_var_x, plot_var_y) {

  # check if input is character or bare column name to 
  # use ensym() or enquo() accordingly
  if (is.character(plot_var_x)) {
    print('character column names supplied, use ensym()')
    plot_var_x <- ensym(plot_var_x)
  } else {
    print('bare column names supplied, use enquo()')
    plot_var_x <- enquo(plot_var_x)
  }

  if (is.character(plot_var_y)) {
    plot_var_y <- ensym(plot_var_y)
  } else {
    plot_var_y <- enquo(plot_var_y)
  }

  # unquote the variables using !! (bang bang) so ggplot can evaluate them
  pts_plt <- ggplot(df, aes(x = !! plot_var_x, y = !! plot_var_y)) + 
    geom_point(size = 4, alpha = 0.5)

  return(pts_plt)
}

plot_duo使用跨列应用函数purrr::map()

### use character column names
plot_vars1 <- names(testdata)
plt1 <- plot_vars1 %>% purrr::map(., ~ plot_duo(testdata, .x, "v1"))
#> [1] "character column names supplied, use ensym()"
#> [1] "character column names supplied, use ensym()"
#> [1] "character column names supplied, use ensym()"
#> [1] "character column names supplied, use ensym()"
#> [1] "character column names supplied, use ensym()"

str(plt1, max.level = 1)
#> List of 5
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"

# test plot
plt1[[3]]

### use bare column names
# Ref: https://stackoverflow.com/a/49834499/
plot_vars2 <- rlang::exprs(v2, v3, v4)
plt2 <- plot_vars2 %>% purrr::map(., ~ plot_duo(testdata, .x, rlang::expr(v1)))
#> [1] "bare column names supplied, use enquo()"
#> [1] "bare column names supplied, use enquo()"
#> [1] "bare column names supplied, use enquo()"

str(plt2, max.level = 1)
#> List of 3
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"
#>  $ :List of 9
#>   ..- attr(*, "class")= chr [1:2] "gg" "ggplot"

plt1[[2]]

reprex 包于 2019-02-18 创建(v0.2.1.9000)

于 2019-02-18T20:52:35.167 回答
1

和方法现在已被软弃用aes_()aes_quote()与准引用一致的一种简单方法是通过调用列名.data[[col_name]]。您可以根据位置轻松提取这些。例如:

library(ggplot2)
library(dplyr)

showplot1<-function(indata, inx, iny){
  dat<-indata
  col_names <- names(indata)
  col_name_x <- col_names[[inx]]
  col_name_y <- col_names[[iny]]
  
  print(nrow(dat)); # this is just to show that object 'dat' is defined
  p <- ggplot(dat, aes(x=.data[[col_name_x]], y=.data[[col_name_y]]))
  p + geom_point(size=4, alpha = 0.5)
}

testdata<-data.frame(v1=rnorm(100), v2=rnorm(100), v3=rnorm(100), v4=rnorm(100), v5=rnorm(100))
showplot1(indata=testdata, inx=2, iny=3)
#> [1] 100

reprex 包于 2021-09-22 创建 (v2.0.0 )

于 2021-09-22T14:38:48.143 回答
0

我暂时找到的临时解决方案:

showplot1<-function(indata, inx, iny){
  dat<-data.frame(myX=indata[,inx], myY=indata[,iny])
  print(nrow(dat)); # this is just to show that object 'dat' is defined
  p <- ggplot(dat, aes(x=myX, y=myY))
  p + geom_point(size=4, alpha = 0.5)
}

但我不太喜欢它,因为在我的真实代码中,我需要其他列indata,在这里我必须在dat<-...中明确定义所有这些列

于 2013-03-10T14:44:32.420 回答