Click the Original, Code and Reconstruction tabs to read about the issues and how they were fixed.
Objective:
This visualisation shows the highest paying American companies in 2019. The main objective of this data visualisation is to observe and compare the highest-paying American companies by the median total salary ($USD) in the year 2019. Furthermore, this visualisation aims to provide the target audience with company insights of different pay scale in different companies and to help them make an informed decision when making their next career move.
Target Audience:
This data visualisation was based on a data source from Glassdoor, a website which is currently a leader in producing jobs and company insights (Glassdoor 2023). From this data source, we can confidently identify that the target audience for this visualisation are job seekers, employees and employers looking for insights of the highest paying companies in America.
Three main issues of this Visualisation:
Reference
Bresciani S and Eppler MJ (2008) ‘The Risks of Visualization’, Institute for Corporate Communication. accessed 20 April 2023. https://www.knowledge-communication.org/pdf/bresciani-eppler-risks-visualization-wpaper-08.pdf
Fung K (2014) Junk Charts Trifecta Checkup: The Definitive Guide, Junk Charts website, accessed 20 April 2023. https://junkcharts.typepad.com/junk_charts/junk-charts-trifecta-checkup-the-definitive-guide.html
Glassdoor (2023) About Us/Press, Glassdoor website, accessed 20 April 2023. https://www.glassdoor.com/about/
Martinčević I (2019) Charted: The Highest-Paying Companies in the U.S., HowMuch.net website, accessed 20 April 2023. https://howmuch.net/articles/highest-paying-american-companies-2019
The following code was used to fix the issues identified in the original.
library(ggplot2)
library(readr)
library(dplyr)
library(stringr)
company<-read_csv("C:/Users/ethan/OneDrive - RMIT University/Data Visualisation Assignment 2/Highest Paying Companies in the US 2019.csv")
head(company)
## # A tibble: 6 × 3
## Rank Employer `Median Total Salary ($)`
## <dbl> <chr> <dbl>
## 1 1 Palo Alto Networks 170929
## 2 2 NVIDIA 170068
## 3 3 Twitter 162852
## 4 4 Gilead Sciences 162210
## 5 5 Google 161254
## 6 6 VMware 158063
str(company)
## spc_tbl_ [25 × 3] (S3: spec_tbl_df/tbl_df/tbl/data.frame)
## $ Rank : num [1:25] 1 2 3 4 5 6 7 8 9 10 ...
## $ Employer : chr [1:25] "Palo Alto Networks" "NVIDIA" "Twitter" "Gilead Sciences" ...
## $ Median Total Salary ($): num [1:25] 170929 170068 162852 162210 161254 ...
## - attr(*, "spec")=
## .. cols(
## .. Rank = col_double(),
## .. Employer = col_character(),
## .. `Median Total Salary ($)` = col_number()
## .. )
## - attr(*, "problems")=<externalptr>
colnames(company)<-c("Rank","Name","Median")
company <- mutate(company, Values = ifelse(Median>=170000,T,F))
graph<-ggplot(data=company, aes(x=reorder(Name,Median),y=Median/1000,fill=Values)) + geom_bar(stat="identity") + scale_y_continuous(limits=c(0,200),breaks=c(0,15,30,45,60,75,90,105,120,135,150,165,180)) + coord_flip() + theme_minimal() + theme(legend.position = "right", plot.title=element_text(hjust=0),plot.caption=element_text(hjust=0),axis.title.y=element_text(vjust =3),axis.title.x=element_text(vjust=0)) + scale_fill_manual(values=c("TRUE"="chocolate","FALSE"="darkseagreen4"), labels=c("<$170,000",">$170,000")) + labs(title= str_wrap("Highest Paying Companies in the U.S. by Median Total Salary (2019)",60),x="Company Name",y="Median Total Salary in USD ('000)",caption="Source: https://www.glassdoor.com/research/jobs-companies-2019/") + geom_text(size=2.5,aes(label=round(Median/1000,digits=0),vjust=0.25,hjust=-0.1))
Data Reference
The following plot fixes the main issues in the original.