Data source: https://knoema.com/atlas/Nepal/Infant-mortality-rate

I will be using base R function to present the data. Let’s Begin.

library(readxl)
library(ggplot2)
IMR_Nepal <- read_excel("C:/Users/sulov/OneDrive/Data Analysis/Nepal Health/Health Data.xlsx", 
    sheet = "Infant Mortality")
attach(IMR_Nepal)

Let’s just view the structure of the data.

head(IMR_Nepal, n = 3)
## # A tibble: 3 x 2
##    Date Value
##   <dbl> <dbl>
## 1  2006    45
## 2  2007    43
## 3  2008    41

This is the data we are going to analyze. First let’s do descriptive analysis.

summary(Value)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   28.00   30.75   35.00   35.58   39.50   45.00

Now, let’s visualize the data.

plot(IMR_Nepal, type = "b", pch = 19, main = "Infant Mortality Rate in Nepal (2006-2017)", xlab= "Year", ylab= "Mortality per 1000 Births")
text(IMR_Nepal, labels = Value, cex = 0.5, pos = 4)