Week 5 - Arrow package_student

For larger than life datasets

Author

DSA_406_001_SP25_wk5_gpetkau

Today’s Lesson: Efficient Big Data Analysis with Arrow

Objectives

By the end of this lesson, you will be able to:

  • Understand why Arrow is crucial for big data analysis
  • Practice with real-world data
  • Apply data science communication principles to your analysis

Why Arrow?

Arrow is designed for handling very large datasets (100GB+) with:

  • Zero-copy reads
  • Columnar format efficiency
  • Cross-language compatibility
  • Native parallel processing

🤔 Data Scientist Thinking: When working with big data, we need to consider both computational efficiency and memory management. How might these features impact our daily workflow?

Resource: Apache coockbook

#Load Library
library(tidyverse)
Warning: package 'lubridate' was built under R version 4.3.3
── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
✔ dplyr     1.1.4     ✔ readr     2.1.4
✔ forcats   1.0.0     ✔ stringr   1.5.0
✔ ggplot2   3.5.1     ✔ tibble    3.2.1
✔ lubridate 1.9.4     ✔ tidyr     1.3.0
✔ purrr     1.0.2     
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
✖ dplyr::filter() masks stats::filter()
✖ dplyr::lag()    masks stats::lag()
ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(arrow)
Warning: package 'arrow' was built under R version 4.3.3

Attaching package: 'arrow'

The following object is masked from 'package:lubridate':

    duration

The following object is masked from 'package:utils':

    timestamp

Downloading the Data

A dataset of item checkouts from Seattle public libraries, available online at data.seattle.gov/Community/Checkouts-by-Title/tmmm-ytt6.

Step 1: Create a Directory

First, let’s create a special folder to store our data:

# Create a "data" directory if it doesn't exist already
# Using showWarnings = FALSE to suppress warning if directory already exists
dir.create("data", showWarnings = FALSE)

Step 2: Download the Dataset

Now for the fun part! We’ll download the Seattle Library dataset (9GB).

⚠️ Important: This is a 9GB file, so:

  • Make sure you have enough disk space
# Download Seattle library checkout dataset:
# 1. Fetch data from AWS S3 bucket URL
# 2. Save to local data directory
# 3. Use resume = TRUE to allow continuing interrupted downloads
#curl::multi_download(
#  "https://r4ds.s3.us-west-2.amazonaws.com/seattle-library-checkouts.csv",
#  "data/seattle-library-checkouts.csv",
#  resume = TRUE
#)

Why USE: curl::multi_download()

  • Shows a progress bar (great for tracking large downloads)
  • Can resume if interrupted (super helpful for big files!)
  • More reliable than base R download methods

Resource: CURL

🤔 While the file downloads, let’s think about:

  1. Why do we need special tools for such large datasets?

  2. What challenges might we face with traditional R methods?

  3. How might a library use this kind of data?

Step 3: Verify the Download

After the download completes, let’s make sure everything worked:

# Check if the Seattle library dataset file exists and print its size:
# 1. Verify file exists at specified path
# 2. Calculate file size in gigabytes by dividing bytes by 1024^3

file.exists("data/seattle-library-checkouts.csv")
[1] TRUE
file.size("data/seattle-library-checkouts.csv") / 1024^3  # Size in GB
[1] 8.579315

Loading Our Data with Arrow 🚀

Step 1: Opening the Dataset

# Load Seattle library checkout data into Arrow dataset:
# 1. Specify the CSV file path
# 2. Set ISBN column to be read as string type to preserve leading zeros
# 3. Define CSV as the file format
seattle_csv <- open_dataset(
  sources = "data/seattle-library-checkouts.csv", 
  col_types = schema(ISBN = string()),
  format = "csv"
)

What’s Actually Happening? 🤔

The Magic of Lazy Loading

When you run this code with open_dataset(), Arrow does something clever:

  1. It peeks at the first few thousand rows

  2. Figures out what kind of data is in each column

  3. Creates a roadmap of the data

  4. Then… it stops!

That’s right - it doesn’t load the whole 9GB file. Imagine Arrow as a really efficient librarian who:

  • Creates an index of where everything is

  • Only gets books (data) when you specifically ask for them

  • Keeps track of what’s where without moving everything

Why Specify ISBN as String?

  • The first 80,000 rows have blank ISBNs
  • Without our help, Arrow might get confused about what type of data this is
  • By telling Arrow “this is definitely text”, we prevent any confusion

Run seattle_csv

You’ll see something interesting:

  • Information about where the data is stored

  • The structure Arrow discovered

  • Column names and types

  • But NO actual data yet!

#Inspect the data
seattle_csv
FileSystemDataset with 1 csv file
12 columns
UsageClass: string
CheckoutType: string
MaterialType: string
CheckoutYear: int64
CheckoutMonth: int64
Checkouts: int64
Title: string
ISBN: string
Creator: string
Subjects: string
Publisher: string
PublicationYear: string

🎯 Key Takeaways

  1. Arrow is lazy (in a good way!)
  • Only does work when necessary

  • Saves memory and time

  1. Arrow is smart
  • Figures out data types automatically

  • But accepts our help when needed

  1. Arrow is efficient

    • Keeps track of data without loading it

    • Ready to fetch exactly what we need

DPLYR functions

Arrow package provides a dplyr backend allowing you to analyze larger-than-memory datasets using familiar dplyr syntax.

Using collect() we can force arrow to perform the computation and return some data.

# View this will take a long time so don't run it in class
#dplyr::collect(seattle_csv)

🔍 Investigation

👉 Now You Try!** (3 min)

Check out the dataset to undertand the data structure

#Create below:

# Clue 1: Basic structure
#ADD CODE BELOW
str(seattle_csv)
Classes 'FileSystemDataset', 'Dataset', 'ArrowObject', 'R6' <FileSystemDataset>
  Inherits from: <Dataset>
  Public:
    .:xp:.: externalptr
    .class_title: function () 
    .unsafe_delete: function () 
    class_title: function () 
    clone: function (deep = FALSE) 
    files: active binding
    filesystem: active binding
    format: active binding
    initialize: function (xp) 
    metadata: active binding
    NewScan: function () 
    num_cols: active binding
    num_rows: active binding
    pointer: function () 
    print: function (...) 
    schema: active binding
    set_pointer: function (xp) 
    ToString: function () 
    type: active binding
    WithSchema: function (schema)  
# Clue 2: Dataset dimensions
#ADD CODE BELOW
dim(seattle_csv)
[1] 41389465       12
# Clue 3: Column names 
#ADD CODE BELOW
names(seattle_csv)
 [1] "UsageClass"      "CheckoutType"    "MaterialType"    "CheckoutYear"   
 [5] "CheckoutMonth"   "Checkouts"       "Title"           "ISBN"           
 [9] "Creator"         "Subjects"        "Publisher"       "PublicationYear"
#Clue 4: Structure and types
#ADD CODE BELOW
glimpse(seattle_csv)
FileSystemDataset with 1 csv file
41,389,465 rows x 12 columns
$ UsageClass      <string> "Physical", "Physical", "Digital", "Physical", "Physi…
$ CheckoutType    <string> "Horizon", "Horizon", "OverDrive", "Horizon", "Horizo…
$ MaterialType    <string> "BOOK", "BOOK", "EBOOK", "BOOK", "SOUNDDISC", "BOOK",…
$ CheckoutYear     <int64> 2016, 2016, 2016, 2016, 2016, 2016, 2016, 2016, 2016,…
$ CheckoutMonth    <int64> 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6, 6,…
$ Checkouts        <int64> 1, 1, 1, 1, 1, 1, 1, 1, 4, 1, 1, 2, 3, 2, 1, 3, 2, 3,…
$ Title           <string> "Super rich : a guide to having it all / Russell Simm…
$ ISBN            <string> "", "", "", "", "", "", "", "", "", "", "", "", "", "…
$ Creator         <string> "Simmons, Russell", "Barclay, James, 1965-", "Tim Par…
$ Subjects        <string> "Self realization, Conduct of life, Attitude Psycholo…
$ Publisher       <string> "Gotham Books,", "Pyr,", "Random House, Inc.", "Dial …
$ PublicationYear <string> "c2011.", "2010.", "2015", "2005.", "c2004.", "c2005.…

👉 Now You Try! Create a write up:

So this dataset contains 41,389,465 rows that tell you how many times each book was checked out each month from April 2005 to October 2022.

The data set contains 41,389,465 rows and 12 columns. 3 integer variables and 9 string variables.

Part 2: Practical Arrow Usage

Working with summarize() in Arrow

  1. The summarise() function is like creating a summary report of your data. With Arrow, it’s especially powerful because it can create these summaries without loading all the data into memory.

    Common summary functions:

  • sum():

    • Adds up all values

    • Best for: Totals, like total checkouts

    • Example: sum(5, 3, 2) = 10

  • mean():

    • Calculates the average

    • Best for: Typical or central values

    • Example: mean(5, 3, 2) = (5+3+2)/3 = 3.33

  • median():

    • Finds the middle value

    • Best for: Central tendency when you have outliers

    • Example: median(5, 3, 2) = 3

  • max():

    • Finds the highest value

    • Best for: Peak values

    • Example: max(5, 3, 2) = 5

  • min():

    • Finds the lowest value

    • Best for: Minimum values

    • Example: min(5, 3, 2) = 2

  1. Let’s start with just sum

I wonder how many checkouts there are in a year?

# Calculate total checkouts per year by:
# 1. Grouping the data by checkout year
# 2. Summing all checkouts within each year
# 3. Collecting results from the lazy query into memory
yearly_checkouts <- seattle_csv %>%
  group_by(CheckoutYear) %>%
  summarise(
    total_checkouts = sum(Checkouts)
  ) %>%
  collect()
# Create the visualization
ggplot(yearly_checkouts, aes(x = CheckoutYear, y = total_checkouts)) +
  geom_line(color = "#2c5282", linewidth = 1) +
  geom_point(color = "#2c5282", size = 3) +
  labs(
    title = "Total Library Checkouts by Year",
    x = "Year",
    y = "Total Checkouts",
    caption = "Data source: Seattle Public Library"
  ) +
  theme_minimal() +
  theme(
    plot.title = element_text(size = 16, face = "bold"),
    axis.title = element_text(size = 12),
    axis.text = element_text(size = 10),
    panel.grid.minor = element_blank()
  ) +
  scale_y_continuous(labels = scales::comma)

💭 Analysis Questions:

  • What trends do you notice in the yearly checkouts?

  • Can you spot any unusual years? What might explain them?

I wonder what different types of material types there are?

# Get unique material types in the dataset by:
# 1. Selecting only the MaterialType column
# 2. Removing duplicate values
# 3. Collecting results from the lazy query into memory

material_count <- seattle_csv %>%
  group_by(MaterialType) %>%
  summarise(count=n()) %>%
  collect() %>%
  arrange(desc(count)) %>%
  filter(count>20000)
ggplot(material_count, aes(x = reorder(MaterialType, count), y = count)) +
  geom_bar(stat = "identity", fill = "#2c5282", alpha = 0.8) +
  coord_flip() +
  labs(
    title = "Distribution of Material Types in Seattle Library",
    x = "Material Type",
    y = "Number of Items",
    caption = "Data source: Seattle Public Library"
  ) +
  theme_minimal() +
  theme(
    plot.title = element_text(size = 16, face = "bold"),
    axis.title = element_text(size = 12),
    axis.text.y = element_text(size = 10),
    axis.text.x = element_text(size = 10, angle = 45, hjust = 1),
    panel.grid.minor = element_blank()
  ) +
  scale_y_continuous(labels = scales::comma)

💭 After the Results:

  • Were there any material types that surprised you?

  • How do these categories reflect changes in technology and media consumption?

  • What questions could we investigate about these different material types?

I wonder in 2020 what were the totals for the materials types?

# Calculate total checkouts per material type in 2020 by:
# 1. Filtering for checkouts made in 2020
# 2. Grouping the data by material type (e.g., books, DVDs)
# 3. Summing checkouts within each group
# 4. Collecting results from the lazy query into memory
checkouts_2020 <- seattle_csv %>%
  filter(CheckoutYear == 2020) %>%
  group_by(MaterialType) %>%
  summarise(total_checkouts = sum(Checkouts)) %>%
  collect() %>%
  arrange(desc(total_checkouts))

checkouts_2020
# A tibble: 43 × 2
   MaterialType         total_checkouts
   <chr>                          <int>
 1 EBOOK                        2793961
 2 AUDIOBOOK                    1513625
 3 BOOK                         1241999
 4 VIDEODISC                     361587
 5 SOUNDDISC                     116221
 6 MIXED                           9118
 7 REGPRINT                        7573
 8 VIDEO                           2430
 9 MUSIC                           2404
10 SOUNDDISC, VIDEODISC            1049
# ℹ 33 more rows
# Calculate some summary statistics
summary_stats <- checkouts_2020 %>%
  summarise(
    total_all_checkouts = sum(total_checkouts),
    avg_checkouts_per_material = mean(total_checkouts),
    median_checkouts = median(total_checkouts),
    n_material_types = n()
  )

#Inspect the object
summary_stats
# A tibble: 1 × 4
  total_all_checkouts avg_checkouts_per_mate…¹ median_checkouts n_material_types
                <int>                    <dbl>            <int>            <int>
1             6053717                  140784.               19               43
# ℹ abbreviated name: ¹​avg_checkouts_per_material

Critical Thinking:

  • Why might we be particularly interested in 2020 data?

  • What hypotheses can we form about different material types?

👉 Now You Try! (3 minutes)

Modify the code above to find the total checkouts for a different year.

#ADD COMMENTS AND CODE BELOW

If time allows work in a group and come up with a wondering and investigate it.

#ADD COMMENTS AND CODE BELOW

🎯 Key Takeaways

  1. Arrow is lazy (in a good way!)
-    Only does work when necessary

-    Saves memory and time
  1. Arrow is smart

    • Figures out data types automatically

    • But accepts our help when needed

  2. Arrow is efficient

    • Keeps track of data without loading it

    • Ready to fetch exactly what we need

Homework Assignment 👉

  1. What is the average number of checkouts per year?
avg_yearly_checkouts <- seattle_csv %>%
  group_by(CheckoutYear) %>%
  summarise(avg_yearly_checkouts = mean(Checkouts, na.rm = TRUE)) %>%
  collect()
  1. What is the average number of checkouts for each material type in 2021?
avg_material_2021 <- seattle_csv %>%
  filter(CheckoutYear == 2021) %>%
  group_by(MaterialType) %>%
  summarise(avg_checkouts = mean(Checkouts, na.rm = TRUE)) %>%
  collect()

Write a brief analysis (150-300 words) answering these questions:

  • What trends do you notice in the yearly averages?
  • Which material types had the highest and lowest average checkouts in 2021?
  • What might explain these differences in average checkouts?

It looks like the yearly average checkouts increased in the early 2000’s before kind of leveling off and staying pretty consistent all throughout the years. It looks like the mixed material had the highest average checkouts in 2021. This could be because it includes multiple different kinds of materials so it’s not really just one. One of the materials with the least checkouts in 2021 was sound discs. This is probably because everything is digital now so there is not really a need for sound discs. Audio books are also one of the most checked out items. This is because audio books are easy to access online. You can check them out on the library website. Audio books have boosted in popularity since the early 2000’s so it makes sense for them to be popular in 2021. Also, the pandemic was still ongoing in 2021 so it made more sense to get something virtual from the library.