Basic description of project

Data were obtained from the GISS Surface Temperature Analysis ver. 4 (GISTEMP v4) is an estimate of global surface temperature change.

The basic GISS temperature analysis scheme was defined in the late 1970s by James Hansen when a method of estimating global temperature change was needed for comparison with one-dimensional global climate models. The analysis method was fully documented in Hansen and Lebedeff (1987). Several papers describing updates to the analysis followed over the following decades, most recently that of Hansen et al. (2010), as well as the uncertainty quantification of Lenssen et al. (2019).

Citation When referencing the GISTEMP v4 data provided here, please cite both this webpage and also our most recent scholarly publication about the data. In citing the webpage, be sure to include the date of access.

GISTEMP Team, 2022: GISS Surface Temperature Analysis (GISTEMP), version 4. NASA Goddard Institute for Space Studies. Dataset accessed 20YY-MM-DD at https://data.giss.nasa.gov/gistemp/. Lenssen, N., G. Schmidt, J. Hansen, M. Menne, A. Persin, R. Ruedy, and D. Zyss, 2019: Improvements in the GISTEMP uncertainty model. J. Geophys. Res. Atmos., 124, no. 12, 6307-6326, doi:10.1029/2018JD029522.

Processing of data

data <- read_csv("data/ExcelFormattedGISTEMPData2CSV.csv")
## Rows: 135 Columns: 15
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## dbl (15): Year, Glob, NHem, SHem, 24N-90N, 24S-24N, 90S-24S, 64N-90N, 44N-64...
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
names(data) <- c("Year", "Glob", "NHem", "SHem", "Loc24N_90N", "Loc24S_24N","Loc90S_24S","Loc64N_90N","Loc44N_64N","Loc24N_44N","LocEQU_24N","Loc24S_EQU","Loc44S_24S","Loc64S_44S","Loc90S_64S")

basic_data <- data %>%
  select(Year, Glob) %>%
  pivot_longer(!Year, names_to = "Location", values_to = "Temperature")

global_data <- data %>%
  select(Year, NHem, SHem) %>%
  pivot_longer(!Year, names_to = "Location", values_to = "Temperature")

north_data <- data %>%
  select(Year, Loc24N_90N, Loc24S_24N, Loc64N_90N, Loc44N_64N, Loc24N_44N, LocEQU_24N) %>%
  pivot_longer(!Year, names_to = "Location", values_to = "Temperature")

south_data <- data %>%
  select(Year, Loc90S_24S, Loc24S_24N, Loc24S_EQU, Loc44S_24S, Loc64S_44S, Loc90S_64S) %>%
  pivot_longer(!Year, names_to = "Location", values_to = "Temperature")

Chart display

Following 3 charts display comparison of global temperature to certain locations.

First chart displays comparison of global temperature to North and South hemisphere.

ggplot() +
  geom_line(data = global_data, aes(x=Year, y=Temperature, color = Location)) +
  geom_line(data = basic_data, aes(x=Year, y=Temperature, color = Location), size = 1.2) +
  labs(
    title = "Development of temperature on global level and hemispheres",
    x = "Year",
    y = "Temperature",
    color = "Location of temperature measurement",
    caption = "Source: https://data.giss.nasa.gov/gistemp"
  ) + 
  theme(legend.position="bottom")
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.

Secund chart displays comparison of global temperature and locations in northern hemisphere

ggplot() +
  geom_line(data = north_data, aes(x=Year, y=Temperature, color = Location)) +
  geom_line(data = basic_data, aes(x=Year, y=Temperature, color = Location), size = 1.2) +
  labs(
    title = "Development of temperature on global level and Northern hemisphere",
    x = "Year",
    y = "Temperature",
    color = "Location of temperature measurement",
    caption = "Source: https://data.giss.nasa.gov/gistemp"
  ) + 
  theme(legend.position="bottom")

Third chart displays comparison of global temperature and locations in southern hemisphere

ggplot() +
  geom_line(data = south_data, aes(x=Year, y=Temperature, color = Location)) +
  geom_line(data = basic_data, aes(x=Year, y=Temperature, color = Location), size = 1.2) +
  labs(
    title = "Development of temperature on global level and Southern hemisphere",
    x = "Year",
    y = "Temperature",
    color = "Location of temperature measurement",
    caption = "Source: https://data.giss.nasa.gov/gistemp"
  ) + 
  theme(legend.position="bottom")