ExportGenius Trade Analysis: Russia

Author

Gagan Atreya

Published

August 27, 2024

Section 1. Gold

Historical Gold Price

Code
rm(list = ls())

pacman::p_load(readxl, vtable, tidyverse, 
               lubridate, data.table, zoo, 
               readODS, patchwork, psych, scales)

df <- fread("/home/gagan/Desktop/soc_ace_2024/data/benchmark/goldprice.csv")

ggplot(df, 
       aes(x = date, 
           y = price_gram)) +
  geom_line() + 
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  labs(title = "International gold price per gram", 
       x = "Date", 
       y = "Price (USD)", 
       caption = "Source: macrotrends & auronum.co.uk") +  
  theme_minimal()  

Gold: Exports

Code
rm(list = ls())

df <- fread("/home/gagan/Desktop/soc_ace_2024/data/exportgenius/gold/russia/Russia-DetailedExport-Gold.csv")

df$date <- dmy(df$Date)
df$description <- df$`Product Description`
df$destination_country <- df$`Destination Country`
df$exporter <- df$Exporter
df$buyer <- df$Buyer
df$total_value <- df$`Total Value USD`
df$price_invoice <- df$total_value/df$Quantity

df <- df[, c("date", "description", "destination_country",
             "exporter", "buyer", "price_invoice", "total_value")]

df02 <- fread("~/Desktop/soc_ace_2024/scripts/exportgenius/gold_analyses_latest/goldprice.csv")
# head(df02$date)
df02$date <- ymd(df02$date)
df <- merge(df, df02, by = "date")
df$price_benchmark <- df$price_gram

plot01 <- ggplot(df, 
                 aes(x = date, 
                     y = total_value)) +
  geom_line() +
  geom_point() +  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  # ylim(15, 120) +
  labs(title = "Russia Gold Exports", 
       x = "Date", 
       y = "Total Value") +  
  theme_bw() 

plot01

Code
plot03 <- df %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~destination_country, ncol = 2)+
  labs(title = "Russia Gold Exports by Destination", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03

Code
df$exporter <- ifelse(df$exporter == "KRATSVETMET JSC", "OJSC Krastsvetmet",
                      ifelse(df$exporter == "OJSC KRASTSVETMET", "OJSC Krastsvetmet", df$exporter))

plot03a <- df %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~exporter, ncol = 2)+
  labs(title = "Russia Gold Exports by Exporting Company", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03a

Code
df$buyer <- ifelse(df$buyer == "refinery group sp z oo", "Refinery group",
                   ifelse(df$buyer == "refinery group sp zoo", "Refinery group", df$buyer))

plot03b <- df %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~buyer, ncol = 2)+
  labs(title = "Russia Gold Exports by Buying Company", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03b

Code
df$price_difference <- df$price_invoice - df$price_benchmark

df03 <- df[, c("date", "price_invoice", "price_benchmark")]

df$price_difference <- scale(df$price_invoice - df$price_benchmark)

plot04 <- ggplot(df, aes(x = date, 
                         y = price_difference)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference, 
                   color = price_difference > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Exports: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) 

plot04

Code
plot05 <- ggplot(df, aes(x = date, 
                         y = price_difference)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference, 
                   color = price_difference > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Exports by Destination: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~destination_country, 
             ncol = 2)

plot05

Code
plot06 <- ggplot(df, aes(x = date, 
                         y = price_difference)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference, 
                   color = price_difference > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Exports by Exporting Company: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~exporter, 
             ncol = 2)

plot06

Code
plot07 <- ggplot(df, aes(x = date, 
                         y = price_difference)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference, 
                   color = price_difference > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Exports by Buying Company: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~buyer, 
             ncol = 3)

plot07

Gold: Imports

Code
rm(list = ls())

df <- fread("/home/gagan/Desktop/soc_ace_2024/data/exportgenius/gold/russia/Russia-DetailedImport-Gold.csv")

df$date <- dmy(df$Date)
df$description <- df$Product_Description
df$origin_country <- df$Origin_Country
df$supplier <- df$Supplier
df$importer <- df$Importer
df$total_value_bk <- df$Total_Value
df$total_value <- as.numeric(gsub('[$,",]', '', df$total_value_bk))
df$quantity <- df$Quantity

df$price_invoice <- df$total_value/df$quantity

df <- df[, c("date", "description", "origin_country",
             "supplier", "importer", "price_invoice", "quantity", "total_value")]

df100 <- fread("/home/gagan/Desktop/soc_ace_2024/data/exportgenius/gold/russia/Russia-MirrorImport-Gold.csv")

df100$date <- dmy(df100$Date)
df100$description <- df100$Product_Description
df100$origin_country <- df100$Origin_Country
df100$supplier <- df100$Supplier
df100$importer <- df100$Importer
df100$total_value <- (df100$Total_Value)
df100$total_value <- as.numeric(gsub('[$,",]', '', df100$total_value))
df100$quantity <- df100$Quantity
df100$price_invoice <- df100$total_value/df100$quantity
df100 <- df100[, c("date", "description", "origin_country",
                   "supplier", "importer", "price_invoice", "quantity",
                   "total_value")]

df200 <- df

df <- rbind(df, df100)

df02 <- fread("~/Desktop/soc_ace_2024/scripts/exportgenius/gold_analyses_latest/goldprice.csv")
df02$date <- ymd(df02$date)
df <- merge(df, df02, by = "date")
df$price_benchmark <- as.numeric(df$price_gram)

# df[sapply(df, is.infinite)] <- NA
# df <- df[!(df$price_invoice > 1000),]
df <- df[!(df$price_invoice > 1000),]

plot01 <- ggplot(df, 
                 aes(x = date, 
                     y = total_value)) +
  geom_line() +
  geom_point() +  
  # ylim(15, 120) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  labs(title = "Russia Gold Imports", 
       x = "Date", 
       y = "Total Value") +  
  theme_bw() 

# plot01


plot03 <- df %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+   
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~origin_country, ncol = 2)+
  labs(title = "Russia Gold Imports by Origin", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

# plot03

df$price_invoice <- as.numeric(df$price_invoice)
df$price_benchmark <- as.numeric(df$price_benchmark)
df$price_difference <- as.numeric(df$price_invoice - df$price_benchmark)
df03 <- df[, c("date", "price_invoice", "price_benchmark")]

df_long <- reshape2::melt(df03, 
                          id.vars = "date", 
                          variable.name = "price_type", 
                          value.name = "price")

#summary(df$price_difference)
df$price_difference <- ifelse(df$price_difference == Inf, 0, df$price_difference)
#summary(df$price_difference)

df$price_difference2 <- scale(df$price_difference)
#summary(df$price_difference2)
df$price_benchmark2 <- scale(df$price_benchmark)
#summary(df$price_difference2)

# df <- df[, df$price_difference2]
df <- df[df$price_difference2 != max(df$price_difference2, na.rm = TRUE)]

plot04 <- ggplot(df, aes(x = date, 
                         y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Imports: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) 

# plot04

plot05 <- ggplot(df, aes(x = date, 
                         y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Imports by Origin: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~origin_country, 
             ncol = 2)

# plot05

df$importer <- ifelse(df$importer == "manetti ooo", "MANETTI LLC", 
                      ifelse(df$importer == "ostec integra ltd", "OSTEK INTEGRA LLC", 
                             ifelse(df$importer == "yugstroyrazvitie ooo", "YUGSTROYRAZVITIE LLC",
                                    ifelse(df$importer == "lls tlf", "TLF LLC",
                                           df$importer))))

plot06 <- ggplot(df, aes(x = date, 
                         y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Imports by Importing Company: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~importer, 
             ncol = 4)

# plot06

df$supplier <- ifelse(df$supplier == "ap verona srl", "AP VERONA SRL", 
                      ifelse(df$supplier == "ap verona srl via terminal uab continexus vilnius lt", "AP VERONA SRL",
                             ifelse(df$supplier == "ap verona srl via uab terminal continexus vilnius lt", "AP VERONA SRL",
                                    ifelse(df$supplier == "giusto manetti battiloro spa via terminal uab continexus vilnius lt", "giusto manetti battiloro spa",
                                           ifelse(df$supplier == "inter trans sp zoo by order uab victoria lux kirtimu g 47b vilnius lithuania", "inter trans sp zoo",
                                                  ifelse(df$supplier == "inter trans sp zoo c o bma spedition gmbh", "inter trans sp zoo",
                                                         ifelse(df$supplier == "INTER-TRANS SP. Z OO", "inter trans sp zoo",
                                                                ifelse(df$supplier == "jg eytzinger gmbh", "JG EYTZINGER GMBH",
                                                                       ifelse(df$supplier == "jg eytzinger gmbh hansastrasse 15 schwabach de", "JG EYTZINGER GMBH",
                                                                              ifelse(df$supplier == "jg eytzinger gmbh hansastrasse 15 schwabach de 91126", "JG EYTZINGER GMBH", 
                                                                                     ifelse(df$supplier == "sl international gmbh c o well life trading co unit e29 flegend tower7 shing yip streetkwun tongkowloonhong kong", "sl international gmbh",
                                                                                            ifelse(df$supplier == "uab magletis", "UAB MAGLETIS",
                                                                                                   ifelse(df$supplier == "well life enterprise co on behalf new horizon trading ltd", "well life enterprise co",
                                                                                                          ifelse(df$supplier == "well life enterprise co on behalf too kbr technology", "well life enterprise co", 
                                                                                                                 df$supplier))))))))))))))

plot07 <- ggplot(df, aes(x = date, 
                         y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Gold Imports by Selling Company: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~supplier, 
             ncol = 4)

# plot07

plot01

Code
plot03

Code
plot04

Code
plot05

Code
plot06

Code
plot07

Section 2. Tobacco

Tobacco: Exports

Code
rm(list = ls())

df <- fread("/home/gagan/Desktop/soc_ace_2024/data/exportgenius/tobacco/russia/Russia-DetailedExport-Tobacco.csv")
df$date <- dmy(df$Date)

df$description <- df$`Product Description`
df$destination_country <- df$`Destination Country`
df$exporter <- df$Exporter
df$buyer <- df$Buyer
df$quantity <- df$Quantity
df$total_value <- df$`Total Value USD`
df$price_invoice <- df$total_value/df$quantity

df02 <- fread("~/Desktop/soc_ace_2024/scripts/exportgenius/gold_analyses_latest/goldprice.csv")
# head(df02$date)
df02$date <- ymd(df02$date)
df <- merge(df, df02, by = "date")
df$price_benchmark <- df$price_gram

df$price_difference <- as.numeric(df$price_invoice - df$price_benchmark)
df$price_invoice <- ifelse(df$price_invoice == Inf, NA, df$price_invoice)
df <- df[!is.na(df$price_invoice), ]
df$price_difference2 <- as.numeric(scale(df$price_difference))
df <- df[df$price_difference2 < 3, ]

df <- df[, c("date", "description", "destination_country", 
             "exporter", "buyer", "quantity", "price_invoice", "total_value", 
             "price_benchmark", "price_difference", "price_difference2")]

plot01 <- ggplot(df, 
                 aes(x = date, 
                     y = total_value)) +
  geom_line() +
  geom_point() +  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  # ylim(15, 120) +
  labs(title = "Russia Tobacco Exports", 
       x = "Date", 
       y = "Total Value") +  
  theme_bw() 

plot01

Code
### Top 20 countries:
a <- as.data.frame(table(df$destination_country))

frequency_table <- df %>%
  count(destination_country, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file
kable(frequency_table, 
      format = "html", 
      caption = "Russia Tobacco Exports",
      table.attr = "class='table table-striped'") %>%
  kable_styling(full_width = FALSE)
Russia Tobacco Exports
destination_country Frequency
Ukraine 960
Unknown 613
Mongolia 514
Serbia 483
Germany 371
Iraq 242
Libya 185
China 157
Abkhazia 131
Japan 93
United Arab Emirates 81
Moldova 80
Azerbaijan 78
Philippines 77
Netherlands 69
Latvia 60
Montenegro 52
Georgia 43
40
Hong Kong 38
South Ossetia 36
Albania 35
Svalbard and Jan Mayen 25
Qatar 21
Netherlands Antilles 20
Poland 20
Bosnia and Herzegovina 19
Egypt 19
Kuwait 15
Lebanon 15
Norway 12
Oman 12
Mexico 11
South Korea 11
Tajikistan 11
Uzbekistan 11
Saudi Arabia 10
Turkey 10
Russia 8
Singapore 8
Gambia 7
India 7
Romania 6
Afghanistan 5
Bulgaria 5
Greece 5
Indonesia 4
Estonia 3
Liberia 3
Panama 3
United Kingdom 3
Algeria 2
Angola 2
Austria 2
Cambodia 2
Lithuania 2
Madagascar 2
Belarus 1
Brazil 1
Macedonia 1
Marshall Islands 1
Switzerland 1
United States of America 1
Code
df500 <- df[df$destination_country %in% c("Ukraine", "Unknown", "Mongolia", "Serbia", 
                                          "Germany", "Iraq", "Libya", "China", 
                                          "Abkhazia", "Japan", "United Arab Emirates", "Moldova", 
                                          "Azerbaijan", "Philippines", "Netherlands", "Latvia", 
                                          "Montenegro", "Georgia", "Hong Kong", "South Ossetia"), ]

plot03 <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~destination_country, ncol = 4)+
  labs(title = "Russia Tobacco Exports by Destination (top 20)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03

Code
### Top 20 exporters:
b <- as.data.frame(table(df$exporter))

df$exporter <- ifelse(df$exporter == "ALTAI LOGISTIC OUTSOURCING LLC", "ALTAI LLC",
                      ifelse(df$exporter == "BALTIC TOBACCO FACTORY SEPARATE UNIT BTF LLC", "BALTIC TOBACCO FACTORY LLC",
                             ifelse(df$exporter == "CJSC PACIFIC MARINE SHIPLEND", "CJSC",
                                    ifelse(df$exporter == "CJSC LENRIANTA", "CJSC",
                                           ifelse(df$exporter == "CJSC AEROMAR", "CJSC",
                                                  ifelse(df$exporter == "DON TOBACCO FACTORY LLC", "DON TOBACCO",
                                                         ifelse(df$exporter == "DON DUTY FREE LLC", "DON TOBACCO",
                                                                ifelse(df$exporter == "DZH T I DON S TOBACCO LLC", "DZH T I DONSKOY TOBACCO LLC",
                                                                       ifelse(df$exporter == "HERMES M LLC", "HERMES LLC",
                                                                              ifelse(df$exporter == "IMPERIAL TOBACCO VOLGA LLC", "IMPERIAL TOBAKKO VOLGA LLC",
                                                                                     ifelse(df$exporter == "INTER LES LLC", "INTER LLC",
                                                                                            ifelse(df$exporter == "NATIONAL LOGISTIC COMPANY ON ORDER OF JSC DONSKOY TABAK LLC", "NATIONAL LOGISTIC COMPANY",
                                                                                                   ifelse(df$exporter == "NATIONAL LOGISTIC COMPANY P P JSC DONSKOY TABAK LLC", "NATIONAL LOGISTIC COMPANY",
                                                                                                          ifelse(df$exporter == "NATIONAL LOGISTIC COMPANY P P LLC", "NATIONAL LOGISTIC COMPANY",
                                                                                                                 ifelse(df$exporter == "PARTNER LLC", "PARTNER LOGISTIC LLC",
                                                                                                                        ifelse(df$exporter == "PETRO LLC", "PETRO LUB LLC",
                                                                                                                               ifelse(df$exporter == "PHILIP MORRIS IZHORA THROUGH CJSC ALERS RUS 198323 LENINGRAD OB LOMONOSOVSKY R PR ZONE GORELOVO KV L 5 VOLKHONSKOE SH 2 A CJSC", "PHILIP MORRIS IZHORA",
                                                                                                                                      ifelse(df$exporter == "PHILIP MORRIS IZHORA THROUGH LLC ALERS TLR L O INDUSTRIAL ZONE GORELOVO KV 5 VOLKHONSKOE SH 2A JSC", "PHILIP MORRIS IZHORA",
                                                                                                                                             ifelse(df$exporter == "PHILIP MORRIS IZHORA JSC", "PHILIP MORRIS IZHORA", df$exporter)))))))))))))))))))

frequency_table <- df %>%
  count(exporter, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file
kable(frequency_table, 
      format = "html", 
      caption = "Russia Tobacco Exports: Exporting Companies",
      table.attr = "class='table table-striped'") %>%
  kable_styling(full_width = FALSE)
Russia Tobacco Exports: Exporting Companies
exporter Frequency
PETRO LUB LLC 1004
DZH T I ELETS LLC 648
USM OP BAGRATIONOVSK LLC 448
UNION TOBACCO FACTORI LLC 403
IMPERIAL TOBAKKO VOLGA LLC 295
BALTIC TOBACCO FACTORY LLC 217
PARTNER LOGISTIC LLC 182
DZH T I DONSKOY TOBACCO LLC 148
GULBAKHAR RUS LLC 122
PHILIP MORRIS IZHORA 94
DONSKOY TOBACCO JSC 81
PRODEXPO LLC 76
DON TOBACCO 68
NT LLC 67
DUTY FREE ALLIANCE LLC 53
J T I DONSKOY TABAK LLC 47
SDF LLC 39
BRITISH AMERICAN TOBACCO SPB JSC 34
JOINT ENTERPRISE SOYUZ HERMES 2010 LLC 34
KT INTERNATIONAL MARKETING AND DISTRIBUTION LLC 31
IP SIKHARULIDZE TIMUR AVTANDILOVICH 29
BALTIC SITURISTIC AND DUTY FREE SERVICE LLC 26
RENTRANS SIA 25
SDS LLC 25
AGRO LUKRUM GENERANDI RUS LLC 23
KUSMICH HOPE CONSTANTINOVNA 23
USM LLC 22
TUAPSINSKAYA SHIPCHANDLERSKAYA COMPANY LLC 20
TOBACCO COMPANY PEPPELL LLC 19
FILIP LLC 18
FSUE STATE TRUST ARKTIKUGOL 17
OJSC USMAN TOBACCO 17
EXPORT TRADE LLC 16
GOLDMAIN LLC 16
GRAFITEL MEZ LLC 16
VARIANT LLC 16
CJSC 15
CT INTERNATIONAL MARKETING AND DISTRIBUTION LLC 15
HERMES LLC 15
FGUP GT ARKTIKUGOL 14
OVERSIZ SERVICES LLC 14
CASPIY DUTY FREE LLC 13
AERO REGION JSC 12
ELANIT LLC 12
INDIVIDUAL ENTREPRENEUR KUZMICH NADEZHDA KONSTANTINOVNA 12
FRIHAUS LLC 11
MORTEN LOGISTIC LLC 11
NORD TRADE IMPEX LLC 11
NOVOSHIPSERVICE LLC 11
TRAVEL RETAIL SAINT PETERSBURG LLC 11
ALERS TLR LLC ON ORDER OF PHILIP MORRIS IZHORA JSC 9
NORTEK LLC 9
BELGOROD DUTY FREE LLC 8
PORT ALLIANCE JSC 8
PASIFIK MARIN TROLERS LLC 7
TPK YUG POVOLZHYA LLC 7
TRANSPORTATION AND INDUSTRIAL COMPANY YUG POVOLZHYA LLC 7
IP LANKO IGOR ADOLFOVYCH 6
NATIONAL LOGISTIC COMPANY 6
REGSTAER M LLC 6
YUG DUTY FREE JSC 6
IP KUZMICH NADEZHDA KONSTANTINOVNA 5
POGAR CIGARETTE AND CIGAR FACTORY JSC 5
VOSTOK DUTY FREE LLC 5
JOINT STOCK COMPANY POGAR CIGARETTE AND CIGAR FACTORY 4
MAJOR CARGO SERVICE ON ORDER OF KABAKOV SERGEY MIKHAILOVICH LLC 4
ALTAI LLC 3
BST COMPANY LLC 3
GRAFIT LLC 3
INTER LLC 3
KONONOV VYACHESLAV ANATOLIEVICH SP 3
DSS EXPORT LLC 2
ENERGORESURS SERVICE LLC 2
KARAKULOV VASILY MIKHAILOVICH 2
MORSNABSERVICE LLC 2
NEW LINE LLC 2
PARUS LLC 2
PASIFIC MARINE SHIPLAND CJSC 2
QUARTZ LLC 2
SEVRYBKOMFLOT LLC 2
SPK RK BELOMORSKIY RYBAK 2
VOSHOD FOR JSC PHILIP MORRIS IZHORA LLC 2
ALBATROS LLC 1
AQUA PLUS LLC 1
AZIMUTA SUPLAY LLC 1
DINAMIS LLC 1
ELITE LINE LLC 1
EXPRESS CARGO LLC 1
FISHERMAN S ARTEL KOLKHOZ NAMED AFTER 50 YEARS OF OCTOBER 1
FISHING KOLKHOZ VOSTOK 1 JSC 1
GLO INVEST LLC 1
INTERNATIONAL TOBACCO MARKETING SERVICES JSC 1
JV LLC GOLD MONT 1
KALUGA TOBACCO FACTORY LLC 1
KALUZHSKAYA TABACHNAYA FABRIKA LLC 1
LEX TOBACO COMPANY LLC 1
MERCURY BMRT EGLINE LLC 1
MURMANSK BRANCH FSUE GT ARKTIKUGOL 1
NAYADA SHIPCHANDLER LLC 1
PALSTEVE OU PEETRI 11 76805 PALDISKI ESTONIA ON BEHALF OF ULTIMATE INVESTMENTS HOUSE GMBH 1
PJSC NAKHODKINSKAYA BASE OF ACTIVE MARINE FISHING 1
RK VIRMA LLC 1
RSH START SELENGA SOLARIS LLC PARUS 1
RYBOLOV SERVICE LLC 1
SHIPCHANDLER LLC 1
SP KOZLOVSKAYA VERA KONSTANTINOVNA 1
SP KUZMICH NADEZHDA KONSTANTINOVNA 1
SP KUZNETSOV VADIM MIKHAILOVICH 1
TOBACCO CHERNOZEMYA LLC 1
TRADING FACTORIA LLC 1
VK TOBACCO FZE PLOT NO E5 RAKEZ FREE ZONE AL JAZEERAH AL HAMRA INDUSTRIAL ZONE 1
WAVE LLC 1
Code
## Extract first twenty companies:
l1 <- frequency_table[1:20, "exporter"] %>% as.vector()
df500 <- df[df$exporter %in% l1$exporter, ]

plot03a <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~exporter, ncol = 4)+
  labs(title = "Russia Tobacco Exports by Exporting Company (top 20)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03a

Code
### Top 20 buyers:
frequency_table <- df %>%
  count(buyer, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file
kable(frequency_table, 
      format = "html", 
      caption = "Russia Tobacco Exports: Buying Companies",
      table.attr = "class='table table-striped'") %>%
  kable_styling(full_width = FALSE)
Russia Tobacco Exports: Buying Companies
buyer Frequency
jt international germany gmbh 330
llc voltam 297
jt international ad senta 264
xxk voltam 187
llc omega 2018 173
delta el sahel co 125
al qerat company for trading & comercial agencies 114
null 107
imperial tobacco scg doo 93
philip morris operations ad nis 91
north star company 82
jam de rijk bv 80
jt international philippines inc 77
llc luganskaya meat distribution company 73
llc good ex 71
ooo omega 2018 67
llc apsny dyu te 61
fortunate investments ltd 60
oooapsny dyu te 60
llc dynamis 58
jt international trading srl 56
llc decameron on order 54
plus doo 52
llc abkhaztorg 47
llc global export 47
llc inteb corporation ltd 46
llc inter torg 46
llc mix 2018 44
vektor cjsc on order of imperial tobacco international ltd 40
ooo good ex 39
llc luch on order 37
jt international germany gmb 36
primall sh pk 34
prior decisions lp limited partnership 34
sentimo ltd 34
llc ahra 2006 33
llc tobacco import 32
ooo luch 30
llc dinamis 28
llc ari plus 27
ahra 2006 llc 26
ultimate investments house gmbh 25
al oufouk co 24
jt japan tobacco inc 24
llc apsny dew tee 24
abkhaztorg llc 23
fire bird distribution fze 23
llc luch 22
ooo miks 2018 22
ari plus llc 21
british american tobacco see doo 21
prior decisions lp a limited partnership 21
sulaiman al haj haider & sons company 21
hong kong friend internationalcooperation co ltd 20
llc apsny du ti 20
llc mak import 20
llc sdf 20
llc omega 2018 on order 19
nelt doo 19
sdf llc 19
tripolis for import and distribute of cigarettes ltd 19
llc luch on order of llc initial ltd republic of yuzhnaya ossetia 1m/s01 g tskhinval str heroev d 1 18
ooo apsny dyu te 18
unknown 18
ir trans service ltd 17
japan tobacco inc 17
jti caucasus llc 17
llc beam on order 17
llc apsny car 16
llc decameron on order of llc initial ltd republic of yuzhnaya ossetia 1m/s01 g tskhinval str heroev d 1 16
mine barentsburg fsue state trust arktikugol 16
pboyul dikiy alexander anatolyevich 16
barentsburg mining fgup state trust arcticugol 15
decameron llc 15
eliz group llc 15
global export llc 15
manchester shipping llc 15
bustan al wataniya trading company wll behind centerpoint store 14
llc elite line 14
llc lugansk meat distribution company 14
llc naita plus 14
llc decameron on order of llc initial ltd 13
llc lmdc 13
ooo inter torg 13
regie co interessee libanaise des tabacs et tombacs sa 13
alqerat company for trading & comercial agencies 12
dufry supply and logistics fze sia vingo latvia lv 2167 celinieki marupes novads selu 22 2 12
hongkong henge trading co ltd 12
llc alliance opt 12
llc decameron 12
ooo global export 12
abh tobacco company llc 11
ahmadi trading company llc 11
dufry international ag 11
international transportation fara ferest arya co 11
japan tobacco international mexico s de rl de cv sb logistics sa de cv 11
llc luch on order of llc initial ltd 11
llc trading house 11
llc tsahiur 11
sia baltic container terminal on behalf of gebr heinemann se&co kg 11
opt torg llc 10
vektor cjsc on order of imperial tobacco international gmbh 10
abkhazia excise duty warehouse aliot llc by order prior decisions lp limited partnership 9
imeks co ltd on order of imperial tobacco international ltd 9
philip morris operations adnis 9
excise duty warehouse ilyichevskvneshtrans pjsc by order of prior decisions lp a limited partnership 8
jan de rijk logistik nl 8
khoshnaw company for commercial investment 8
llc almavis 8
ltd vpt logistics services for vneshposyltorg ltd 8
ooo abkhaztorg 8
philip morris sales & marketing llc 8
prior decisions limited partnership 8
rs international trade pte ltd 8
turamax corporation ltd 8
afro nut company ltd 7
al saf agences trading est 7
global business company llc by order of prior decisions 7
multi profile enterprise export import customs warehouse weidlate e r a 7
vektor cjsc on order of imperial tobacco international gmbh in accordance with the contract of 10 07 2018 7
independent tax free shops for general trading 6
jti turon inc fe llc 6
llc pasifik marin trolers pb vladivostok 2m/s 6
philip morris japan ltd 6
vingo ltd 6
vivat trade group sro 6
ahmadullah ali oghlu company ltd 5
customs warehouse mono 5
jt international romania srl 5
llc dyhamis 5
llc tabak import 5
multidiscipline enterprise export import customs warehouse weidlate e r a 5
steinweg sharaf fzco 5
abh tobacco company llc by order of prior decisions 4
dinamis llc 4
joh wilh von eicken gmbh 4
llc lugansk logistic company 4
llc trading house pegasus 4
new way trade hungary kft 4
north china industry development 4
shada company for general trading and agencies of trading ltd 4
sia frigo baltics by order prior decisions lp sia bcls as agent 4
world tobacco middle east 2022 c o mm global logistics llc 4
al tag al muzda er co for t e import and export of food tabacco and derivatives 3
altai llc 3
bm cargo eood 3
capricorn marine service ltd 3
cigalah group 3
hhc voltam terminal code tuushin 010843 3
landbridge company for voltam llc 3
llc altai 3
llc apsny kar 3
llc asia tobacco trading 3
llc flagman duty 3
llc lee frand 3
ltd liability company inteb corporation ltd 3
multi profile enterprise exportimport customs warehouse wideleit e r a 3
ooo eliz group 3
ooo tobacco import export 3
philip morris sales & marketing srl 3
silverman llc 3
vektor cjsc by imperial tobacco international ltd 3
aliot llc 2
austria tabak gmbh 2
coalimex resources lp 2
consup the egyptian marine supply and contracting co 2
dspsg logistics co ltd 2
eleftheria paraschaki 2
elite line llc 2
hcc voltam 2
jsc sadaf trade 2
jt international korea inc c o duckpyung logistics co ltd 2
jt international sa 2
k os naw company for commercial investment 2
kt&g 2
llc ahra2006 2
llc astoria 2
llc dekameron on order of llc initial ltd 2
llc esd s 2
llc omega 2018 on order of llc osnova 2
llc russian ship mk 0312 oksino 2
llc salamandra 2
llc trade yug 20 17 2
llc tsakhiur 2
long coast logistics elie abou jaoude 2
marine fishing russian vessel ak 0752 baiga llc consent 2
nort star company 2
ooo salamandra 2
ooo temza 2
phu depo sp zoo on order of nautilus unitrade ltd 103 sham peng tong plaza victoriamahe seychelles 2
primall shpk 2
pro team doo on behalf of plus doo 2
pt bentoel prima 2
rothmans far east bv korea branch office 2
russian vessel mk 0641 nord tral spk rk belomorskiy rybak 2
russian vessel sp 4794 arctic lion llc defa fishing 2
sadaf trade cjsc 2
sia frigo baltic by order altai llc sia bcls as agent 2
sky sea freight international llc 2
t akiyama & co 2
tanco llc 2
tc megapolis tajikistan llc 2
uab aviacijos paslaugu centras 2
vektor cjsc on designation of imperial tobacco international gmbh in accordance with the contract dated 07 10 2018 2
voltam llc 2
white clouds ltd 2
adm baltik tranzits sia 1
ahmadi trading company spc 1
al oufouk co llc 1
almas al malaki co ltd 1
asia tobacco trading llc 1
astoria llc 1
bmrt petrapavlovsk paonbamr 1
british american tobacco globe house 1
bustan al wataniya trading company behind centerpoint store 1
capricorn marine service ltd for mt ps dream panama 1
capricorn marine service ltd for mt rineia bahamas 1
cjsc pacific marine shipland str rockall str champion 1
cjsc pasific marine shipland str champion 1
ctk 1 llc on order of ureysha duty free trade limited llc hong kong koulon mongkok nathan road room 1402a 14th floor belgen bank 1
firma gebr heinemann se&co kg 1
fishing artel collective farm named after the 50th anniversary of october batm tumnin 1
fop kolody igor borisovych 1
gulbahar tobacco international fze 1
hazinai osie llc 1
helix international fze 1
huoerguosi shanglin international trade co ltd 1
imperial yug llc 1
international liquor & tobacco trading 1
jsc fishing kolkhoz vostok 1 kp pasifik orion 1
jsc fishing kolkhoz vostok 1 yams vostok 3 1
jti polska sp zoo 1
kt international sa 1
llc abaza trade ognr 121ram/s513 inn 11019213 kpp 311m/s445 1
llc abhaztorg 1
llc albatros co ltd for rsh emiralda 1
llc aliot 1
llc apsny dew ti 1
llc aurora 1
llc ctk 1 po porucheniu llc yuresha duty free trade limited 14th floor 14th floor beljen bank nathan road mong kok kowloon hong kong 1
llc elise group 1
llc eliz group 1
llc industrial vessel selenga 1
llc industrial vessel solaris 1
llc khazinai osie 1
llc mercury bmrt butovsk pacific ocean eez 1
llc omega 2012 1
llc opt torg 1
llc pacific marine trollers pb vladivostok 2m/s 1
llc perspective 1
llc platinum trade group 1
llc st megapolis tajikistan 1
llc temza 1
llc tobacco import export 1
llc trading company megapolis tajikistan 1
marine fishing russian vessel in the fishing sp 5018 kem llc rk virma 1
master logistics and freight services fzco 1
mine barentsburg fsue state trust arcticugol 1
mm global logistics llc c o world tobacco show 2022 1
mnogoprofile enterprise export import customs warehouse weidlate e r a 1
multidisciplinary enterprise export import custom warehouse widleit e r a 1
newaves general trading fzco 1
ooo apsny dew ti 1
ooo arttobacco 1
ooo don duty free 1
ooo dvd group 1
ooo lugansk meat distribution company 1
ooo uvesta company 1
oooapsny dyu ti 1
p ilip morris operations ad nis 1
p ilip morris operations adnis 1
p ilip morris singapore pte ltd 1
philip morris singapore pte ltd 1
prima mk doo 1
rsh start rsh selenga llc parus 1
russian ship sp 4326 belomorsk llc rk virma 1
russian vessel m 0223 polar researcher m 0252 gleisher enterprise m 0259 diomidis m 0263 atka enterprise cjsc arktikservice 1
salamandra llc 1
sea fishing russian vessel mk 0411 taurus jsc taurus 1
sia sanitex 1
souza cruz ltda 1
steinweg s araf fzco 1
stroykom llc 1
temza llc 1
tk megapolis tajikistan llc 1
trans georgia llc 1
treff tabako doo 1
tsakhiur llc 1
vektor cjsc by order of imperial tobacco international gm in accordance with the contract dated 07 10 2018 1
vektor cjsc on designation of imperial tobacco international gm in accordance with the contract dated 07 10 2018 1
vektor cjsc on order of imperial tobacco international gmbh in accordance with the contract dated 07 10 2018 1
world tobacco middle east 2023 c o mm global logistics llc 1
xxk voltam terminal code tuushin 010843 1
zao pasifik marin shipland str champion 1
Code
## Extract first twenty companies:
l1 <- frequency_table[1:20, "buyer"] %>% as.vector()
df500 <- df[df$buyer %in% l1$buyer, ]

plot03a <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~buyer, ncol = 4)+
  labs(title = "Russia Tobacco Exports by Buying Company (top 20)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03a

Code
df <- df[df$price_difference2 < 1.5, ]

plot04 <- ggplot(df, aes(x = date, 
                         y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  # ylim(-0.5, 2)+
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Tobacco Exports: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) 

plot04

Code
## Extract first twenty destinations:
frequency_table <- df %>%
  count(destination_country, name = "Frequency") %>%
  arrange(desc(Frequency))

l1 <- frequency_table[1:20, "destination_country"] %>% as.vector()
df500 <- df[df$destination_country %in% l1$destination_country, ]

plot03a <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~destination_country, ncol = 4)+
  labs(title = "Russia Tobacco Exports by Destination (top 20)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

# plot03a


plot05 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Tobacco Exports by Destination: Price Differentials Over Time (top 20)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~destination_country, 
             ncol = 4)

plot05

Code
### Top 20 Exporting Companys:

frequency_table <- df %>%
  count(exporter, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file

## Extract first twenty companies:
l1 <- frequency_table[1:20, "exporter"] %>% as.vector()
df500 <- df[df$exporter %in% l1$exporter, ]

plot06 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Tobacco Exports by Exporting Company: Price Differentials Over Time (top 20)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~exporter, 
             ncol = 4)

plot06

Code
### Top 20 Buying Companys:

frequency_table <- df %>%
  count(buyer, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file

## Extract first twenty companies:
l1 <- frequency_table[1:20, "buyer"] %>% as.vector()
df500 <- df[df$buyer %in% l1$buyer, ]

plot07 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Tobacco Exports by Buying Company: Price Differentials Over Time (top 20)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~buyer, 
             ncol = 4)

plot07

Tobacco: Imports

Code
rm(list = ls())

pacman::p_load(readxl, vtable, tidyverse, 
               lubridate, data.table, zoo, 
               readODS, patchwork)


df <- fread("/home/gagan/Desktop/soc_ace_2024/data/exportgenius/tobacco/russia/Russia-DetailedImport-Tobacco.csv")

df$date <- dmy(df$Date)

df$date <- df$date
df$description <- df$`Product Description`
df$origin_country <- df$`Origin Country`
df$supplier <- df$Supplier
df$importer <- df$Importer
df$price_invoice <- df$`Total Value USD`/df$Quantity
df$total_value <- df$`Total Value USD`

df <- df[, c("date", "description", "origin_country",
             "supplier", "importer", "price_invoice", "total_value")]

df02 <- fread("~/Desktop/soc_ace_2024/scripts/exportgenius/gold_analyses_latest/goldprice.csv")
df02$date <- ymd(df02$date)
df <- merge(df, df02, by = "date")
df$price_benchmark <- df$price_gram

#df[sapply(df, is.infinite)] <- NA

df <- df[!(df$price_invoice > 1000),]

df$price_difference <- df$price_invoice - df$price_benchmark
df$price_difference2 <- scale(df$price_difference)
df$price_benchmark2 <- scale(df$price_benchmark)
df <- df[df$price_difference2 < 3, ]


df$importer <- ifelse(df$importer == "PHILIP MORRIS IZHORA THROUGH CJSC ALERS RUS 198323 LENINGRAD OB LOMONOSOVSKY R PR ZONE GORELOVO KV L 5 VOLKHONSKOE SH 2 A CJSC", 
                      "PHILIP MORRIS IZHORA", 
                      ifelse(df$importer == "PHILIP MORRIS IZHORA THROUGH LLC ALERS TLR L O INDUSTRIAL ZONE GORELOVO KV 5 VOLKHONSKOE SH 2A JSC", 
                             "PHILIP MORRIS IZHORA", 
                             ifelse(df$importer == "PHILIP MORRIS IZHORA JSC", "PHILIP MORRIS IZHORA", df$importer)))

df$origin_country <- ifelse(df$origin_country == "EUROPIEAN UNION", 
                            "European Union", df$origin_country)
Code
plot01 <- ggplot(df, 
                 aes(x = date, 
                     y = total_value)) +
  geom_line() +
  geom_point() +  
  # ylim(15, 120) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  labs(title = "Russia Tobacco Imports", 
       x = "Date", 
       y = "Total Value") +  
  theme_bw() 

plot01

Code
### Top 20 Origin:

frequency_table <- df %>%
  count(origin_country, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file
kable(frequency_table, 
      format = "html", 
      caption = "Russia Tobacco Imports",
      table.attr = "class='table table-striped'") %>%
  kable_styling(full_width = FALSE)
Russia Tobacco Imports
origin_country Frequency
Germany 2656
Poland 1070
Lithuania 892
Ukraine 889
Switzerland 521
Turkey 164
Russia 155
Romania 139
Bulgaria 118
United Arab Emirates 90
Luxembourg 68
Uzbekistan 49
Netherlands 37
South Korea 32
Brazil 30
Serbia 30
Indonesia 27
Spain 19
United Kingdom 19
Finland 18
France 18
United States of America 14
Belgium 13
New Zealand 12
Armenia 9
Belarus 9
Unknown 8
China 7
Czechia 7
Monaco 6
Greece 5
Taiwan 5
Ireland 3
Latvia 3
Chile 2
European Union 2
Hong Kong 2
Sweden 2
India 1
Italy 1
Moldova 1
Code
## Extract first twenty:
l1 <- frequency_table[1:20, "origin_country"] %>% as.vector()
df500 <- df[df$origin_country %in% l1$origin_country, ]

plot33 <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~origin_country, ncol = 4)+
  labs(title = "Russia Tobacco Imports by Origin (top 20)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot33

Code
l1 <- frequency_table[1:8, "origin_country"] %>% as.vector()
df500 <- df[df$origin_country %in% l1$origin_country, ]

plot33 <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~origin_country, ncol = 2)+
  labs(title = "Russia Tobacco Imports by Origin (top 8)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot33

Code
### Top 20 importers:
b <- as.data.frame(table(df$importer))
 
frequency_table <- df %>%
  count(importer, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file
kable(frequency_table, 
      format = "html", 
      caption = "Russia Tobacco Imports: Importing Companies",
      table.attr = "class='table table-striped'") %>%
  kable_styling(full_width = FALSE)
Russia Tobacco Imports: Importing Companies
importer Frequency
PHILIP MORRIS IZHORA 963
PECHORSK BRANCH JSC KAPO DUTY FREE 550
MEOTIDA LLC 456
VARIANT LLC 423
DON DUTY FREE LLC 417
PARTNER LLC 417
DUTY FREE ALLIANCE LLC 363
TSVETOCHNOE LLC 312
FLOWER LLC 258
KAPO DUTY FREE JSC 217
TABAKONIST LLC 215
REGSTAER M LLC 213
ELANIT LLC 167
TRAVEL RETAIL DOMODEDOVO LLC 147
PARTNER LOGISTIC LLC 142
QUARTZ MASTER LLC 123
QUARTZ LLC 119
BALTIC TOBACCO FACTORY LLC 96
REGSTAER SP LLC 94
NORTH WHOLESALE COMPANY LLC 92
DUFRI EAST DOMODEDOV BRANCH LLC 89
DERA VLADIVOSTOK LLC 86
AERO REGION JSC 76
LENRIANTA JSC 70
FILIP LLC 65
HERMES LLC 63
BELGOROD DUTY FREE LLC 62
IMPERIAL DUTY FREE JSC 62
TRAVEL RETAIL SHEREMETYEVO LLC 58
NUANCE BAZEL LLC 57
WHITE GORA LLC 56
AMBASSADOR DF LLC 55
PARTNER FOR ZAO URALBROYLER CHELYABINSK REGION ARGAYASH DISTRICT ISHALINO LLC 43
KENIGSBERG TRADING LLC 41
INTERNATIONAL TOBACCO MARKETING SERVICES JSC 39
NARATAISKIY LESPROMKHOZ OJSC 38
BRITISH AMERICAN TOBACCO SPB JSC 36
AEROTREYDM LLC 35
KEY TI EN JI GLOBAL RUS LLC 31
PHILIPP LLC 27
VOSTOK DUTY FREE LLC 26
URAL DUTY FREE LLC 21
INVESTMENT COMPANY OLYMPUS LLC 20
BALTIC SITURISTIC AND DUTY FREE SERVICE LLC 14
CAPO DUTY FREE JSC 14
YUG DUTY FREE JSC 14
BRANCH LLC VARIANT 13
TRAVEL RETAIL SAINT PETERSBURG LLC 13
BRANCH AIRPORT KHABAROVSK LLC VARIANT 12
IRKUTSK DUTY FREE LLC 12
AVANTAGE LLC 11
CASPIY DUTY FREE LLC 11
DELVENTA LLC 11
AERO TRADE LLC 9
FRIHAUS LLC 9
VARIANT BRANCH POKROVKA LLC 8
AERO REGION CJSC 7
BALTIC TOBACCO FACTORY SEPARATE UNIT BTF LLC 7
BYRON LLC 7
KAZAN DUTY FREE LLC 7
SPECIALIZED SUPPORT LLC 7
FREE TRADE VLADIVOSTOK LLC 6
PETRO LUB LLC 5
CJSC AEROMAR 3
PORT ALLIANCE MINERAL WATERS LLC 3
RVSH LLC 2
ALL RUSSIAN RESEARCH INSTITUTE OF TOBACCO SHAG & TOBACCO PRODUCTS 1
BELG DUTY FREE LLC 1
BLACK SMOK LLC 1
EUROTABAK LLC 1
GULBAKHAR RUS LLC 1
INVESTMENT COMPANY OLYMP LLC 1
STAR NORTH WEST LLC 1
TNS MITS JSC 1
Code
## Extract first twenty companies:
l1 <- frequency_table[1:20, "importer"] %>% as.vector()
df500 <- df[df$importer %in% l1$importer, ]

plot03a <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~importer, ncol = 4)+
  labs(title = "Russia Tobacco Imports by Importing Company (top 20)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03a

Code
### Top 20 suppliers:
frequency_table <- df %>%
  count(supplier, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file
kable(frequency_table, 
      format = "html", 
      caption = "Russia Tobacco Imports: Selling Companies",
      table.attr = "class='table table-striped'") %>%
  kable_styling(full_width = FALSE)
Russia Tobacco Imports: Selling Companies
supplier Frequency
joh wilh von eicken gmbh 1429
philip morris ukraine 857
duty free trading latvia llc 721
gebr heinemann se & co kg 714
llc duty free trading latvia 368
null 242
sia vingo by order dufry international ag 215
ooo duty free trading latvia 126
llc tsvetochnoe 116
unknown 113
kt international sa 108
joh wilh von eicken gmbh werk dingelstadt 107
fortran oy on behalf of tranter ltd 76
duty free trading llp branch latvia 75
limited liability company flower 75
gebr heinemann se & co kg via mmd serviss 68
ooo flower 59
baltic logistic system sia on be half of gebr heinemann se&co kg 58
oy shipstores nyman co ltd ltdd 57
international operations & services ch ag 52
duty free trading latvia 50
llc flower 48
weitnauer distribution ltd 46
oy nyman shipstores & co ltd 42
duty free trading llp fil latvia 40
jsc aero region 39
duty free trading llpfil latvia 38
baltic logistic system sia on behalf of gebr heinemann se&co kg 37
oriental general trading inc 37
john wilh von eicken gmbh 36
b&s brand distribution bv 34
uab vinges terminalas by the order of dufry international ag 33
tashkent tobacco 32
souza cruz ltda 30
oy shipstores nyman & co ltd 29
weitnauer distribution 28
b&s paul global international 24
sia vingo by order duery international ag 23
customs warehouse mono on order of duty free trading llp 22
kalvin international trade ag 22
kt&g corporation 22
sia prodimpekss logistikas grupa by order of dufry international ag 22
gebr heinemann se&co kg 21
mono logistik from customs warehouse mono 21
uab vinges terminalas by order dufry international ag 20
baltic logistic system sia on be half of gebr heinemann seco kg kgg 19
baltic logistic system sia on behalf of weitnauer distribution ltd 19
philip morris ukr ine 19
oriental general trading fze 18
dufry international ag by agent vingo ltd 17
gebr heinemann se co kg kgg 17
independent tobacco fze 17
monus doo 16
flower limited liability company 15
gebr heinemann 15
on behalf of pmpsa philip morris investments bv 15
sia systems logistics as agent dufry international ag 15
ultimate investments house gmbh 15
bs brand distribution bvbv 14
pt yatari express indonesia 13
sia vingo on order weitnauer distribution ltd henric petri strasse 15 4010 basel switzerland 13
jsc jv uzbat a o 12
philip morris investments b v on behalf of pmpsa 12
sia systems logistics by order dufry international ag brunnfgasslein 12 ch 4010 basel switzerland 12
jti polska sp z oo 11
sia vingo on order of gebr heinemann se & co kg koreastrasse 3 20457 hamburg germany 11
sia vingo on order of weitnauer distribution ltd 11
sia wingo on order of weitnauer distribution ltd henric petri strasse 15 4010 basel switzerland 11
jurgen nicklas gmbh & co kg 10
wielobranzowe przedsiebiorstwo wajdlejt era 10
international operations & services ch ag via mmd serviss warehouse barselona spain 9
philip morris investments bv on behalf of pmpsa 9
unico logistics co ltd o b of kt&g corporation 9
baltic logistic system sia on order of weitnauer distribution ltd 4010 basel switzerland henric petri strasse 15 8
customs warehouse monopo ordered by duty free trading llp 8
sia prodimpekss logistikas grupa order dufry international ag 8
duery international ag 7
dufry international ag 7
international operations and services ch ag ios 7
overseas distribution company nv 7
oy nyman shipstores&co ltd 7
oy shipstores nyman co ltd ltd 7
tsvetochnoe llc 7
b&s paul global 6
baltic logistic systemsia on be half of gebr heinemann se&co kg 6
british american tobacco investments ltd 6
dutifreet tradingllpfilialatvia 6
duty free trading llpfiliale latvija 6
international operations & services ch ag warehouse barselonaspain via mmd serviss 6
monus doo beograd zemun on behalf on kalvin international trade ag baarenstrasse 75 ch 6300 zug switzerland 6
monus doo on behalf on kalvin international trade ag baarenstrasse 75 ch 6300 zug switzerland 6
oy shipstores nyman&co ltd 6
petrotr de fze 6
philip morris investments bv on behalf of pmps 6
sia vingo by order international operations and services ch ag 6
uab vinges terminalas by order international operations and services ch ag 6
weitnauer distribution ltd via mmd serviss 6
customs warehouse mono by order of duty free trading llp 5
japan tobacco international manufacturing co ltd on behalf of jt international sa 5
limited liability company floral 5
llc baltic tobacco factory 5
llc floral 5
ooo irkutsk duty free 5
oy nyman shipstors & co ltd 5
prodimpekss logistikas grupa sia by order dufry international ag 5
pt djarum 5
sia vingo 5
sia vingo by order dufry supply and logistics fze 5
al matuco tobacco co fze 4
gebr heinemann se& co kg 4
llc regstaer m 4
pt philip morris indonesia tbk 4
tsw tamariks on request of joh wilh von eicken gmbh 4
bat prilucky tobacco company 3
customs warehouse mono 3
dufry international ag from uab vlantana 3
gebr heinemann se&co kg via mmd serviss 3
gebr heinemann se&co kgc w terminal lt 3
jsc airline russia 3
jsc port alliance 3
jti polska sp zoo 3
jv uzbat ao 3
kt international co 3
llc caspiy duty free 3
p t yatari express indonesia 3
petrotrade fze 3
philsa as 3
pjsc a t bat prilucky tobacco company 3
sia vingo by order gebr heinemann se & co kg koreastrasse 3 20457 hamburg germany 3
bat romania investment srl 2
dufry international ag diag via mmd serviss 2
dufry supply and logistics fze 2
duty free trading llp 2
gebr heinemann se co kg via mmd servississ 2
gebr heinemann se co kgo kgg 2
inter trading fzc 2
john wilh von eicken gmbh werk dingelstadt 2
kerry logistics ltd for philip morris travel retail hong kong ltd 2
oy nyman shipstores co ltd ltdd 2
philip morris lietuva 2
philip morris polska sa 2
philip morris products sa 2
philsa philip morris sabanci sigare ve tutun san tic as 2
sia systems logistics as agent of dufry international ag 2
uab vinges terminalas by order duery international ag 2
v a t priluki 2
b t ukr ine 1
bat iraqia 1
bat romania trading bucuresti 1
bat switzerland sa 1
bat tutun mamulleri san 1
british american tobacco korea manufacturing ltd 1
british american tobacco sales and marketing ukraine llc 1
british american tobacco switzerland sa on behalf of bat exports ltd 1
british american tobacco tutun mamulleri san 1
british american tobacco ukraine 1
china tobacco international europe company 1
customs warehouse mono ordered by duty free trading llp 1
dufry international ag as agent sia systems logistics 1
dufry international ag sia spl centrs as agent ganibu dambis 36 riga latvija 1
godfrey phillips india ltd 1
gulbahar tobacco international fze 1
jsc jv uzbat ao 1
jv uzbat jsc 1
oy nyman shipstores co ltd 1
private joint stock company a o tobacco company v a t priluki 1
private joint stock company a t bat priluky tobacco company 1
private joint stock company jsc tobacco company v a t priluki 1
sia mmd trade via mmd serviss 1
Code
## Extract first twenty companies:
l1 <- frequency_table[1:20, "supplier"] %>% as.vector()
df500 <- df[df$supplier %in% l1$supplier, ]

plot03a <- df500 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~supplier, ncol = 4)+
  labs(title = "Russia Tobacco Imports by Selling Company (top 20)", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03a

Code
df600 <- df500[df500$supplier %in% c("null", "unknown"), ]

plot03b <- df600 %>% 
  ggplot( aes(x = date, 
              y = total_value)) +
  geom_line()+ 
  geom_point()+  
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  facet_wrap(~supplier, ncol = 1)+
  labs(title = "Russia Tobacco Imports by Selling Companies marked Unknown and Null ", 
       x = "Date", 
       y = "Total Value") +
  theme_bw()

plot03b

Code
plot04 <- ggplot(df, aes(x = date, 
                         y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Tobacco Imports: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) 

plot04

Code
## Extract first twenty:
frequency_table <- df %>%
  count(origin_country, name = "Frequency") %>%
  arrange(desc(Frequency))

l1 <- frequency_table[1:20, "origin_country"] %>% as.vector()
df500 <- df[df$origin_country %in% l1$origin_country, ]

plot05 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Tobacco Imports by Origin: Price Differentials Over Time (top 20)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~origin_country, 
             ncol = 4)

plot05

Code
l1 <- frequency_table[1:8, "origin_country"] %>% as.vector()
df500 <- df[df$origin_country %in% l1$origin_country, ]

plot05 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "Russia Tobacco Imports by Origin: Price Differentials Over Time (top 8)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~origin_country, 
             ncol = 2)

plot05

Code
### Top 20 Importing Companys:

frequency_table <- df %>%
  count(importer, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file

## Extract first twenty companies:
l1 <- frequency_table[1:20, "importer"] %>% as.vector()
df500 <- df[df$importer %in% l1$importer, ]

plot06 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "RUS Tobacco Imports by Importing Company: Price Differentials Over Time (top 20)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~importer, 
             ncol = 4)

plot06

Code
l1 <- frequency_table[1:8, "importer"] %>% as.vector()
df500 <- df[df$importer %in% l1$importer, ]

plot06 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "RUS Tobacco Imports by Import Company: Price Differentials Over Time (top 8)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~importer, 
             ncol = 2)

plot06

Code
### Top 20 Selling Companys:

frequency_table <- df %>%
  count(supplier, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file

## Extract first twenty companies:
l1 <- frequency_table[1:20, "supplier"] %>% as.vector()
df500 <- df[df$supplier %in% l1$supplier, ]

plot07 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "RUS Tobacco Exports by Selling Company: Price Differentials Over Time (top 20)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~supplier, 
             ncol = 4)

plot07

Code
### Top 20 Selling Companys:

frequency_table <- df %>%
  count(supplier, name = "Frequency") %>%
  arrange(desc(Frequency))

# Convert table to HTML and save it as a file

## Extract first twenty companies:
l1 <- frequency_table[1:8, "supplier"] %>% as.vector()
df500 <- df[df$supplier %in% l1$supplier, ]

plot07 <- ggplot(df500, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "RUS Tobacco Imports by Selling Company: Price Differentials Over Time (top 8)",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~supplier, 
             ncol = 2)

plot07

Code
l1 <- frequency_table[1:10, "supplier"] %>% as.vector()
df500 <- df[df$supplier %in% l1$supplier, ]
df600 <- df500[df500$supplier %in% c("null", "unknown"), ]

plot07a <- ggplot(df600, aes(x = date, 
                            y = price_difference2)) +
  geom_segment(aes(x = date, 
                   xend = date, 
                   y = 0, 
                   yend = price_difference2, 
                   color = price_difference2 > 0)) +
  geom_point(color = "black", size = 2) +
  geom_vline(xintercept = as.Date("2022-02-24"), 
             linetype = "dashed", 
             color = "black", 
             size = 0.45) +
  theme_bw() +
  scale_color_manual(values = c("red", "blue")) +
  labs(title = "RUS Tobacco Imports by Selling Company: Price Differentials Over Time",
       x = "Date",
       y = "Price differential (standardized)") +
  guides(color = FALSE) +
  facet_wrap(~supplier, 
             ncol = 1)

plot07a