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

Original


Source: Visualizing Coronavirus Economic Impact on Major Corporates.


Objective

  • The visualization provides the insights about the impact of the Coronavirus on Major Companies.However, it depicts the Net Income Loss of these company in the first quarter of 2020.

Targetted Audience

  • The Net Income Loss of the Corporations corresponds to Company’s performance in the business .Hence the target audience could be the major stakeholders of the company ,Chief Executive officer,future investors of the company .

The visualisation chosen had the following three main issues:

  • Ignoring Basic Visualization Conventions:

In the given visualization ,there is no X-axis neither Y-axis which makes really hard to gain insights from the data .The given visualization does not have standard scaling.

  • Partial Visualization of all data

The above visualization does not visualize the Net Income of the General Electric Corporation which had a Net Income of 4.1 billions USD in the first half of 2020 which goes against the basic standard of visualization to visualize all the data .

  • Income value quantity visualized as area of circle

The Net Income of each Corporation is visualized as the circle.It makes very difficult to compare the value of Net Income between the companies.

Reference

Visualizing Coronavirus Economic Impact on Major Corporates Visualizing Coronavirus Economic Impact on Major Corporates (2020). Available at: https://howmuch.net/articles/impact-covid19-major-corporations (Accessed: 20 September 2020).

Code

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

library(ggplot2)
library(dplyr)
library(readr)

#Importing the dataset
NetLoss <- read_csv("Netloss.csv")


#Creating new variable for the Net loss in billions 
NetLoss <- NetLoss %>% mutate(NetIncome =`Net Loss 1Semester ($M)`/1000)


p <- ggplot(data = NetLoss,aes(y=reorder(Company,NetIncome),x=round(NetIncome,1),fill=NetIncome))
p <- p +geom_bar(stat = "identity",color = "white")+
   theme(axis.text.x=element_text(angle=45,hjust=1))+
   labs(title = "The Impact of Covid-19 on major Corporations",
       subtitle = "Net Income(Loss) in the first Half of 2020",
       x = "Net Loss in 1st Semester(in billion $) ",
       y = "Company Names",
       fill = "Net Income in 1st Half of 2020(in billion $)"
  )+
   geom_text(aes(label=round(NetIncome,1)), hjust = 0.5,vjust=-0.5,size = 4)+
   theme(plot.title = element_text(size = 12,face = "bold"),
         plot.subtitle = element_text(size = 10, face = "italic"),
         axis.text=element_text(size=8, face = "bold"),
         axis.title=element_text(size=10,face="bold")
   )

Data Reference

Reconstruction

The following plot fixes the main issues in the original.