Back


Goal 11: Sustainable cities and communities

Urbanization


GS Urbanization
# Import
BEXSTA_raw <- 
  statgl_url("BEXSTA", lang = language) %>% 
  statgl_fetch(
    `residence type` = px_all(), 
    .col_code        = TRUE
    ) %>% 
  as_tibble() 

# Transform
BEXSTA <-
  BEXSTA_raw %>% 
  filter(`residence type` != BEXSTA_raw[[1]][1]) %>% 
  mutate(
    `residence type` = fct_inorder(`residence type`) %>% fct_rev,
    time             = as.numeric(time),
    value            = as.numeric(value)
    )

# Plot
BEXSTA %>% 
  ggplot(aes(
    x    = time,
    y    = value,
    fill = `residence type`
  )) +
  geom_area(position = "fill") +
  scale_y_continuous(labels  = scales::percent_format(
    scale = 100, 
    accuracy = 1, 
    big.mark = ".",
    decimal.mark = ","
    )) +
  scale_fill_statgl(reverse = TRUE, guide = guide_legend(reverse = TRUE)) +
  theme_statgl() +
  labs(
    title = sdg11$figs$fig1$title[language],
    subtitle = sdg11$figs$fig1$sub[language],
    x = " ",
    y = " ",
    fill = sdg11$figs$fig1$fill[language],
    caption = sdg11$figs$fig1$cap[language]
  )

StatBank


# Transform
BEXSTA <-
  BEXSTA_raw %>% 
  filter(
    `residence type` != BEXSTA_raw[[1]][1],
    time >= year(Sys.time()) - 7) %>% 
  mutate(
    `residence type` = fct_inorder(`residence type`),
    time             = as.numeric(time),
    value            = as.numeric(value),
    ) %>% 
  spread(1, 3) %>% 
  arrange(desc(time)) %>% 
  mutate(var = "Antal personer")

# Table
BEXSTA %>% 
  select(-ncol(.)) %>% 
  rename(" " = 1) %>% 
  statgl_table(year_col = " ") %>% 
  pack_rows(index = BEXSTA[[9]] %>% table())
Capital city Main settlements Larger settlements Settlements Smaller settlements Smallest settlements Other localities
Antal personer
2025 19.903 16.633 12.009 4.156 3.312 463 66
2024 19.872 16.373 12.242 4.133 3.536 479 64
2023 19.604 16.192 12.406 4.361 3.563 420 63
2022 19.261 16.242 12.558 4.377 3.590 470 64
2021 18.800 16.345 12.679 5.005 3.171 353 68
2020 18.326 16.299 12.861 5.031 3.124 366 74
2019 17.984 16.287 12.915 4.924 3.206 591 85
2018 17.796 16.267 12.883 5.144 3.090 596 101

Location of educational establishments


GS Location of educational establishments
# Import
if (language == "da") {
  udd_raw <- readxl::read_xlsx(paste0(getwd(), "/text/", "udd_da.xlsx"))
} else if (language == "kl") {
  udd_raw <- readxl::read_xlsx(paste0(getwd(), "/text/", "udd_kl.xlsx"))
} else {
  udd_raw <- readxl::read_xlsx(paste0(getwd(), "/text/", "udd_en.xlsx"))
}

udd <- 
  udd_raw %>% 
  mutate(value = 1) %>% 
  group_by(type, metro) %>% 
  summarise(value = sum(value))

# plot
udd %>% 
  ggplot(aes(
    x    = type,
    y    = value,
    fill = metro 
  )) +
  geom_col(position = "dodge") +
  theme_statgl() +
  scale_fill_statgl() +
  scale_y_continuous(breaks = scales::pretty_breaks()) +
  labs(
    title = sdg11$figs$fig1$title[language],
    y     = " ",
    x     = " ",
    fill  = " "
  )




# table
udd %>% 
  spread(metro, value) %>% 
  rename(" " = 1) %>% 
  mutate(across(everything(), replace_na, 0)) %>% 
  statgl_table(replace_0s = TRUE)
Outside the municipal capitals Within the municipal capitals
Andre 3 6
Erhvervsuddannelse 2 11
Gymnasium 1 3
Videregående uddannelse 0 1

Protected areas


GS Protected areas
områder <- readxl:: read_xlsx("text/områder_da.xlsx")

# Table
områder %>% 
  mutate_if(is.numeric, ~ replace(., is.na(.), 0)) %>% 
  mutate_if(is.numeric, funs(as.character(signif(., 3)))) %>% 
  select(-Ramsar) %>% 
  rename(" " = 1) %>% 
  statgl_table(replace_0s = TRUE) %>% 
  pack_rows(index = områder["Ramsar"] %>% table())
Kvadratkilometer Rettet kvadratkilometer Bemærkning
Ikke ramsarområde
Qinnguadalen 30 37.2 0
Øen Uunartoq 5850 6.32 0
Klosterdalen 24 26 0
Ivittuut og Kangilinnguit (Inkl 5 delområder, herunder Ikkafjorden) 573 615 rettet område
Øen Akilia 1 1.52 0
Austmannadalen 587 632 0
Arnangarnup Qoorua 90 96 0
Arktisk Station (Lyngmarken) 2600 1.93 rettet område
Melville Bugten 7980 6980 0
Ilulissat Isfjord 4000 4050 0
Kitsissunnguit – Grønne Ejland (også ramsar) 69 70.1 0
Uunnartorsuaq (Engelskmandens Havn) 0 0.601 indsat område
Nationalparken i Nord- og Østgrønland 953000 935000 0
Ramsarområde
Ikkattoq and adjacent archipelago 0 449 indsat område
Kitsissut Avalliit 0 44.7 indsat område
Aqajarua, Qaamassoq and Sullorsuaq 0 264 indsat område
Qinnquata Marraa and Kuussuaq 0 70 indsat område
Kuannersuit Kuussuat 0 38 indsat område
Naternaq 0 1910 indsat område
Heden 0 2620 indsat område
Hochstetter Forland 0 2070 indsat område
Kilen 0 495 indsat område
Ørsted Dal, Pingel Dal and Enhjørningen Dal 0 1960 indsat område
Eqalummiut Nunaat and Nassuttuup Nunaa 0 5820 indsat område