library(hrbrthemes)
## NOTE: Either Arial Narrow or Roboto Condensed fonts are required to use these themes.
##       Please use hrbrthemes::import_roboto_condensed() to install Roboto Condensed and
##       if Arial Narrow is not on your system, please see https://bit.ly/arialnarrow
dta <- read.csv("calls_nyc.csv", h=T)
head(dta)
##   Hour Calls
## 1  0.5  1080
## 2  1.5   910
## 3  2.5   770
## 4  3.5   780
## 5  4.5   380
## 6  5.5   390
tail(dta)
##    Hour Calls
## 19 18.5   860
## 20 19.5   750
## 21 20.5   900
## 22 21.5  1150
## 23 22.5  1100
## 24 23.5   830
str(dta)
## 'data.frame':    24 obs. of  2 variables:
##  $ Hour : num  0.5 1.5 2.5 3.5 4.5 5.5 6.5 7.5 8.5 9.5 ...
##  $ Calls: int  1080 910 770 780 380 390 200 300 275 395 ...
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(ggplot2)
dta1<-dta %>% 
  mutate(dtah = c(0:23))

knitr::kable(head(dta1, 5))
Hour Calls dtah
0.5 1080 0
1.5 910 1
2.5 770 2
3.5 780 3
4.5 380 4
rt <- data.frame(Hour=factor(dta1[,3]),
                 calls=(dta1[,2]))
ggplot(rt, aes(Hour, 
               calls, 
               group=1)) +
 geom_bar(width=1, 
          stat="identity", 
          fill="cyan", 
          col="gray", 
          alpha=0.2) +
 geom_abline(intercept=mean(dta1$Calls), 
             slope=0, 
             col="pink") +
 coord_polar(theta="x", 
             start=-pi/12) +
 theme_ipsum()
## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family not
## found in Windows font database

## Warning in grid.Call(C_stringMetric, as.graphicsAnnot(x$label)): font family not
## found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database

## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database

## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database

## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database
## Warning in grid.Call(C_textBounds, as.graphicsAnnot(x$label), x$x, x$y, : font
## family not found in Windows font database
## Warning in grid.Call.graphics(C_text, as.graphicsAnnot(x$label), x$x, x$y, :
## font family not found in Windows font database