tidyverse初认识

1 第一题 编写代码

利用nycflights13包的flights数据集是2013年从纽约三大机场(JFK、LGA、EWR)起飞的所有航班的准点数据,共336776条记录。

  • 计算纽约三大机场2013起飞航班数和平均延误时间(可使用group_by, summarise函数)

    # 计算每个机场的起飞航班数和平均延误时间
    airport_summary <- flights %>%
      group_by(origin) %>%
      summarise(
        total_flights = n(),
        avg_delay = mean(dep_delay, na.rm = TRUE)
      )
    
    print(airport_summary)
    # A tibble: 3 × 3
      origin total_flights avg_delay
      <chr>          <int>     <dbl>
    1 EWR           120835      15.1
    2 JFK           111279      12.1
    3 LGA           104662      10.3
  • 计算不同航空公司2013从纽约起飞航班数和平均延误时间

    # 计算每个航空公司的起飞航班数和平均延误时间
    airline_summary <- flights %>%
      group_by(carrier) %>%
      summarise(
        total_flights = n(),
        avg_delay = mean(dep_delay, na.rm = TRUE)
      )
    
    print(airline_summary)
    # A tibble: 16 × 3
       carrier total_flights avg_delay
       <chr>           <int>     <dbl>
     1 9E              18460     16.7 
     2 AA              32729      8.59
     3 AS                714      5.80
     4 B6              54635     13.0 
     5 DL              48110      9.26
     6 EV              54173     20.0 
     7 F9                685     20.2 
     8 FL               3260     18.7 
     9 HA                342      4.90
    10 MQ              26397     10.6 
    11 OO                 32     12.6 
    12 UA              58665     12.1 
    13 US              20536      3.78
    14 VX               5162     12.9 
    15 WN              12275     17.7 
    16 YV                601     19.0 
  • 计算纽约三大机场排名前三个目的地和平均飞行距离(可使用group_by, summarise, arrange, slice_max函数)

    # 计算每个机场的前三个目的地和平均飞行距离
    top_destinations <- flights %>%
      group_by(origin, dest) %>%
      summarise(
        avg_distance = mean(distance, na.rm = TRUE)
      ) %>%
      arrange(origin, desc(avg_distance)) %>%
      group_by(origin) %>%
      slice_max(order_by = avg_distance, n = 3)
    `summarise()` has grouped output by 'origin'. You can override using the
    `.groups` argument.
    print(top_destinations)
    # A tibble: 9 × 3
    # Groups:   origin [3]
      origin dest  avg_distance
      <chr>  <chr>        <dbl>
    1 EWR    HNL           4963
    2 EWR    ANC           3370
    3 EWR    SFO           2565
    4 JFK    HNL           4983
    5 JFK    SFO           2586
    6 JFK    OAK           2576
    7 LGA    DEN           1620
    8 LGA    HOU           1428
    9 LGA    IAH           1416

2 第二题 解释代码

  1. 代码含义:tibble(iris):将iris数据集转换为tibble格式(一种更现代的data.frame格式)。

    arrange(Species, across(starts_with("Sepal"), desc))

    • arrange:对数据进行排序。

    • Species:首先按Species列升序排列。

    • across(starts_with("Sepal"), desc):对以Sepal开头的列(如Sepal.LengthSepal.Width)进行降序排列。

    • 最终结果:数据按Species升序排列,同时每个Species内部,以Sepal开头的列按降序排列。

    tibble(iris) %>% 
      arrange(Species,across(starts_with("Sepal"), desc))
    # A tibble: 150 × 5
       Sepal.Length Sepal.Width Petal.Length Petal.Width Species
              <dbl>       <dbl>        <dbl>       <dbl> <fct>  
     1          5.8         4            1.2         0.2 setosa 
     2          5.7         4.4          1.5         0.4 setosa 
     3          5.7         3.8          1.7         0.3 setosa 
     4          5.5         4.2          1.4         0.2 setosa 
     5          5.5         3.5          1.3         0.2 setosa 
     6          5.4         3.9          1.7         0.4 setosa 
     7          5.4         3.9          1.3         0.4 setosa 
     8          5.4         3.7          1.5         0.2 setosa 
     9          5.4         3.4          1.7         0.2 setosa 
    10          5.4         3.4          1.5         0.4 setosa 
    # ℹ 140 more rows
  2. 代码含义:starwars:使用starwars数据集。

    group_by(gender):按gender列分组(如malefemalenone等)。

    filter(mass > mean(mass, na.rm = TRUE))

    • 对每个gender组,筛选出mass大于该组平均mass的行。

    • na.rm = TRUE:忽略mass列中的NA值。

    • 最终结果:返回每个性别组中,体重高于该组平均体重的角色。

    starwars %>% 
      group_by(gender) %>% 
      filter(mass > mean(mass, na.rm = TRUE))
    # A tibble: 15 × 14
    # Groups:   gender [3]
       name    height   mass hair_color skin_color eye_color birth_year sex   gender
       <chr>    <int>  <dbl> <chr>      <chr>      <chr>          <dbl> <chr> <chr> 
     1 Darth …    202  136   none       white      yellow          41.9 male  mascu…
     2 Owen L…    178  120   brown, gr… light      blue            52   male  mascu…
     3 Beru W…    165   75   brown      light      blue            47   fema… femin…
     4 Chewba…    228  112   brown      unknown    blue           200   male  mascu…
     5 Jabba …    175 1358   <NA>       green-tan… orange         600   herm… mascu…
     6 Jek To…    180  110   brown      fair       blue            NA   <NA>  <NA>  
     7 IG-88      200  140   none       metal      red             15   none  mascu…
     8 Bossk      190  113   none       green      red             53   male  mascu…
     9 Ayla S…    178   55   none       blue       hazel           48   fema… femin…
    10 Gregar…    185   85   black      dark       brown           NA   <NA>  <NA>  
    11 Lumina…    170   56.2 black      yellow     blue            58   fema… femin…
    12 Zam We…    168   55   blonde     fair, gre… yellow          NA   fema… femin…
    13 Shaak …    178   57   none       red, blue… black           NA   fema… femin…
    14 Grievo…    216  159   none       brown, wh… green, y…       NA   male  mascu…
    15 Tarfful    234  136   brown      brown      blue            NA   male  mascu…
    # ℹ 5 more variables: homeworld <chr>, species <chr>, films <list>,
    #   vehicles <list>, starships <list>
  3. 代码含义:starwars:使用starwars数据集。

    select(name, homeworld, species):选择namehomeworldspecies三列。

    mutate(across(!name, as.factor))

    • across(!name, as.factor):对除了name列之外的所有列(即homeworldspecies),将其转换为因子(factor)类型。

    • 最终结果:返回一个包含namehomeworldspecies列的数据框,其中homeworldspecies被转换为因子类型。

    starwars %>%
      select(name, homeworld, species) %>%
      mutate(across(!name, as.factor))
    # A tibble: 87 × 3
       name               homeworld species
       <chr>              <fct>     <fct>  
     1 Luke Skywalker     Tatooine  Human  
     2 C-3PO              Tatooine  Droid  
     3 R2-D2              Naboo     Droid  
     4 Darth Vader        Tatooine  Human  
     5 Leia Organa        Alderaan  Human  
     6 Owen Lars          Tatooine  Human  
     7 Beru Whitesun Lars Tatooine  Human  
     8 R5-D4              Tatooine  Droid  
     9 Biggs Darklighter  Tatooine  Human  
    10 Obi-Wan Kenobi     Stewjon   Human  
    # ℹ 77 more rows
  4. 代码含义:tibble(mtcars):将mtcars数据集转换为tibble格式。

    group_by(vs):按vs列分组(vs表示发动机类型,0为V型发动机,1为直列发动机)。

    mutate(hp_cut = cut(hp, 3))

    • cut(hp, 3):将hp(马力)列的值分为3个区间(等宽分箱),并返回一个因子类型的列hp_cut,表示每个值所属的区间。

    • 例如,如果hp的范围是50到300,则分为3个区间:(50, 150](150, 250](250, 300]

    group_by(hp_cut):按hp_cut列重新分组。

    最终结果:数据首先按vs分组,然后对每个vs组内的hp进行分箱,最后按分箱结果重新分组。

    tibble(mtcars) %>%
      group_by(vs) %>%
      mutate(hp_cut = cut(hp, 3)) %>%
      group_by(hp_cut)
    # A tibble: 32 × 12
    # Groups:   hp_cut [6]
         mpg   cyl  disp    hp  drat    wt  qsec    vs    am  gear  carb hp_cut     
       <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <fct>      
     1  21       6  160    110  3.9   2.62  16.5     0     1     4     4 (90.8,172] 
     2  21       6  160    110  3.9   2.88  17.0     0     1     4     4 (90.8,172] 
     3  22.8     4  108     93  3.85  2.32  18.6     1     1     4     1 (75.7,99.3]
     4  21.4     6  258    110  3.08  3.22  19.4     1     0     3     1 (99.3,123] 
     5  18.7     8  360    175  3.15  3.44  17.0     0     0     3     2 (172,254]  
     6  18.1     6  225    105  2.76  3.46  20.2     1     0     3     1 (99.3,123] 
     7  14.3     8  360    245  3.21  3.57  15.8     0     0     3     4 (172,254]  
     8  24.4     4  147.    62  3.69  3.19  20       1     0     4     2 (51.9,75.7]
     9  22.8     4  141.    95  3.92  3.15  22.9     1     0     4     2 (75.7,99.3]
    10  19.2     6  168.   123  3.92  3.44  18.3     1     0     4     4 (99.3,123] 
    # ℹ 22 more rows

3 第三题 查找帮助理解函数

阅读 https://dplyr.tidyverse.org/reference/mutate-joins.html 内容,说明4个数据集链接函数函数的作用。分别举一个实际例子演示并解释其输出结果。

  1. inner_join()

    library(dplyr)
    
    # 创建两个示例数据集
    df1 <- tibble(id = c(1, 2, 3), name = c("Alice", "Bob", "Charlie"))
    df2 <- tibble(id = c(2, 3, 4), age = c(25, 30, 35))
    
    # 使用inner_join合并
    result <- inner_join(df1, df2, by = "id")
    print(result)
    # A tibble: 2 × 3
         id name      age
      <dbl> <chr>   <dbl>
    1     2 Bob        25
    2     3 Charlie    30
  2. left_join()

    # 使用left_join合并
    result <- left_join(df1, df2, by = "id")
    print(result)
    # A tibble: 3 × 3
         id name      age
      <dbl> <chr>   <dbl>
    1     1 Alice      NA
    2     2 Bob        25
    3     3 Charlie    30
  3. right_join()

    # 使用right_join合并
    result <- right_join(df1, df2, by = "id")
    print(result)
    # A tibble: 3 × 3
         id name      age
      <dbl> <chr>   <dbl>
    1     2 Bob        25
    2     3 Charlie    30
    3     4 <NA>       35
  4. full_join()

    # 使用full_join合并
    result <- full_join(df1, df2, by = "id")
    print(result)
    # A tibble: 4 × 3
         id name      age
      <dbl> <chr>   <dbl>
    1     1 Alice      NA
    2     2 Bob        25
    3     3 Charlie    30
    4     4 <NA>       35