---
title: "Visualization of GDP of Nepal"
output:
flexdashboard::flex_dashboard:
orientation: row
vertical_layout: fill
social: menu
source: embed
---
```{r setup, include=FALSE}
library(flexdashboard)
library(ggplot2)
library(gganimate)
library(dplyr)
library(DT)
library(cowplot)
library(readr)
library(plotly)
library(highcharter)
gdp_nepal <- read_csv("C:/Users/User/Downloads/Untitled spreadsheet - Sheet1 (3).csv")
gdp_nepal<-gdp_nepal %>% select(1,5,7)
gdp_nepal$`GDP per capita`<-gsub("\\$","",gdp_nepal$`GDP per capita`)
gdp_nepal$`GDP per capita`<-as.numeric(gdp_nepal$`GDP per capita`)
```
# page 1 {.tabset .tabset-fade}
### GGplot2
```{r}
plot1<-ggplot(data = gdp_nepal,aes(x=Year,y=`GDP per capita`))+geom_line(col="blue")+geom_point(col="red",aes(group = seq_along(Year)))+labs(title = "GDP per Capita in Nepal",x = "Year",
y = "GDP per Capita",angle=45,
caption = "Data Source:https://www.worldometers.info/gdp/nepal-gdp/",position_dodge())+geom_text(label=gdp_nepal$`GDP per capita`,vjust=-1,size=2)
ggdraw(plot1) +
draw_label("Nepal", color = "grey", alpha=0.3, size = 100, angle = 45)
```
# page 2
### High charcter
```{r}
hchart(gdp_nepal, "line", hcaes(x = Year, y = `GDP per capita`)) %>%
hc_title(
text = "GDP of Nepal",
useHTML = TRUE) %>%
hc_tooltip(table = TRUE, sort = TRUE) %>%
hc_add_theme(
hc_theme_flatdark(
chart = list(
backgroundColor = "transparent",
divBackgroundImage = "http://www.wired.com/images_blogs/underwire/2013/02/xwing-bg.gif"
)
)
)
```
# page 3
### data
```{r}
datatable(gdp_nepal,filter = "top",caption = "Source:
International Monetary Fund 2018 ")
```