Τιμές χρυσού από την τράπεζα της Ελλάδος

## Δελτίο τιμών χρυσού και χρυσών νομισμάτων 
## https://opendata.bankofgreece.gr/el/dataset/52

library(tidyverse)
library(scales)
library(readxl)

u <- "https://www.bankofgreece.gr/OpenDataSetFilesALL/GOLD/BoG_Bulletin_Gold_el_2021-10.xlsx"
download.file(u, destfile = "../data/gold.xlsx")

df <- read_excel("../data/gold.xlsx") %>% 
  select(Date = 1, buy = 2, sell = 3) %>% 
  mutate(Date = as.Date(Date))


df %>% 
  ggplot(aes(x = Date)) +
  geom_line(aes(y = buy, colour = "Αγορά")) +
  geom_line(aes(y = sell, colour = "Πώληση")) 

df %>% 
  ggplot(aes(x = Date)) +
  geom_line(aes(y = buy)) +
  geom_line(aes(y = sell)) +
  geom_ribbon(aes(ymin = buy, ymax = sell), fill = "red", alpha = .5) +
  scale_x_date(breaks = pretty_breaks(10)) +
  scale_y_continuous(breaks = pretty_breaks(10)) +
  labs(x = "", y = "Τιμή", 
       title = "Τιμή (EUR/gr) αγοράς/πώλησης χρυσού",
       subtitle = "Τίτλος χρυσού 0,995-1,000",
       caption = "Πηγή: Κεντρική Τράπεζα της Ελλάδος \nΕπεξεργασία: Α. Σταυρακούδης") +
  theme_light(base_size = 16)


DF <- df %>% 
  pivot_longer(-Date, names_to = "action", values_to = "value")

DF %>% 
  ggplot(aes(x = Date, y = value, color = action)) +
  geom_line() 

df2 <- DF %>% 
  pivot_wider(id_cols = Date, names_from = action, values_from = value) %>% 
  unnest(cols = everything())

all_equal(df, df2)


DFe <- df %>% 
  mutate(d = sell - buy) %>% 
  mutate(d_buy = c(NA, diff(buy))) %>% 
  mutate(p_buy = d_buy / buy) %>% 
  mutate(l_buy = log(buy / lag(buy, 1))) %>% 
  mutate(d_sell = c(NA, diff(sell))) %>% 
  mutate(p_sell = d_sell / sell) %>% 
  mutate(l_sell = log(sell / lag(sell, 1))) %>% 
  filter(is.na(d_buy) == FALSE)

DFe %>% 
  select(l_buy, l_sell)

cor(DFe$l_buy, DFe$l_sell, method = "pearson")
cor(DFe$l_buy, DFe$l_sell, method = "spearman")
cor(DFe$l_buy, DFe$l_sell, method = "kendall")
plot(DFe$l_buy, DFe$l_sell)
hist(DFe$l_buy)

DFe %>% 
  ggplot(aes(x = l_buy, y = l_sell)) + 
  geom_point()

DFe %>% 
  ggplot(aes(x = d)) +
  geom_histogram(binwidth = 0.5, alpha = 0.5) +
  geom_freqpoly(binwidth = 0.5, size = 2 )


Συνδεθείτε για περισσότερες δυνατότητες αλληλεπίδρασης,
σχολιασμοί, εξωτερικοί σύνδεσμοι, βοήθεια, ψηφοφορίες, αρχεία, κτλ.

Creative Commons License
Εκπαιδευτικό υλικό από τον Αθανάσιο Σταυρακούδη σας παρέχετε κάτω από την άδεια Creative Commons Attribution-NonCommercial-ShareAlike 4.0 License.
Σας παρακαλώ να ενημερωθείτε για κάποιους επιπλέον περιορισμούς
http://stavrakoudis.econ.uoi.gr/stavrakoudis/?iid=401.