This is a template file. The example included is not considered a good example to follow for Assignment 2. Remove this warning prior to submitting.
Click the Original, Code and Reconstruction tabs to read about the issues and how they were fixed.
Objective
Explain the objective of the original data visualisation and the targetted audience.
The visualisation chosen had the following three main issues:
Reference
The following code was used to fix the issues identified in the original.
library(ggplot2)
smartphone <- data.frame(Year = c("Dec-10", "Dec-11",
"Dec-12", "Dec-13", "Dec-14"),
Count = c(2247, 2818, 3379, 4476,5218),
Perc = c(13, 16, 19, 25,29))
p1 <- ggplot(data = smartphone, aes(group = 1, x = Year,y = Perc))
p1 <- p1 + geom_line(stat = "identity", colour = "turquoise3") + geom_point(colour = "turquoise3") +
geom_text(aes(label = paste(Perc,"%",sep="")),nudge_y = -2, nudge_x = .05) +
labs(
title = "Australian Mobile-only Phone Users % of Population",
y = "Population %") + theme_minimal() + scale_y_continuous(limits = c(0,30))
Data Reference
The following plot fixes the main issues in the original.