Click the Original, Code and Reconstruction tabs to read about the issues and how they were fixed.

Original


Source: Razavidinani (2019).


Objective

The original visualization was aimed at showing the return on assets (ROA) for Apple Inc. company. The audience are the potential and existing investors in the shares of the company.

The visualisation chosen had the following three main issues:

  • The figure lacked self explanatory title
  • The axes are not labeled
  • The data is incorrect.

Reference

Code

The following code was used to fix the issues identified in the original visualisation.

library(ggplot2)
Apple_ROA <- data.frame(Year = c("Sep-13", "Sep-14", "Sep-15",
                                 "Sep-16", "Sep-17", "Sep-18"),
                        ROA = c(19.30, 18.00, 20.50, 14.90, 13.90, 16.10))


ROA_plot <- ggplot(data = Apple_ROA, aes(group = 1, x = Year,y = ROA ))
ROA_plot <- ROA_plot + geom_line(stat = "identity", colour = "Green") + geom_point(colour = "red") + 
  geom_text(aes(label = paste(ROA,"%",sep="")), nudge_y = -2, nudge_x = .05) + 
  labs(
    title = "Apple Inc. Company Historical Return on Assets (ROA)",
    y = "ROA %") + theme_minimal() + scale_y_continuous(limits = c(0,30))

Data Reference

Reconstruction

The following plot fixes the main issues in the original.