聚集在 sparklyr

Gather in sparklyr

我正在使用 sparklyr 来处理一些数据。 给定一个,

a<-tibble(id = rep(c(1,10), each = 10),
          attribute1 = rep(c("This", "That", 'These', 'Those', "The", "Other", "Test", "End", "Start", 'Beginning'), 2),
          value = rep(seq(10,100, by = 10),2),
          average = rep(c(50,100),each = 10),
          upper_bound = rep(c(80, 130), each =10),
          lower_bound = rep(c(20, 70), each =10))

我想使用 "gather" 来操作数据,如下所示:

b<- a %>% 
     gather(key = type_data, value = value_data, -c(id:attribute1))

但是,"gather" 在 sparklyr 上不可用。我见过一些人使用 sdf_pivot 来模仿 "gather"(例如 ),但我看不出在这种情况下如何使用它。

有人知道吗?

干杯!

不,不pivot在这里回答。

我也在等更好的

library(sparklyr)
library(rlang)
library(dplyr)

#Given
sparkDf_a <- copy_to(dest = sc, df = a)

helper_fn <- function(df, key, val, ...){

    quo_col <- enquo(val)

    df %>% 
        dplyr::group_by(id, attribute1) %>% 
        dplyr::select(!!quo_col) %>% 
        mutate(type_data  = key, 
               value_data = !!quo_col) %>% 
        dplyr::select(-!!quo_col)
}

b <- sdf_bind_rows(
      helper_fn(df = sparkDf_a, key = 'value', val = value),
      helper_fn(df = sparkDf_a, key = 'average', val = average),
      helper_fn(df = sparkDf_a, key = 'upper_bound', val = upper_bound),
      helper_fn(df = sparkDf_a, key = 'lower_bound', val = lower_bound)
 )

结果

collect(b)
# A tibble: 80 x 4
# Groups:   id, attribute1 [20]
      id attribute1   type_data value_data
   <dbl>      <chr>       <chr>      <dbl>
 1     1        End upper_bound         80
 2     1      Other lower_bound         20
 3     1      Start lower_bound         20
 4     1       Test     average         50
 5     1       Test upper_bound         80
 6     1       That     average         50
 7     1       That lower_bound         20
 8     1      Those       value         40
 9    10      Start lower_bound         70
10    10       That     average        100
# ... with 70 more rows

这是一个在 sparklyr 中模仿 gather 的函数。这将收集给定的列,同时保持其他所有内容完好无损,但如果需要,它可以轻松扩展。

# Function
sdf_gather <- function(tbl, gather_cols){

  other_cols <- colnames(tbl)[!colnames(tbl) %in% gather_cols]

  lapply(gather_cols, function(col_nm){
    tbl %>% 
      select(c(other_cols, col_nm)) %>% 
      mutate(key = col_nm) %>%
      rename(value = col_nm)  
  }) %>% 
    sdf_bind_rows() %>% 
    select(c(other_cols, 'key', 'value'))
}

# Example
spark_df %>% 
  select(col_1, col_2, col_3, col_4) %>% 
  sdf_gather(c('col_3', 'col_4'))

您可以使用 map / explode:

设计等效项
sdf_gather <- function(data, key = "key", value = "value", ...) {
  cols <- list(...) %>% unlist()

  # Explode with map (same as stack) requires multiple aliases so
  # dplyr mutate won't work for us here.
  expr <- list(paste(
    "explode(map(",
    paste("'", cols, "',`",  cols, "`", sep = "", collapse = ","),
    ")) as (", key, ",", value, ")", sep = ""))

  keys <- data %>% colnames() %>% setdiff(cols) %>% as.list()

  data %>%
    spark_dataframe() %>% 
    sparklyr::invoke("selectExpr", c(keys, expr)) %>% 
    sdf_register()
}

或 Hive stack function:

sdf_gather <- function(data, key = "key", value = "value", ...) {
  cols <- list(...) %>% unlist()
  expr <- list(paste(
    "stack(", length(cols), ", ",
    paste("'", cols, "',`",  cols, "`", sep="", collapse=","),
    ") as (", key, ",", value, ")", sep=""))

  keys <- data %>% colnames() %>% setdiff(cols) %>% as.list()

  data %>%
    spark_dataframe() %>% 
    sparklyr::invoke("selectExpr", c(keys, expr)) %>% 
    sdf_register()
}

两者应该给出相同的结果:

long <- sdf_gather(
  df, "my_key", "my_value",
  "value", "average", "upper_bound", "lower_bound")
long
# Source:   table<sparklyr_tmp_7b8f5989ba4d> [?? x 4]
# Database: spark_connection
      id attribute1 my_key      my_value
   <dbl> <chr>      <chr>          <dbl>
 1     1 This       value             10
 2     1 This       average           50
 3     1 This       upper_bound       80
 4     1 This       lower_bound       20
 5     1 That       value             20
 6     1 That       average           50
 7     1 That       upper_bound       80
 8     1 That       lower_bound       20
 9     1 These      value             30
10     1 These      average           50
# ... with more rows

并且可以修改以支持非标准评估。

请注意,这两种方法都需要同类的列类型。

备注

explode 版本生成以下查询:

SELECT id, attribute1, 
       explode(map(
         'value', `value`,
         'average', `average`,
         'upper_bound', `upper_bound`,
         'lower_bound', `lower_bound`)) as (my_key,my_value)

FROM df

org.apache.spark.sql.catalyst.plans.logical.Generate
Generate explode(map(value, value#16, average, average#17, upper_bound, upper_bound#18, lower_bound, lower_bound#19)), [2, 3, 4, 5], false, [my_key#226, my_value#227]
+- InMemoryRelation [id#14, attribute1#15, value#16, average#17, upper_bound#18, lower_bound#19], StorageLevel(disk, memory, deserialized, 1 replicas)
      +- Scan ExistingRDD[id#14,attribute1#15,value#16,average#17,upper_bound#18,lower_bound#19]

stack 版本生成

SELECT id, attribute1, 
       stack(4, 
             'value', `value`,
             'average', `average`,
             'upper_bound', `upper_bound`,
             'lower_bound', `lower_bound`) as (my_key,my_value)
FROM df

org.apache.spark.sql.catalyst.plans.logical.Generate
Generate stack(4, value, value#16, average, average#17, upper_bound, upper_bound#18, lower_bound, lower_bound#19), [2, 3, 4, 5], false, [my_key#323, my_value#324]
+- InMemoryRelation [id#14, attribute1#15, value#16, average#17, upper_bound#18, lower_bound#19], StorageLevel(disk, memory, deserialized, 1 replicas)
      +- Scan ExistingRDD[id#14,attribute1#15,value#16,average#17,upper_bound#18,lower_bound#19]

生成的 SQL 中的单引号值(即 'value')是文字字符串,而反引号值表示列引用。