New York City Taxi & Limousine Commission (TLC) Trip Data Analysis Using Sparklyr and Google BigQuery

[This article was first published on Mirai Solutions, and kindly contributed to R-bloggers]. (You can report issue about the content on this page here)
Want to share your content on R-bloggers? click here if you have a blog, or here if you don't.

This post shows how to use Apache Spark and Google BigQuery in R via sparklyr to efficiently analyze a big dataset (NYC yellow taxi trips).

You can find the R Markdown document used to generate this post here.

Introduction

On August 3, 2015 the New York City Taxi & Limousine Commission (TLC), in partnership with the New York City Department of Information Technology and Telecommunications (DOITT), announced the availability of millions of trip records from both Yellow Medallion and Green (Street Hail Livery) Cabs. The data can be downloaded from the NYC TLC or through the NYC OpenData website. In addition, the data is available on Google BigQuery in the form of public datasets.

In this post, we show how to use Apache Spark and Google BigQuery in R via sparklyr to efficiently analyze big datasets. Specifically, we are going to analyze tip amounts paid in taxi trips.

The NYC TLC data is ~150GB and consists of 1.2 billion records. It contains pick-up/drop-off date/times and locations, number of passengers, tips and fare amounts, etc. of yellow cab trips between 2009 and 2016.

Package Dependencies

We are using the pacman R package management tool to install and load the package dependencies. Please note that sparklyr version 0.7.0+ (available on GitHub, but not yet released on CRAN) is needed.

if(!require(pacman)) {
  install.packages("pacman")
  library(pacman)
}

# From GitHub
p_load_gh(
  "rstudio/sparklyr@master", # version 0.7.0+ is required
  "miraisolutions/sparkbq@develop",
  "miraisolutions/sparkgeo@develop"
)

# From CRAN
p_load(
  "dplyr",
  "dbplyr",
  "geojsonio",
  "leaflet",
  "knitr",
  "kableExtra",
  "tictoc"
)

Here is a list of all the dependencies, together with a short description:

Connect to Apache Spark

Before connecting to Apache Spark using sparklyr, we need to tune some Spark configuration properties to allocate the right amount of resources in the cluster and avoid runtime failures:

  • spark.executor.instances: Number of executors to start. An executor is a process launched on a worker node, that runs tasks and keeps data in memory or on disk.
  • spark.executor.cores: Number of cores to use on each executor.
  • spark.executor.memory: Amount of memory to use per executor process.
  • spark.sql.shuffle.partitions: Number of partitions to use when shuffling data for joins or aggregations.
  • spark.network.timeout: Default timeout for all network interactions.
  • spark.hadoop.fs.gs.project.id: Project ID used in GCP. Used to bill for the usage of GCP resources.
  • spark.hadoop.fs.gs.impl: A GCS setting defining the file system in the Spark configuration.
  • spark.hadoop.fs.AbstractFileSystem.gs.impl: A GCS setting defining the abstract file system in the Spark configuration.

Furthermore, we also register sparkgeo that will be leveraged later to perform geospatial joins.

# Spark configuration settings
config <- spark_config()

# Apply Spark configuration settings from R markdown document parameters
spark_param_names <- grep("spark.", names(params),
                          fixed = TRUE, value = TRUE)
print(params[spark_param_names])
## $spark.executor.instances
## [1] 4
## 
## $spark.executor.cores
## [1] 8
## 
## $spark.executor.memory
## [1] "34g"
## 
## $spark.sql.shuffle.partitions
## [1] 1600
## 
## $spark.network.timeout
## [1] 900
## 
## $spark.yarn.executor.memoryOverhead
## [1] 5000
## 
## $spark.hadoop.fs.gs.impl
## [1] "com.google.cloud.hadoop.fs.gcs.GoogleHadoopFileSystem"
## 
## $spark.hadoop.fs.AbstractFileSystem.gs.impl
## [1] "com.google.cloud.hadoop.fs.gcs.GoogleHadoopFS"
config[spark_param_names] <- params[spark_param_names]

# Set Google Cloud Storage (GCS) settings. This allows us to read
# files from 'gs://' URLs.
# The Google Cloud Storage connector comes with sparkbq.
config[["spark.hadoop.fs.gs.project.id"]] <- 
  params$bigquery_billing_project_id

# Check if Google Cloud Platform service credentials have been specified
# (in the form of a JSON keyfile) - settings needed when running locally
# See https://developers.google.com/identity/protocols/application-default-credentials
if(!is.null(params$gcp_json_keyfile)) {
  Sys.setenv("GOOGLE_APPLICATION_CREDENTIALS" = params$gcp_json_keyfile)
  config[["spark.hadoop.google.cloud.auth.service.account.json.keyfile"]] <- 
    params$gcp_json_keyfile
}

# Connect to Apache Spark
sc <- spark_connect(master = params$spark_master,
                    config = config,
                    app_name = "NYC TLC")
## Re-using existing Spark connection to yarn-client

# Register sparkgeo's user-defined functions (UDFs)
sparkgeo_register(sc)

Google BigQuery Settings

Next, we are going to set the Google Cloud Platform project ID to use for billing purposes. 1 We also set the Google Cloud Storage (GCS) bucket used to store temporary BigQuery files and the default BigQuery dataset location.

bigquery_defaults(
  billingProjectId = params$bigquery_billing_project_id,
  gcsBucket = params$bigquery_gcs_bucket,
  datasetLocation = params$bigquery_dataset_location
)

Import New York City Neighborhoods

In the NYC TLC trips dataset we only have pickup and dropoff locations in terms of latitude and longitude. To compute statistics by neighborhood we will need to map these locations to New York City neighborhoods. For this, we are going to leverage NYC neighborhood polygon information in the form of a GeoJSON file. We are using sparkgeo::spark_read_geojson to read the data straight into Spark and extract any relevant metadata.

neighborhoods <-
  spark_read_geojson(
    sc = sc,
    name = "neighborhoods",
    path = "gs://miraisolutions/public/sparkgeo/nyc_neighborhoods.geojson"
  ) %>%
  mutate(neighborhood = metadata_string(metadata, "neighborhood")) %>%
  select(neighborhood, polygon, index) %>%
  sdf_persist()

There are 310 neighborhoods.

sdf_persist counteracts the default lazy behaviour of Spark DataFrames. It forces any pending computation and (optionally) serializes the results to disk and/or memory.

Import NYC TLC trip data from Google BigQuery

We are using sparkbq::spark_read_bigquery to import the publicly available Google BigQuery NYC Taxi & Limousine trip dataset. Trip data is available in several tables (one for each year).

all_trips_spark_by_year <-
  lapply(2009:2016, function(year) {
    spark_read_bigquery(
      sc = sc,
      name = paste0("trips", year),
      projectId = "bigquery-public-data",
      datasetId = "new_york",
      tableId = paste0("tlc_yellow_trips_", year),
      repartition = 400
    )
  })

# Union of all trip data
all_trips_spark <- Reduce(union_all, all_trips_spark_by_year)

Note: At this point no data (except for schema information) has been read yet. These operations are lazy.

Due to lack of information on tips paid by cash, we filter the dataset for trips paid by credit card. In addition, we filter out some bad data points such as negative tip & fare amounts and negative trip distances. We also perform a geospatial join to map pickup locations to the corresponding NYC neighborhood and calculate some additional metrics such as trip duration and tip percentage.

credit_trips_spark <-
  all_trips_spark %>%
  filter(
    # Trips paid by credit card
    payment_type %in% c("CREDIT", "CRD", "1") &
    # Filter out bad data points
    fare_amount > 1 &
    tip_amount >= 0 &
    trip_distance > 0 &
    passenger_count > 0
  ) %>%
  # Select relevant columns only to reduce amount of data
  select(
    vendor_id,
    pickup_datetime,
    dropoff_datetime,
    pickup_latitude,
    pickup_longitude,
    trip_distance,
    passenger_count,
    fare_amount,
    tip_amount
  ) %>%
  # Join with NYC neighborhoods
  sparkgeo::sdf_spatial_join(neighborhoods, pickup_latitude,
                             pickup_longitude) %>%
  # NOTE: timestamps are currently returned as microseconds since the epoch
  mutate(
    trip_duration = (dropoff_datetime - pickup_datetime) / 1e6,
    pickup_datetime = from_unixtime(pickup_datetime / 1e6)
  ) %>%
  mutate(
    # Split pickup date/time into separate metrics
    pickup_month = month(pickup_datetime),
    pickup_weekday = date_format(pickup_datetime, 'EEEE'),
    pickup_hour = hour(pickup_datetime),
    # Calculate tip percentage based on fare amount
    tip_pct = tip_amount / fare_amount * 100
  ) %>%
  select(
    vendor_id,
    pickup_month,
    pickup_weekday,
    pickup_hour,
    neighborhood,
    trip_duration,
    trip_distance,
    passenger_count,
    fare_amount,
    tip_pct
  ) %>%
  # Persist results to memory and/or disk
  sdf_persist()

There are 507’139’792 records in credit_trips_spark.

The above example also showcases the predicate pushdown feature of sparkbq: the first filter() and select() operations are pushed down to BigQuery and are executed at data source level. This can improve query performance by reducing the amount of data read from the data source.

Average Tip Percentage by Pickup Neighborhood

Here we calculate the average tip percentage by pickup neighborhood for visualization in a following section. Note that the following dplyr pipeline is lazy: no computations will be triggered until we execute an appropriate action.

avg_tip_per_neighborhood_spark <-
  credit_trips_spark %>%
  group_by(neighborhood) %>%
  summarize(avg_tip_pct = mean(tip_pct)) %>%
  arrange(desc(avg_tip_pct))

The following Spark SQL code gets generated by sparklyr/dbplyr for the object avg_tip_per_neighborhood_spark:

SELECT *
FROM (SELECT `neighborhood`, AVG(`tip_pct`) AS `avg_tip_pct`
FROM `sparklyr_tmp_41bf4beea2bd`
GROUP BY `neighborhood`) `zpdkqkniln`
ORDER BY `avg_tip_pct` DESC

This SQL query will be executed by Spark when we run the collect action in the next section.

Collect and Import to R

avg_tip_per_neighborhood <- avg_tip_per_neighborhood_spark %>% collect()

head(avg_tip_per_neighborhood, n = 10) %>%
  kable("html") %>%
  kable_styling(bootstrap_options = "striped", full_width = FALSE)
neighborhood avg_tip_pct
Edgemere 50.60120
Breezy Point 42.17196
Far Rockaway 40.80644
Great Kills Park 39.45321
Oakwood 36.26592
Bloomfield 33.54538
Graniteville 32.20948
Woodrow 31.92127
Rockaway Beach 30.93325
Charleston 30.01376

collect executes the Spark query and returns the results to R.

Leaflet Visualization

In this section we are going to visualize the average tip percentages using RStudio’s leaflet package. The geojsonio package can read GeoJSON files and produces a SpatialPolygonsDataFrame that can be directly plotted by leaflet on a map.

# Build SpatialPolygonsDataFrame from NYC neighborhood geojson file
nyc_neighborhoods <-
  geojsonio::geojson_read(
    "https://storage.googleapis.com/miraisolutions/public/sparkgeo/nyc_neighborhoods.geojson",
    what = "sp"
  )

# Merge average tip percentages with neighborhood metadata
average_tip_with_shapes <- nyc_neighborhoods
average_tip_with_shapes@data <-
  merge(
    nyc_neighborhoods@data,
    avg_tip_per_neighborhood,
    all.x = TRUE
  )

# Create continuous color palette based on average tip percentages
pal <-
  colorNumeric(
    c("#FF0000", "#FFFF00", "#00FF00"),
    average_tip_with_shapes$avg_tip_pct
  )

# Draw leaflet containing
# - black & white OpenStreetMap map
# - NYC neighborhoods drawn as polygons and colored according to the
#   corresponding tip percentage
# - legend for tip percentages
average_tip_with_shapes %>%
  leaflet() %>%
  addProviderTiles(
    providers$OpenStreetMap.BlackAndWhite
  ) %>%
  addPolygons(
    weight = 1,
    opacity = 0.7,
    smoothFactor = 0.3,
    fillOpacity = 0.7,
    fillColor = ~ pal(avg_tip_pct),
    label = ~ paste0(neighborhood, " - ", round(avg_tip_pct, 2), "%"),
    highlightOptions = highlightOptions(
      color = "yellow",
      weight = 2,
      bringToFront = TRUE
    )
  ) %>%
  addLegend(
    pal = pal,
    values = ~ avg_tip_pct,
    opacity = 1,
    title = "Tips %",
    labFormat = labelFormat(suffix = ' %')
  )

plot of chunk nyc_tlc_leaflet

Machine Learning with sparklyr

sparklyr provides bindings to Spark’s distributed machine learning library MLlib.

In the following we build a model to predict whether a taxi driver can expect generous tips based on provider, pickup date/time, neighborhood, trip duration & distance, passenger count and fare amount. We define a Spark ML pipeline to compute a random forest classifier. Tip levels are defined as follows:

  • < 25%: standard
  • >= 25%: generous

See Tipping in New York City: a guide to who, when and how much for more information on NYC tipping. Also note the difference in how providers handle suggested tips.

# Prepare training and test datasets
ml_dataset <-
  credit_trips_spark %>%
  sdf_partition(train = 0.8, test = 0.2, seed = 2510)

# Create machine learning pipeline
tip_level_pipeline <-
  ml_pipeline(sc, uid = "tip_level") %>%
  # Bucketize tip percentages into levels
  ft_bucketizer(
    input_col = "tip_pct",
    output_col = "tip_level",
    splits = c(0, 25, Inf),
    handle_invalid = "skip"
  ) %>%
  ft_r_formula(formula = tip_level ~ vendor_id + pickup_month +
                 pickup_weekday + pickup_hour + neighborhood +
                 trip_duration + trip_distance + passenger_count +
                 fare_amount) %>%
  ml_random_forest_classifier(num_trees = 50)

# Fit model
tip_level_model <- ml_fit(tip_level_pipeline, dataset = ml_dataset$train)

# Perform prediction
tip_level_prediction <- 
  ml_predict(tip_level_model, dataset = ml_dataset$test, 
             predicted_label_col = "prediction")

# Evaluate model by calculating F1 score
ml_classification_eval(tip_level_prediction, prediction_col = "prediction",
                       metric_name = "f1")
## [1] 0.6900397

Disconnect from Apache Spark

spark_disconnect(sc)

Timings

Description Execution time (minutes)
Data preparation 40.6
Machine Learning 85.4
Complete Spark session 126.1


Appendix


Provisioning a Google Dataproc Cluster

This section explains how to provision a Google Dataproc cluster for the execution of the TLC Trip Data analyses shown above.

Install Google Cloud SDK

  • Register to https://cloud.google.com/ and create a new project (e.g. “my-project”).
  • Install the Google Cloud SDK by following the instructions at https://cloud.google.com/sdk/docs/quickstart-linux
  • If you already have gcloud installed, you may want to update your components using gcloud components update.

Log In

  • Log in to Google Cloud: gcloud auth login
  • Set default gcloud project: gcloud config set project my-project

Provision Dataproc Cluster

A Dataproc cluster can easily be provisioned on the command line as follows:

gcloud dataproc clusters create spark --async --image-version 1.2 \
 --master-machine-type n1-standard-1 --master-boot-disk-size 20 \
 --worker-machine-type n1-highmem-8 --num-workers 4 \
 --worker-boot-disk-size 10 --num-worker-local-ssds 1

The command above will launch a Google Cloud Dataproc cluster named spark. The master node will be called spark-m and the worker nodes spark-w-0, spark-w-1, etc.

Dataproc Cluster Parameters

  • --async: display information about the operation in progress, without waiting for the operation to complete.
  • --image-version: version of the bundle including operating system, Big Data components and Google Cloud Platform connectors. See https://cloud.google.com/dataproc/docs/concepts/versioning/dataproc-versions
  • --master-machine-type: the type of machine to use for the master. See https://cloud.google.com/compute/docs/machine-types
  • --master-boot-disk-size: the size of the boot disk for the master node.
  • --worker-machine-type: the type of machine to use for workers. See https://cloud.google.com/compute/docs/machine-types
  • --num-workers: the number of worker nodes in the cluster
  • --worker-boot-disk-size: the size of the boot disk for worker nodes
  • --num-worker-local-ssds: the number of local SSDs to attach to each worker

See https://cloud.google.com/sdk/gcloud/reference/dataproc/clusters/create for a complete list of all the configuration parameters.

Google Cloud Machine Types

  • n1-standard-1: Standard machine type with 1 virtual CPU and 3.75 GB of memory.
  • n1-highmem-8: High memory machine type with 8 virtual CPUs and 52 GB of memory.

See https://cloud.google.com/compute/docs/machine-types for a complete list of all the standard Google Cloud machine types.

  1. Note that BigQuery is priced based on a flat rate for storage and a usage rate for queries. 

To leave a comment for the author, please follow the link and comment on their blog: Mirai Solutions.

R-bloggers.com offers daily e-mail updates about R news and tutorials about learning R and many other topics. Click here if you're looking to post or find an R/data-science job.
Want to share your content on R-bloggers? click here if you have a blog, or here if you don't.

Never miss an update!
Subscribe to R-bloggers to receive
e-mails with the latest R posts.
(You will not see this message again.)

Click here to close (This popup will not appear again)