Objective
The objective of the original data visualization is to indicate an increase in the revenue generated by online advertisements over the years and also highlights the growth and decline of the percentage revenue earned through different advertisement sources. The target audience is the general public specifically those internet users who are unaware of the fact that they are unknowingly contributing to the growth of the revenue earned through online advertisements.
The three main issues identified in the visualization are as follows:
Reference
The following code was used to fix the issues identified in the original.
library(ggplot2)
library(readxl)
library(tidyr)
library(dplyr)
library(magrittr)
library(colourpicker)
ads <- read_excel("ads.xlsx",sheet="values")
ads1 <- ads %>% select(year,keyword_search,mobile,display_ads,digital_video,classifieds,lead_generation,rich_media,sponsorship,email,referral,others) %>% gather(key = "ads_type", value = "value", -year)
ads_names <- list(
'classifieds'="Classifieds",
'digital_video'="Digital Video",
'display_ads'="Display Ads",
'email'="Email",
'keyword_search'="Keyword Search",
'lead_generation'="Lead Generation",
'mobile'="Mobile",
'others'="Others",
'referral'="Referrals",
'rich_media'="Rich Media",
'sponsorship'="Sponsorship"
)
ads_labeller <- function(variable,value){
return(ads_names[value])
}
plot1 <- ggplot(ads, aes(x = year, y = Total)) + geom_line()+geom_point(size=1)+scale_y_continuous(limits = c(0,100))+labs(title="Rise in the online advertisement revenue ",subtitle = "(Total online advertising revenue generated over the years 2000-2014)",x="Year", y = "Total ads revenue (in billion dollars)")+theme_bw()
plot2 <- ggplot(ads1, aes(x = year, y = value)) + geom_line(color="#325B84",size=0.5)+geom_point(color="#325B84",size=0.2)+scale_y_continuous(limits = c(0,20))+
labs(title="Revenue generated using various methods over the years 2000-2014",x="Year", y = "Ads revenue (in billion dollars)",caption = "Source: The 21st Century War of Online Ads, 2020")+
facet_wrap(~ads_type,scale="free_y",labeller=ads_labeller)+theme_bw()
Data Reference
The following plots fixes the main issues in the original.