Assessment declaration checklist

Please carefully read the statements below and check each box if you agree with the declaration. If you do not check all boxes, your assignment will not be marked. If you make a false declaration on any of these points, you may be investigated for academic misconduct. Students found to have breached academic integrity may receive official warnings and/or serious academic penalties. Please read more about academic integrity here. If you are unsure about any of these points or feel your assessment might breach academic integrity, please contact your course coordinator for support. It is important that you DO NOT submit any assessment until you can complete the declaration truthfully.

By checking the boxes below, I declare the following:

I understand that:

I agree and acknowledge that:

This is a template file. The following example included is not considered a good example to follow for Assignment 2. Remove this warning prior to submitting.

Deconstruct

Original

The original data visualisation selected for the assignment was as follows:


Source: ACMA Research and Analysis Section (2015).


Objective and Audience

The objective and audience of the original data visualisation chosen can be summarised as follows:

Objective

Audience

Improvements

The original data visualisation chosen could be improved in the three following ways:

  • Briefly explain the first improvement
  • Briefly explain the second improvement
  • Briefly explain the third improvement

Reconstruct

Code

The following code was used to improve 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))

Reconstruction

The following plot improves the original data visualisation in the three ways previously explained.

References

The reference to the original data visualisation choose, the data source(s) used for the reconstruction and any other sources used for this assignment are as follows: