• R/O
  • SSH

Tags
Keine Tags

Frequently used words (click to add to your profile)

javac++androidlinuxc#windowsobjective-ccocoa誰得qtpythonphprubygameguibathyscaphec計画中(planning stage)翻訳omegatframeworktwitterdomtestvb.netdirectxゲームエンジンbtronarduinopreviewer

File Info

Rev. aa8a5bd2d6f29cd6c11f31ae5cbd97690456b8f4
Größe 6,643 Bytes
Zeit 2022-06-08 21:39:49
Autor Lorenzo Isella
Log Message

I improved a bit some tables.

Content

---
output: word_document
fontsize: 12pt
number_sections: true	 
---


```{r, scoreboard, echo=FALSE, eval=TRUE}

options( scipen = 16 )

options(tidyverse.quiet = TRUE)
suppressWarnings(suppressMessages(library(janitor)))
suppressWarnings(suppressMessages(library(viridis)))
suppressWarnings(suppressMessages(library(scales)))
## suppressWarnings(suppressMessages(library(treemap)))
suppressWarnings(suppressMessages(library(flextable)))

library(tidyverse, warn.conflicts = FALSE)
library(janitor)
library(viridis)
library(scales)
## library(treemap)
library(stringi)
library(flextable)


ll <- readRDS("./intermediate_files/list_stat.RDS")



```

---
title: "Subject: Latest statistics on Covid-19 State aid measures and budgets "
---

# Key Messages

* As of `r format(Sys.Date(), "%d %B %Y" )`, the Commission has
	taken `r ll[[1]][1]+(ll[[8]]%>%tail(1)%>%pull(n_amendments))` decisions approving `r ll[[2]][1]`
national measures notified by 27 Member States.
* On this basis, the amount of around €`r ll[[3]][1]` trillion of total
  State aid approved so far is a best estimate.
* Among the total number of decisions, the number of amendments is `r (ll[[8]]%>%tail(1)%>%pull(n_amendments))`.
* More specifically, `r ll[[4]]$percentage[1]` of State aid approved has
  been notified by `r ll[[4]]$country[1]`.
* `r ll[[4]]$country[2]` has notified measures that represent around
  `r ll[[4]]$percentage[2]` of the entire amount of State aid, while
  the aid notified by `r ll[[4]]$country[3]` represents
  `r ll[[4]]$percentage[3]` of this amount.
* The aid notified by `r ll[[4]]$country[4]` represents
`r  ll[[4]]$percentage[4]` of the entire amount of State aid approved,
while the aid notified by `r ll[[4]]$country[5]` and
`r ll[[4]]$country[6]` corresponds to around `r ll[[4]]$percentage[5]`
and `r ll[[4]]$percentage[6]`, respectively.
* Aid notified by other Member States is estimated to be between
 `r  tail(ll[[4]]$percentage2,1)` and  `r  ll[[4]]$percentage[7]` of
 the total €`r ll[[3]][1]` trillion estimated.
* The average duration to process State aid decisions corresponds to
  around `r ll[[5]][1]` (calendar days). When considering the median duration this
  reduced to `r ll[[6]][1]` (calendar days).
* As regards the different sections of the Temporary Framework, the
  most frequently used sections are `r ll[[7]][1,1]%>%pull(name)` with
  `r ll[[7]][1,2]%>%pull(value)` measures (
  `r scales::percent((ll[[7]][1,3] %>% pull(share)),.1)`
  of the total number of
  measures under the Temporary Framework), `r ll[[7]][2,1]%>%pull(name)` with 
  `r ll[[7]][2,2]%>%pull(value)` measures 
  (`r scales::percent((ll[[7]][2,3]) %>% pull(share),.1)`) and 
  `r ll[[7]][3,1]%>%pull(name)` with 
  `r ll[[7]][3,2]%>%pull(value)` measures
  (`r scales::percent((ll[[7]][3,3]) %>% pull(share),.1)`).
  

# Background

For some measures under the Temporary Framework, it is not necessary
 to indicate a
budget, which is why the figures included are best estimates based on
 budgets approved
in State aid decisions and other available figures, for instance
mentioned in public
communication by national authorities, and on official information
 communicated by the
national authorities.

Furthermore, some Member States have notified preliminary budgets to
the Commission that they have plans to further increase. The economic
effect  of aid measures approved is
different, for instance some budgets concern direct grants, others loans and
guarantees.
Finally, these figures are subject to daily change.
All State aid approved has been necessary and proportionate to support
businesses and remedy the serious disturbance to the European economy
due to the coronavirus
outbreak. At the same time, there are sizable differences in the
amount of State aid
granted by Member States, which appears linked to the fiscal space
they have as well as the respective size of their economies.

# Breakdown of Covid-19 State Aid Budgets by Member State

```{r, table1, echo=FALSE, eval=TRUE}
ll[[8]] %>%
    flextable() %>%
    ## add_header_row(values = c("some measures", "other measures") )%>%
    set_header_labels(country="Member State",
                      budget="Allocated Budget (mio €)",
                      share="Share of Total",
                      gdp="Share of GDP",
                      n_decisions="Number of Decisions",
                      n_amendments="Number of Amendments",
                      mean_duration="Mean Duration (calendar days)",
                      median_duration="Median Duration (calendar days)") %>%     
    theme_zebra() %>%
    theme_box() %>%
    fontsize(part = "all", size = 8)  %>%
    font(part="all", fontname = "Verdana") %>% 
    colformat_double(big.mark = " ") %>%
    set_formatter(share = function(x) sprintf( "%.1f%%", x*100 ) ) %>%
    set_formatter(gdp = function(x) sprintf( "%.1f%%", x*100 ) ) %>%
    width(width = 1.)
```

# Breakdown of Case Assessment Durations
```{r, table2, echo=FALSE, eval=TRUE}
ll[[9]] %>%
    flextable() %>%
    set_header_labels(name="Case Type",
                      value="Duration (calendar days)") %>%    
    theme_zebra() %>%
    theme_box() %>% 
    fontsize(part = "all", size = 8)  %>%
    font(part="all", fontname = "Verdana") %>% 
    colformat_double(big.mark = " ")  %>%
    width(width = c(4,2))
```


# Breakdown of Case Amendment Durations
```{r, table2_amendments, echo=FALSE, eval=TRUE}
ll[[10]] %>%
    flextable() %>%
    set_header_labels(name="Case Type",
                      value="Duration (calendar days)") %>%    
    theme_zebra() %>%
    theme_box() %>% 
    fontsize(part = "all", size = 8)  %>%
    font(part="all", fontname = "Verdana") %>% 
    colformat_double(big.mark = " ")  %>%
    width(width = c(4,2))
```





# Frequency of Use of the Temporary Framework Chapters
```{r, table3, echo=FALSE, eval=TRUE}
ll[[7]] %>%
    flextable() %>%
    ## add_header_row(values = c("some measures", "other measures") )%>%
    set_header_labels(name="Temporary Framework Chapter",
                      value="Frequency",
                      share="Share of Total") %>%    
    
    theme_zebra() %>%
    theme_box() %>% 
    fontsize(part = "all", size = 8)  %>%
    font(part="all", fontname = "Verdana") %>% 
    colformat_double(big.mark = " ") %>%
    set_formatter(share = function(x) sprintf( "%.1f%%", x*100 ) ) %>%
    ## set_formatter(gdp = function(x) sprintf( "%.1f%%", x*100 ) ) %>%
    width(width = c(4,1,1))
```