setwd(“E:\ME\group”)
data_brazil<-read.csv("brazil.csv",stringsAsFactors = TRUE)
names(data_brazil)
## [1] "Year" "Forex.Reserves..USD.Billion."
## [3] "BRL.USD.Exchange.Rate" "Change.in.BRL.USD...."
library(ggplot2)
ggplot(data_brazil, aes(x = Year, y = Forex.Reserves..USD.Billion., label = Forex.Reserves..USD.Billion.)) +
geom_line(color = "blue") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "Brazil Forex Reserves Over Years", y = "Forex.Reserves..USD.Billion.", x = "Year") +
theme_minimal()
ggplot(data_brazil, aes(x = Year, y = BRL.USD.Exchange.Rate, label = BRL.USD.Exchange.Rate)) +
geom_line(color = "blue") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "BRL USD Exchange Rate Over Years", y = "Exchange Rate (USD)", x = "Year") +
theme_classic()
data_russia<-read.csv("russia.csv",stringsAsFactors = TRUE)
names(data_russia)
## [1] "Year" "Forex.Reserves..USD.Billion."
## [3] "RUB.USD.Exchange.Rate" "Change.in.RUB.USD...."
ggplot(data_russia, aes(x = Year, y = Forex.Reserves..USD.Billion., label = Forex.Reserves..USD.Billion.)) +
geom_line(color = "green") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "Russia Forex Reserves Over Years", y = "Forex.Reserves..USD.Billion.", x = "Year") +
theme_minimal()
ggplot(data_russia, aes(x = Year, y = RUB.USD.Exchange.Rate, label = RUB.USD.Exchange.Rate)) +
geom_line(color = "green") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "RUB USD Exchange Rate Over Years", y = "Exchange Rate (USD)", x = "Year") +
theme_classic()
data_china<-read.csv("china.csv",stringsAsFactors = TRUE)
names(data_china)
## [1] "Year" "Forex.Reserves..USD.Trillion."
## [3] "CNY.USD.Exchange.Rate" "Change...."
ggplot(data_china, aes(x = Year, y = Forex.Reserves..USD.Trillion., label = Forex.Reserves..USD.Trillion.)) +
geom_line(color = "blue") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "China Forex Reserves Over Years", y = "Forex.Reserves..USD.Trillion.", x = "Year") +
theme_minimal()
ggplot(data_china, aes(x = Year, y = CNY.USD.Exchange.Rate, label = CNY.USD.Exchange.Rate)) +
geom_line(color = "blue") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "CNY USD Exchange Rate Over Years", y = "Exchange Rate (USD)", x = "Year") +
theme_classic()
data_india<-read.csv("forecx.csv",stringsAsFactors = TRUE)
names(data_india)
## [1] "Year" "Forex.Reserves.in.USD.Billion"
## [3] "INR.USD.Exchange.Rate" "X"
## [5] "X.1"
library(ggplot2)
ggplot(data_india, aes(x = Year, y = Forex.Reserves.in.USD.Billion, label = Forex.Reserves.in.USD.Billion)) +
geom_line(color = "green") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "Indian Forex Reserves Over Years", y = "Forex.Reserves..USD.Billion.", x = "Year") +
theme_minimal()
ggplot(data_india, aes(x = Year, y = INR.USD.Exchange.Rate, label = INR.USD.Exchange.Rate)) +
geom_line(color = "green") +
geom_point(color = "red") + # Add points for each data point
geom_text(vjust = -0.5, size = 3) + # Adjust vjust and size as needed
labs(title = "INR USD Exchange Rate Over Years", y = "Exchange Rate (USD)", x = "Year") +
theme_classic()
data_comp<-read.csv("macrodata.csv",stringsAsFactors = TRUE)
names(data_comp)
## [1] "Year" "Country"
## [3] "Forex.Reserves.in.USD.Billion" "USD.Exchange.Rate"
ggplot(data_comp, aes(x = Year, y = `USD.Exchange.Rate`, group = Country, color = Country)) +
geom_line() +
geom_point() + # Add points for each data point
labs(title = "Exchange rates Over Years", y = "Exchange rates (USD)", x = "Year") +
theme_classic()