2019-12-16 11:08:25 +01:00
|
|
|
|
|
|
|
# Read and format data ----------------------------------------------------
|
|
|
|
|
|
|
|
library(tidyverse)
|
|
|
|
library(maps)
|
|
|
|
|
|
|
|
# get website analytics
|
|
|
|
source("data-raw/country_analysis_url_token.R")
|
|
|
|
url_json <- paste0(country_analysis_url,
|
|
|
|
"/index.php?&module=API&token_auth=",
|
|
|
|
country_analysis_token,
|
|
|
|
"&method=Live.getLastVisitsDetails&idSite=3&language=en&expanded=1&date=2018-01-01,2028-01-01&period=range&filter_limit=-1&format=JSON&segment=&translateColumnNames=1")
|
|
|
|
|
|
|
|
data_json <- jsonlite::read_json(url_json)
|
|
|
|
data <- tibble(
|
|
|
|
timestamp_server = as.POSIXct(sapply(data_json, function(x) x$serverTimestamp), origin = "1970-01-01"),
|
|
|
|
country = sapply(data_json, function(x) x$country))
|
2019-12-20 15:05:58 +01:00
|
|
|
rm(data_json)
|
|
|
|
|
|
|
|
# how many?
|
|
|
|
n_distinct(data$country[data$country != "Unknown"])
|
|
|
|
|
2019-12-16 11:08:25 +01:00
|
|
|
|
|
|
|
|
|
|
|
# Plot world map ----------------------------------------------------------
|
|
|
|
|
|
|
|
countries_name <- sort(unique(data$country))
|
|
|
|
countries_name <- countries_name[countries_name != "Unknown"]
|
|
|
|
countries_iso <- countrycode::countrycode(countries_name, 'country.name', 'iso3c')
|
|
|
|
|
|
|
|
world1 <- sf::st_as_sf(map('world', plot = FALSE, fill = TRUE)) %>%
|
|
|
|
mutate(countries_code = countrycode::countrycode(ID, 'country.name', 'iso3c'),
|
|
|
|
included = as.integer(countries_code %in% countries_iso)) %>%
|
|
|
|
mutate(not_antarctica = as.integer(ID != "Antarctica"))
|
|
|
|
|
2019-12-20 15:05:58 +01:00
|
|
|
countries_plot <- ggplot(world1) +
|
2019-12-16 11:08:25 +01:00
|
|
|
geom_sf(aes(fill = included, colour = not_antarctica), size = 0.25) +
|
|
|
|
theme_minimal() +
|
2019-12-20 15:05:58 +01:00
|
|
|
theme(legend.position = "none",
|
2019-12-16 11:08:25 +01:00
|
|
|
panel.grid = element_blank(),
|
|
|
|
axis.title = element_blank(),
|
|
|
|
axis.text = element_blank()) +
|
|
|
|
scale_fill_gradient(low = "white", high = "#CAD6EA") +
|
|
|
|
# this makes the border Antarctica turn white (invisible):
|
2019-12-20 15:05:58 +01:00
|
|
|
scale_colour_gradient(low = "white", high = "#81899B")
|
|
|
|
|
2019-12-20 21:06:39 +01:00
|
|
|
countries_plot_mini <- countries_plot
|
|
|
|
countries_plot_mini$data <- countries_plot_mini$data %>% filter(ID != "Antarctica")
|
|
|
|
countries_plot_mini <- countries_plot_mini + scale_colour_gradient(low = "#81899B", high = "#81899B")
|
|
|
|
countries_plot_big <- countries_plot +
|
|
|
|
labs(title = tools::toTitleCase("Countries where the AMR package for R was downloaded from"),
|
|
|
|
subtitle = paste0("Between March 2018 - ", format(Sys.Date(), "%B %Y"))) +
|
|
|
|
theme(plot.title = element_text(size = 16, hjust = 0.5),
|
|
|
|
plot.subtitle = element_text(size = 12, hjust = 0.5)) +
|
|
|
|
geom_text(aes(x = -170,
|
|
|
|
y = -70,
|
|
|
|
label = stringr::str_wrap(paste0("Countries (n = ",
|
|
|
|
length(countries_name), "): ",
|
|
|
|
paste(countries_name, collapse = ", ")),
|
|
|
|
200)),
|
|
|
|
hjust = 0,
|
|
|
|
size = 4)
|
2019-12-20 15:05:58 +01:00
|
|
|
# main website page
|
|
|
|
ggsave("pkgdown/logos/countries.png",
|
|
|
|
width = 6,
|
2019-12-20 21:06:39 +01:00
|
|
|
height = 2.5,
|
2019-12-20 15:05:58 +01:00
|
|
|
units = "in",
|
|
|
|
dpi = 100,
|
2019-12-20 21:06:39 +01:00
|
|
|
plot = countries_plot_mini,
|
2019-12-20 15:05:58 +01:00
|
|
|
scale = 1)
|
|
|
|
# when clicked - a high res enlargement
|
|
|
|
ggsave("pkgdown/logos/countries_large.png",
|
|
|
|
width = 11,
|
|
|
|
height = 6,
|
|
|
|
units = "in",
|
|
|
|
dpi = 300,
|
2019-12-20 21:06:39 +01:00
|
|
|
plot = countries_plot_big,
|
2019-12-20 15:05:58 +01:00
|
|
|
scale = 1.5)
|
2019-12-16 11:08:25 +01:00
|
|
|
|
|
|
|
|
|
|
|
# Gibberish ---------------------------------------------------------------
|
|
|
|
|
|
|
|
p1 <- data %>%
|
|
|
|
group_by(country) %>%
|
|
|
|
summarise(first = min(timestamp_server)) %>%
|
|
|
|
arrange(first) %>%
|
|
|
|
mutate(n = row_number()) %>%
|
|
|
|
ggplot(aes(x = first, y = n)) +
|
|
|
|
geom_line() +
|
|
|
|
geom_point(aes(x = max(first), y = max(n)), size = 3) +
|
|
|
|
scale_x_datetime(date_breaks = "2 months", date_labels = "%B %Y") +
|
|
|
|
labs(x = NULL, y = "Number of countries")
|
|
|
|
|
|
|
|
package_releases <- read_html("https://cran.r-project.org/src/contrib/Archive/AMR/") %>%
|
|
|
|
rvest::html_table() %>%
|
|
|
|
.[[1]] %>%
|
|
|
|
as_tibble(.name_repair = "unique") %>%
|
|
|
|
filter(`Last modified` != "") %>%
|
|
|
|
transmute(version = gsub("[^0-9.]", "",
|
|
|
|
gsub(".tar.gz", "", Name)),
|
|
|
|
datetime = as.POSIXct(`Last modified`)) %>%
|
|
|
|
# add current
|
|
|
|
bind_rows(tibble(version = as.character(packageVersion("AMR")),
|
|
|
|
datetime = as.POSIXct(packageDate("AMR")))) %>%
|
|
|
|
# remove the ones not plottable
|
|
|
|
filter(datetime > min(p1$data$first))
|
|
|
|
|
|
|
|
p1 + geom_linerange(data = package_releases, aes(x = datetime, ymin = 0, ymax = 80), colour = "red", inherit.aes = FALSE)
|
|
|
|
|