As we can see in diagram, I have maximum Output numbers collected for count, i.e. steps taken.
As the diagram shows, I have maximum Output numbers for steps taken (count) during Noon time of the day.
As the graph illustates my ideal Exercise time(min) is Noon and Distance travelled (mi) is Evening.
The graph illustrates that I have maximum Heart Rate per minute captured on Saturday during Evening time and maximum number of steps taken on Thursday Noon.
The graph illustrates that 9/21/2017 Noon was the most active day of the month with maximum Output numbers.
---
title: "Story Board"
author: "AG"
date: "9 October 2017"
output:
flexdashboard::flex_dashboard:
storyboard: true
source: embed
---
```{r, include=FALSE}
library(flexdashboard)
library(ggplot2)
library(ggthemes)
```
```{r, include=FALSE}
filename <- "watch11.csv"
filepath <- ("C:/Users/PinakKumar/Desktop/watch11.csv")
file.exists(filepath)
```
### Question :1 - Which type of Calibration has the maximum Output numbers?
```{r}
data <- read.csv(filepath)
p <- ggplot(data, aes(Calibration, Output))
p + geom_boxplot()
```
***
As we can see in diagram, I have maximum Output numbers collected for count, i.e. steps taken.
### Question :2 - What time of the day I have maximum Output numbers?
```{r, echo=FALSE}
ggplot(data, aes(Calibration, Output, colour = Time_of_day)) +
geom_point() +
geom_smooth(se = FALSE, method = "lm")
```
***
As the diagram shows, I have maximum Output numbers for steps taken (count) during Noon time of the day.
### Question :3 - When is my ideal Exercise time and Distance Travelled time?
```{r, echo=FALSE}
p1 <- ggplot(data, aes(x = Output, y = Calibration))
p1 +
geom_point(aes(color = Time_of_day)) +
geom_smooth()
```
***
As the graph illustates my ideal Exercise time(min) is Noon and Distance travelled (mi) is Evening.
### Question: 4 - When was my maximum Health Rate was captured and maximum steps were taken?
```{r, echo=FALSE}
p1 +
geom_point(aes(color=Time_of_day, shape = Day))
```
***
The graph illustrates that I have maximum Heart Rate per minute captured on Saturday during Evening time and maximum number of steps taken on Thursday Noon.
### Question: 5 - What was the most active day of the month ?
```{r, echo=FALSE}
p2 <- ggplot(data,
aes(x = Dates,
y = Output)) +
theme(legend.position="top",
axis.text=element_text(size = 6))
(p3 <- p2 + geom_point(aes(color = Time_of_day),
alpha = 0.5,
size = 2.5,
position = position_jitter(width = 0.25, height = 0)))
```
***
The graph illustrates that 9/21/2017 Noon was the most active day of the month with maximum Output numbers.