Type and amount of the leading causes of death worldwide

An application that facilitates the analysis of data on causes of deaths in the comparison between countries

Domingos Savio Apolonio Santos, 04/18/2015

Overview

The app use a subset of the data from the World Health Organization (WHO) with the following features:

  • The app allows the user to select cause of death and countries for analysis.
  • The panel shows a line chart, a blox plot, and the table with the subset of data.

Inputs

  • The user can select one or more countries and one cause of deaths from a list:
  • The app creates a subset of data with the parameters selected:
temp =  subset(morticd10, Country == input$country  & Cause == input$cause)

Outputs

After the user selects the countries and cause, the application plots the line graph with the data from selected countries, and a respective boxplot. The application also shows the respective table with the subset of the data.

subset <- read.csv("subset.csv")
library(ggplot2); library(gridExtra)
p1 <- qplot(Year, Deaths, data = subset, color=Country, geom = "line", 
    main = paste0("Cause of Deaths: ", subset$Cause[1])[1]) + theme(legend.position = "bottom")  
p2 <- ggplot(subset, aes(x = Country, y = Deaths)) + geom_boxplot() 
grid.arrange(p1, p2, ncol = 1)

plot of chunk unnamed-chunk-2

Final Comments

  • The source data do not have information for all causes and years for some countries. Then, it was necessary to apply some filters to get the maximum of complete information.
  • It is necessary to improve the steps for the data transformation and cleaning to get more causes and countries.
  • It plans to sdd an input to provide prediction functionalities (How many deaths may occur in a given year?).
  • The application is available at http://dsasas.shinyapps.io/DDPapp/