This assignment makes use of data from a personal activity monitoring device. This device collects data at 5 minute intervals through out the day. The data consists of two months of data from an anonymous individual collected during the months of October and November, 2012 and include the number of steps taken in 5 minute intervals each day
The data for this assignment can be downloaded from the [course web site] (https://d396qusza40orc.cloudfront.net/repdata%2Fdata%2Factivity.zip)
The variables included in this dataset are:
1. steps: Number of steps taking in a 5-minute interval (missing values are coded as NA)
2. date: The date on which the measurement was taken in YYYY-MM-DD format
3. interval: Identifier for the 5-minute interval in which measurement was taken
The dataset is stored in a comma-separated-value (CSV) file and there are a total of 17,568 observations in this dataset.
Loading the dataset and the libraries used in the analysis. We also generate a new variable ndate as a date format for date variable
#load libraries
library(ggplot2)
library(lattice)
library(data.table)
library(plyr)
#load the data set
if (!file.exists("data")) {
dir.create("data")
}
if (!file.exists("data/activity.csv")){
fileUrl <- "https://d396qusza40orc.cloudfront.net/repdata%2Fdata%2Factivity.zip"
download.file(fileUrl, destfile = "data/activity.zip")
unzip("data/repdata-data-activity.zip")
}else {message("file is already unzipped")}
## file is already unzipped
activity <- read.csv("data/activity.csv" ,header = TRUE, na.string = "NA")
activity$ndate <- as.Date(activity$date, "%Y-%m-%d")
For this part of the analysis we ignore the missing values to plot a histogram of the total number of steps taken each day. We also calculate the mean of steps and the median. The key function used is aggregate to make the summaries
sumData <- aggregate(steps ~ ndate, activity, sum)
#mean of steps
stepsMean<-as.integer(mean(sumData$steps,na.rm = T))
#median steps
stepsMedian<-as.integer(median(sumData$steps))
The mean number of steps taken was: 10766
The median number of steps taken was: 10765
A histogram of the total number of steps taken each day is shown below and is also saved in the figures folder:
g <- ggplot(sumData, aes(x=steps)) + geom_histogram(binwidth = 1000)
print(g)
To make the daily activity pattern we plot a time series plot of type = “l”of the 5-minute interval (x-axis) and the average number of steps taken, averaged across all days (y-axis)
stepsInterval<-aggregate(steps~interval,activity, FUN=mean)
#Which 5-minute interval, on average across all the days in the dataset, contains the maximum number of steps?
intervalMax<-stepsInterval$interval[stepsInterval$steps==max(stepsInterval$steps)]
The 5-minute interval, on average across all the days in the dataset, that contains the maximum number of steps is 835
The time series plot to show the daily activity pattern is:
plot(stepsInterval$interval,stepsInterval$steps,type='l',
main='Average daily activity pattern',xlab='Interval in 5 min',
ylab='Average number of steps',bty="n")
There are a number of days/intervals where there are missing values (coded as NA).The presence of missing days may introduce bias into some calculations or summaries of the data. We decided to impute our missing values using the mean of the column. We calculate the mean() of steps and replace the missing values with it. Note: we generate a new dataset **activityImputed to contain the imputed values
numberNA2<-length(activity[!complete.cases(activity),1])
activityImputed <- activity
activityImputed$steps[is.na(activityImputed$steps)] <- mean(activityImputed$steps, na.rm = TRUE)
sumImputedData <- aggregate(steps ~ ndate, activityImputed, sum)
stepsImputedMean<-as.integer(mean(sumImputedData$steps))
stepsImputtedMedian<-as.integer(median(sumImputedData$steps))
The number of rows with missing values in the dataset are 2304.
The plot below shows the total number of daily steps with the imputed values included. The mean steps with the imputed data was 10766 which is higher than the mean without the imputed values 10766. The median was the same for both the imputed data and the non imputed data 10766
ggplot(sumImputedData, aes(x=steps)) + geom_histogram(binwidth = 1000)
Here we create a factor variable to identify weekends and weekdays.
activityImputed$dayOfWeek <-weekdays(activityImputed$ndate)
activityImputed$timeOfWeek <- "weekDay"
activityImputed$timeOfWeek[activityImputed$dayOfWeek=="Sunday" | activityImputed$dayOfWeek=="Saturday" ] <- "weekEnd"
table(activityImputed$timeOfWeek)
##
## weekDay weekEnd
## 12960 4608
stepsImputedInterval<-aggregate(steps~interval + timeOfWeek ,activityImputed, FUN=mean)
To show the differences, we make a panel plot containing a time series plot of the 5-minute interval (x-axis) and the average number of steps taken, averaged across all weekday days or weekend days (y-axis).
xyplot(steps~interval|timeOfWeek,stepsImputedInterval,type="l",layout=c(1,2), ylab = "Number Steps", xlab="Interval")