Original


Source: https://www.visualcapitalist.com/how-much-does-big-tech-make-every-minute/


Objective

The objective of the this data visualization is to identify the revenue per minute of big tech companies known as FAATMAN (Facebook, Amazon, Apple, Tesla, Microsoft, Alphabet(Google), and Netflix). Target audience for this data visualization is for financial analysts and similar groups.

The visualization chosen had the following three main issues:

• Fonts are not uniform – They have used logos of the companies instead of standard text. And some fonts are too small. Also, they have used the name “Alphabet” for Google, which is less known
• Must look around the image to find information. Figures are all around the image. Although it has device compatibility, it is too big to fit in a standard screen resolution of 1920*1080. So, must scroll up and down to view information on their web page.
• Though colours are represents official colours of the companies, Redish colours have been used 3 times.

Reference

Code

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

library(readr)
library(RColorBrewer)
library(ggplot2)
library(tidyr)
library(scales)

setwd("C:/MAP/RMIT/Semester 2/MATH2270DVC/Assignment 2")
FAATMAN <- read_csv("FAATMAN.csv")
df <- data.frame(FAATMAN)
RevPerMin <- FAATMAN$`Revenue Per Minute`

p1 <- ggplot(df,aes(x= reorder(Company, -RevPerMin), y=RevPerMin, fill=Company)) +
      labs(title = "How Much Does Big Tech Make Every Minute?") +
      scale_y_continuous(labels = comma)+
      geom_hline(yintercept = mean(RevPerMin), color="blue")+
      xlab("Company") +
      ylab("Revenue per minute") +
      geom_bar(stat="identity", color='black') +
      annotate(geom="text", fontface=2,  x=6, y=500000, label="Average $416,768 of",color="black")+
      annotate(geom="text", fontface=2, x=6, y=450000, label="revenue each minute",color="black")+
      geom_text(aes(label=RevPerMin), vjust=-0.5, size=4.0)+
      scale_fill_manual (values=c("orange", "white", "royalblue1", "limegreen", "grey53", "black","firebrick3")) +
      theme(axis.text.x=element_text(angle=45, hjust=1))

Data Reference

Reconstruction

The following plot fixes the main issues in the original.

source: https://www.visualcapitalist.com/how-much-does-big-tech-make-every-minute/