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

Original


Source: Column Five Hunger Pains


Objective

The Objective of this visual is to differentiate the 3 type of economies in the world.
a. Developing Nations
b. Emerging Markets
c. Well-off Countries

These countries are distinguished based on their GDP per capita for year 2012.
It also distinctly exlains the proportion of population in these countries who are sleeping hungry or have no food on table

The visualisation chosen had the following three main issues:

  • GDP per capita denotion
    In the provided graph, GDP per capita is denoted by a hotdog icon which is not describing the GDP of respected country efficiently. It is a major factor to diversify the economy of the country. The Size of icon is barely making differnce between the catogaries of GDP defined ($0-$450000).

  • Comparison Model
    The Comparison model used to distinguish the corelation of GDP vs economy type vs Hungry pains of different country is not clear. Drawing insights about the comparison is quiet cumbersome ,it’s is not communicating the data efficiency and spectator may not be able to understand the data and conclude on the data.

  • Color representation
    The effenciency of any data model comes with respresentation. The data visulaistaion of the graph is not easy to formulate as the color coding that has been adapted in the graph is not quiet distinctive whihc makes it hard to anlyse and conclude about the data moreover the color scheme which has been used is very dull and placid.

Reference

Code

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

library(ggplot2)
library(tidyr)
library(readr)
library(colorspace)
graph1 <- read_csv("/Users/gabbar/DC.csv")
head(graph1)
## # A tibble: 6 x 3
##   Country         GDP Hungry
##   <chr>         <dbl>  <dbl>
## 1 United States 49922     24
## 2 Great Britain 36941     15
## 3 Australia     42640     12
## 4 Italy         42734     10
## 5 Canada        42734      9
## 6 Germany       39028      8
p=ggplot(data = graph1,aes(x=Country,y=GDP,fill=Hungry  ))
p1=p+geom_bar(stat = "identity", width =0.6,color="black",size=0.5) +scale_fill_continuous("Hungry") + theme_minimal() +theme(axis.text.x = element_text(angle = 45,hjust = 0.8)) + labs(x = "Country" , y = "GDP(in dollars)", title = "Hungry propotion for developed countries", caption = "2012 data") 

Data Reference

Reconstruction

The following plot fixes the main issues in the original.