My Code
## reading in libraries
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)
library(distill)
## creating vector
x <- c(1,5,3,6,7,4,3,4,8,9,5,5,7,8,4,5,8,2,3,8,9,6,7,4,3,2,1,7,8,3,4,5,2,3,6,7,2)
names(x) <- c("value")
## creating table to observe frequency
x_tab <- table(x)
## plotting frequency of x
hist(x_tab)
