Singapore Airport Air Passenger Arrivals - By Country of Embarkation

A Course Project: Shiny Application and Reproducible Pitch

arachnie233

Introduction

This application summarise the total numbers of arriving airline passengers in Singapore Airport, queried using regions (Europe, South East Asia and North East Asia. The dataset is taken from Singapore's Open Data Portal: data.gov.sg for the year from January 1961 to December 2015. Before the data is being visualised as in this application, the datasets were cleaned and prepared i.e. removing NA values, grouping and summarising the tables. The original datasets have the number of passengers in term of months, however, this application sums up the monthly figures into year.

The Dataset

Air Passenger Arrivals by Region and selected country of embarkation.

Refers to Changi Airport only. Data exclude transit passengers who continued their journey on the same flight. Figures from January 1989 refer to Changi Airport only.

Dataset from January 1, 1961 to December 31, 2015.

Data Preprocessing

#read the dataset
dataS<-read.csv(url, sep=",", colClasses = c("character", "character", "character", "character"))
library(dplyr)
names(dataS)[names(dataS)=="month"]<- "year"
#remove the rows with NA values
cleanData <- dataS[!data$no_of_air_passenger_arrivals=="na",]
#change the first column into year only not month
cleanData$year <- as.numeric(substr(cleanData$year,1,4))
#change the last column into numeric format
cleanData$no_of_air_passenger_arrivals <- as.numeric(cleanData$no_of_air_passenger_arrivals)
#group the table into year
cleanData<-cleanData %>%
  group_by(year, region, selected_country_of_embarkation) %>%
  summarise( 
    TOTAL_PAX= sum(no_of_air_passenger_arrivals)
    )

Total Numbers of Passengers in Years

plot of chunk unnamed-chunk-4

Conclusion