Carbon Dioxide Measurements =====================================
OGR data source with driver: ESRI Shapefile
Source: "C:\Users\JIANWEI LI\AppData\Local\Cache\R\noaa_tornadoes\1950-2018-torn-aspath", layer: "1950-2018-torn-aspath"
with 63645 features
It has 22 fields
Integer64 fields read as strings: om yr mo dy tz stf stn mag inj fat wid fc
We look into the daily Tmax normal index (Figure.1) and percipitation(Figure.2) in 2010 to 2011. Both data is collected at the New York City Central Park station location
(Figure.3) is the tornado data of US
(Figure.4) is the measurements of global warming is the level of Carbon Dioxide. Through the years, from 1960 to 2020. It rises intensively over the past 60 years
Overall. Base on the the analysis on the measurements - Daily Climate Tmax index, precipitation, and tornado data. It is curcial to expand our research in the local level about the east coast tornado data with their percitipation.
Data Source: noaa API,noaa tornado data Data Description: http://www1.ncdc.noaa.gov/pub/data/cdo/documentation/NORMAL_DLY_documentation.pdf
---
title: "ANLY 512 Lab 2 - Data Exploration and Analysis Laboratory"
author: "JIANWEI LI"
date: "`r Sys.Date()`"
output:
flexdashboard::flex_dashboard:
orientation: rows
social: menu
source_code: embed
vertical_layout: fill
html_document:
df_print: paged
---
```{r setup, include=FALSE}
chooseCRANmirror(graphics=FALSE, ind=1)
```
Visualization
=======================================
### Conclusion
Column {.tabset data-height=550}
-----------------------------------------------------------------------
### Hourly climate normals (Figure 1)
```{r}
library(flexdashboard)
library(dygraphs)
library(xts)
library(tidyquant)
library(pdfetch)
library(ggplot2)
#library(devtools)
library(rnoaa)
library(lawn)
options(noaakey = "NkuxJqoZlvHFfKIBoNLPkaDIwKGcEcUR")
out<-ncdc(datasetid='NORMAL_DLY', datatypeid='dly-tmax-normal',stationid='GHCND:USW00094728', startdate = '2010-01-01', enddate = '2010-12-31',limit=500,token = "NkuxJqoZlvHFfKIBoNLPkaDIwKGcEcUR")
ncdc_plot(out)
```
Carbon Dioxide Measurements
=====================================
Column {.tabset data-height=550}
-----------------------------------------------------------------------
### Precipitation (Figure.2)
```{r}
#library(devtools)
library(rnoaa)
library(lawn)
options(noaakey = "NkuxJqoZlvHFfKIBoNLPkaDIwKGcEcUR")
out<-ncdc(datasetid='GHCND', datatypeid='PRCP',stationid='GHCND:USW00094728', startdate = '2010-01-01', enddate = '2010-12-31',limit=1000,token = "NkuxJqoZlvHFfKIBoNLPkaDIwKGcEcUR")
ncdc_plot(out)
```
Tornado
=====================================
Column {.tabset data-height=550}
-----------------------------------------------------------------------
### TT
```{r}
shp <- tornadoes()
#> OGR data source with driver: ESRI Shapefile
#> Source: "/Users/sckott/Library/Caches/rnoaa/tornadoes/1950-2018-torn-aspath", layer: "1950-2018-torn-aspath"
library('sp')
plot(shp)
```
Total Volumes
=====================================
Column {.tabset data-height=550}
-----------------------------------------------------------------------
### Carbon Dioxide Emission 1960-2020
```{r}
#Get information
Carbon_Dioxide = read.table("ftp://aftp.cmdl.noaa.gov/products/trends/co2/co2_mm_mlo.txt", header = FALSE, col.names = c("Year","Month","Decimal_Date","Average","Interpolated","Trend","Number_Days"), skip = 70)
# reformat date
Carbon_Dioxide$Average = replace(Carbon_Dioxide$Average, Carbon_Dioxide$Average == -99.99, NA)
Carbon_Dioxide$Number_Days = replace(Carbon_Dioxide$Days, Carbon_Dioxide $Number_Days == -1, NA)
scaled_Carbon_Dioxide = Carbon_Dioxide
# plot
scaled_Carbon_Dioxide_time_series2 = ts(Carbon_Dioxide$Average, frequency = 12, start = c(1958,3))
dygraph(scaled_Carbon_Dioxide_time_series2, main = "Carbon Dioxide Direct Measurements", xlab = "Year", ylab="CO2 (parts per million)") %>%
dyRangeSelector() %>%
dyLegend(width = 400, show = "onmouseover") %>%
dyOptions(drawGrid = TRUE)
```
Conclusion
=====================================
Column {data-width=600}
-------------------------------------
### Summary
We look into the daily Tmax normal index (Figure.1) and percipitation(Figure.2) in 2010 to 2011. Both data is collected at the New York City Central Park station location
(Figure.3) is the tornado data of US
(Figure.4) is the measurements of global warming is the level of Carbon Dioxide. Through the years, from 1960 to 2020. It rises intensively over the past 60 years
Overall. Base on the the analysis on the measurements - Daily Climate Tmax index, precipitation, and tornado data. It is curcial to expand our research in the local level about the east coast tornado data with their percitipation.
Data Source: noaa API,noaa tornado data
Data Description: http://www1.ncdc.noaa.gov/pub/data/cdo/documentation/NORMAL_DLY_documentation.pdf