library(ggplot2)
## Warning: package 'ggplot2' was built under R version 3.4.4
library(ggthemes)
## Warning: package 'ggthemes' was built under R version 3.4.4
library(plotly)
##
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
##
## last_plot
## The following object is masked from 'package:stats':
##
## filter
## The following object is masked from 'package:graphics':
##
## layout
library(scales)
Lab 1 - HU Analytic Program Survey
survey = read.csv('/Users/xiaoxiyang/Downloads/Hu Analyst Program Survey.csv')
survey$Background <- factor(survey$Background,
levels = c('Strongly Disagree', 'Disagree', 'Neutral', 'Agree', 'Strongly Agree'),
ordered = T)
survey$FullfilNeeds <- factor(survey$FullfilNeeds,
levels = c('Strongly Disagree', 'Disagree', 'Neutral', 'Agree', 'Strongly Agree'),
ordered = T)
survey$CareerGoals <- factor(survey$CareerGoals,
levels = c('Strongly Disagree', 'Disagree', 'Neutral', 'Agree', 'Strongly Agree'),
ordered = T)
survey$Better <- factor(survey$Better,
levels = c('Strongly Disagree', 'Disagree', 'Neutral', 'Agree', 'Strongly Agree'),
ordered = T)
survey$Recommend <- factor(survey$Recommend,
levels = c('Strongly Disagree', 'Disagree', 'Neutral', 'Agree', 'Strongly Agree'),
ordered = T)
survey$Overall <- factor(survey$Overall,
levels = c("Strongly Disagree", "Disagree", "Neutral", "Agree", "Strongly Agree"),
ordered = T)
survey$SurveyEvaluation <- factor(survey$SurveyEvaluation,
levels = c('Very Bad', 'Bad', 'Neutral', 'Good', 'Very Good'),
ordered = T)
Figure 1: Overall Satisfaction Level of HU Analytic Program
Plot_Overall <- ggplot(survey, aes(Overall, ..count..)) +
geom_bar(alpha = 0.3,color="dark green", fill="dark green" ) +
xlab("Satistication Level") +
ylab(" ") +
ggtitle('Degree of Satisfaction with HU Analytic Program') +
theme(plot.title = element_text(hjust = 1)) +
scale_y_continuous(limits = c(0,15), expand = c(0, 0), breaks= pretty_breaks())
ggplotly(Plot_Overall)
Figure 2: If students have relavent background?
Plot_Background <- ggplot(survey, aes(Background, ..count..)) +
geom_bar(alpha = 0.3,color="dark green", fill="dark green" ) +
xlab("Satistication Level") +
ylab(" ") +
ggtitle('Students with Relevant Background') +
theme(plot.title = element_text(hjust = 1)) +
scale_y_continuous(limits = c(0,15), expand = c(0, 0), breaks= pretty_breaks())
ggplotly(Plot_Background)
Figure 3: Students believe this program address needs.
Plot_Need <- ggplot(survey, aes(FullfilNeeds, ..count..)) +
geom_bar(alpha = 0.3,color="dark green", fill="dark green" ) +
xlab("Satistication Level") +
ylab(" ") +
ggtitle('Students believe this program address needs') +
theme(plot.title = element_text(hjust = 1)) +
scale_y_continuous(limits = c(0,15), expand = c(0, 0), breaks= pretty_breaks())
ggplotly(Plot_Need)
Figure 4: The program helps survee achieve career goals.
Plot_Career <- ggplot(survey, aes(Background, ..count..)) +
geom_bar(alpha = 0.3,color="dark green", fill="dark green" ) +
xlab("Satistication Level") +
ylab(" ") +
ggtitle('The Program Helps Students with Career Goals') +
theme(plot.title = element_text(hjust = 1)) +
scale_y_continuous(limits = c(0,15), expand = c(0, 0), breaks= pretty_breaks())
ggplotly(Plot_Career)
Figure 5: HU analyst program is better than others
Plot_Better <- ggplot(survey, aes(Better, ..count..)) +
geom_bar(alpha = 0.3,color="dark green", fill="dark green" ) +
xlab("Satistication Level") +
ylab(" ") +
ggtitle('HU Analytic Program is Better than Others') +
theme(plot.title = element_text(hjust = 1)) +
scale_y_continuous(limits = c(0,15), expand = c(0, 0), breaks= pretty_breaks())
ggplotly(Plot_Better)
Figure 6: Recommend this Analyst program to others
Plot_recommend <- ggplot(survey, aes(Recommend, ..count..)) +
geom_bar(alpha = 0.3,color="dark green", fill="dark green" ) +
xlab("Satistication Level") +
ylab(" ") +
ggtitle('Recomment This Program to Others') +
theme(plot.title = element_text(hjust = 1)) +
scale_y_continuous(limits = c(0,15), expand = c(0, 0), breaks= pretty_breaks())
ggplotly(Plot_recommend)
Figure 7: Survey Evaluation
Plot_Evaluation <- ggplot(survey, aes(SurveyEvaluation, ..count..)) +
geom_bar(alpha = 0.3,color="dark green", fill="dark green" ) +
xlab("Satistication Level") +
ylab(" ") +
ggtitle('Survey Evaluation') +
theme(plot.title = element_text(hjust = 1)) +
scale_y_continuous(limits = c(0,15), expand = c(0, 0), breaks= pretty_breaks())
ggplotly(Plot_Evaluation)