Overview

This summarizes the voter machine usage by all municipalities in Massachusetts as of January 31, 2019.
The data is downloaded on January 31, 2019 from Verified Voting (https://thevotingnews.com/verifier/#year/2018/state/25) which obtained its data on October 2018. Scroll to bottom for final table.

Process

I downloaded data by searching MA -> Optical Scan (all machines in state are optical scan) and MA -> Hand Counted Paper Ballots. I manually deleted top row and saved these files into VoterChoiceMA > Policy & Research > Machines & Implementation > Voting Machine Data in MA (Jan 31, 2019) Google Drive Folder.

# Import data from optical scan machines and hand counting municipalities
machines <- read.csv("C:/Users/wjackson/Dropbox/Voter Choice MA/Costs & Implementation/Voting Machine Use In MA/MA_all_optical_scans_1-31-2019.csv")

handcount <- read.csv("C:/Users/wjackson/Dropbox/Voter Choice MA/Costs & Implementation/Voting Machine Use In MA/MA_Handcount_usage_1-31-2019.csv")

Some tidying and combining below. Beverly initially had a model listed which is not an approved machine model in MA. I called their clerk’s office who informed me they use ImageCast Precinct, purchased in 2017.

# Set Model from "Not Applicable" to "Hand Count"
handcount$Model <- "Hand Count"

# Manually edit Beverly's to correct machine
machines[machines$Division == "Beverly",]$Model <- "ImageCast Precinct"

# Combine into single dataframe
MA <- rbind(machines, handcount)

Results

# Load tidyverse library
library(tidyverse)

# Get summary statistics
machine_stats <- MA %>%
  group_by(Model) %>%
  summarise(Municipalities = n(), precincts = sum(Precincts), reg_voters = sum(Total.Registration))

# Print stats
data.frame(machine_stats)
##                Model Municipalities precincts reg_voters
## 1        AccuVote OS            205      1458    3178259
## 2              DS200             28       248     497504
## 3 ImageCast Precinct             37       236     517523
## 4  Optech IIIP-Eagle             13       156     292465
## 5         Hand Count             68        76      89216

Sum of municipalities (351) and registered voters (4,574,967) checks out as accurate.

sum(machine_stats$Municipalities)
## [1] 351
sum(machine_stats$precincts)
## [1] 2174
sum(machine_stats$reg_voters)
## [1] 4574967