Датотека:Countries by Military expenditures (% of GDP) in 2014 v2.svg

Садржај странице није подржан на другим језицима
Ово је датотека са Викимедијине оставе
С Википедије, слободне енциклопедије

Оригинална датотека(SVG датотека, номинално 512 × 288 пиксела, величина: 1,52 MB)

Опис измене

Опис
English: Based on the Worldbank data from http://data.worldbank.org/indicator/MS.MIL.XPND.GD.ZS This is an intentional duplicate of https://commons.wikimedia.org/wiki/File:Countries_by_Military_expenditures_(%25_of_GDP)_in_2014.svg created with freely available R packages (so that it can be recreated effortlessly).
Датум
Извор Created with R
Аутор Pipping

Лиценцирање

Ја, носилац ауторског права над овим делом, објављујем исто под следећом лиценцом:
w:sr:Кријејтив комонс
ауторство делити под истим условима
Дозвољено је:
  • да делите – да умножавате, расподељујете и преносите дело
  • да прерађујете – да прерадите дело
Под следећим условима:
  • ауторство – Морате да дате одговарајуће заслуге, обезбедите везу ка лиценци и назначите да ли су измене направљене. Можете то урадити на било који разуман манир, али не на начин који предлаже да лиценцатор одобрава вас или ваше коришћење.
  • делити под истим условима – Ако измените, преобразите или доградите овај материјал, морате поделити своје доприносе под истом или компатибилном лиценцом као оригинал.

Created with the following piece of code:

library(magrittr)

selectedYear <- 2014

getWorldBankData <- function(indicatorCode, indicatorName) {
    baseName <- paste('API', indicatorCode, 'DS2_en_csv_v2', sep='_')
    ## Download zipfile if necessary
    zipfile <- paste(baseName, 'zip', sep='.')
    if (!file.exists(zipfile)) {
        zipurl <- paste(paste('http://api.worldbank.org/v2/en/indicator',
                              indicatorCode, sep='/'),
                        'downloadformat=csv', sep='?')
        download.file(zipurl, zipfile)
    }
    csvfile <- paste(baseName, 'csv', sep='.')
    ## This produces a warning because of the trailing commas. Safe to ignore.
    readr::read_csv(unz(zipfile, csvfile), skip=4,
                    col_types = list(`Indicator Name` = readr::col_character(),
                                     `Indicator Code` = readr::col_character(),
                                     `Country Name` = readr::col_character(),
                                     `Country Code` = readr::col_character(),
                                     .default = readr::col_double())) %>%
        dplyr::select(-c(`Indicator Name`, `Indicator Code`, `Country Name`))
}

## Obtain and merge World Bank data
worldBankData <- getWorldBankData('MS.MIL.XPND.GD.ZS') %>%
    tidyr::gather(-`Country Code`, convert=TRUE,
                  key='Year', value=`Military expenditure (% of GDP)`,
                  na.rm = TRUE) %>%
    dplyr::filter(Year == selectedYear) %>%
    dplyr::mutate(Year = NULL)

## Plotting: Obtain Geographic data
mapData <- tibble::as.tibble(ggplot2::map_data("world")) %>%
    dplyr::mutate(`Country Code` =
                      countrycode::countrycode(region, "country.name", "iso3c"),
                  ## This produces a warning but I do not see how we could do better
                  ## since we started with fuzzy names.
                  region = NULL, subregion = NULL)

combinedData <- dplyr::left_join(mapData, worldBankData)

ggplot2::ggplot(data = combinedData, ggplot2::aes(long,lat)) +
    ggplot2::geom_polygon(ggplot2::aes(group = group,
                                       fill  = `Military expenditure (% of GDP)`),
                          color = '#606060', lwd=0.05) +
    ggplot2::scale_fill_gradientn(colours= rev(viridis::magma(256, alpha = 0.5)),
                                  name = "% GDP",
                                  breaks = 2*0:50,
                                  limits = c(0,14)) +
    ggplot2::coord_fixed() +
    ggplot2::theme_bw() +
    ggplot2::theme(plot.title = ggplot2::element_text(hjust = 0.5),
          axis.title = ggplot2::element_blank(),
          axis.text = ggplot2::element_blank(),
          axis.ticks = ggplot2::element_blank(),
          panel.grid.major = ggplot2::element_blank(),
          panel.grid.minor = ggplot2::element_blank(),
          panel.border = ggplot2::element_blank(),
          panel.background = ggplot2::element_blank()) +
    ggplot2::labs(title = paste("Countries by military expenditures in",
                                selectedYear))

ggplot2::ggsave(paste(selectedYear, 'militrary_expenditures_relative.svg', sep='_'),
                height=100, units='mm')

Натписи

Укратко објашњење шта ова датотека представља/приказује

Ставке приказане у овој датотеци

приказује

Нека вредност без ставке на Википодаци

14. децембар 2016

image/svg+xml

f7974ad3d785da2b8619ad810d11b3b76efdd51b

288 пиксел

512 пиксел

Историја датотеке

Кликните на датум/време да бисте видели тадашњу верзију датотеке.

Датум/времеМинијатураДимензијеКорисникКоментар
тренутна16:30, 20. мај 2017.Минијатура за верзију на дан 16:30, 20. мај 2017.512 × 288 (1,52 MB)Pippingredo with dplyr
22:27, 11. мај 2017.Минијатура за верзију на дан 22:27, 11. мај 2017.512 × 256 (1,51 MB)PippingRegenerated with new data (last update upstream: 2017-04-27).
21:07, 14. децембар 2016.Минијатура за верзију на дан 21:07, 14. децембар 2016.512 × 256 (1,51 MB)PippingFixed scale for easier comparison with data from different years
20:43, 14. децембар 2016.Минијатура за верзију на дан 20:43, 14. децембар 2016.512 × 256 (1,51 MB)PippingUse a more appropriate resolution (makes the font smaller in relation)
19:10, 14. децембар 2016.Минијатура за верзију на дан 19:10, 14. децембар 2016.512 × 271 (1,49 MB)Pipping{{subst:Upload marker added by en.wp UW}} {{Information |Description = {{en|Based on the Worldbank data from http://data.worldbank.org/indicator/MS.MIL.XPND.GD.ZS This is an intentional duplicate of https://commons.wikimedia.org/wiki/File:Countries_by...

Следећа страница користи ову датотеку:

Глобална употреба датотеке

Метаподаци