The purpose of this report is to analyze current weather conditions in selected cities to provide insights for optimizing tourism activities. The analysis focuses on temperature, humidity, wind speed, and precipitation levels across five locations: Birmingham, AL; Nashville, TN; Orlando, FL; Pensacola, FL; and Savannah, GA.
The weather data was collected using the OpenWeatherMap API, which provided real-time weather conditions for each city. The collected parameters include: - Temperature (°F) - Humidity (%) - Wind Speed (mph) - Precipitation (inches) - Sunrise and Sunset Times
library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(ggplot2)
# Load the cleaned dataset
weather_data <- read.csv("current_weather_data.csv")
# Extract key insights dynamically
hottest_city <- weather_data$City[which.max(weather_data$Temperature_F)]
coldest_city <- weather_data$City[which.min(weather_data$Temperature_F)]
rainiest_city <- weather_data$City[which.max(weather_data$Precipitation_in)]
windiest_city <- weather_data$City[which.max(weather_data$Wind_Speed_mph)]
ggplot(weather_data, aes(x = City, y = Temperature_F, fill = City)) +
geom_bar(stat = "identity") +
labs(
title = "Current Temperature by City",
subtitle = "Comparing temperature across tourism locations",
x = "City",
y = "Temperature (°F)",
fill = "City"
) +
theme_minimal()
## 3.2 Humidity Levels
ggplot(weather_data, aes(x = City, y = Humidity, fill = City)) +
geom_bar(stat = "identity") +
labs(
title = "Current Humidity Levels by City",
subtitle = "Comparing humidity levels across tourism locations",
x = "City",
y = "Humidity (%)",
fill = "City"
) +
theme_minimal()
## 3.3 Wind Speed Comparison
ggplot(weather_data, aes(x = City, y = Wind_Speed_mph, fill = City)) +
geom_bar(stat = "identity") +
labs(
title = "Current Wind Speed by City",
subtitle = "Comparing wind speeds across tourism locations",
x = "City",
y = "Wind Speed (mph)",
fill = "City"
) +
theme_minimal()
## 3.4 Precipitation Analysis
ggplot(weather_data, aes(x = City, y = Precipitation_in, fill = City)) +
geom_bar(stat = "identity") +
labs(
title = "Current Precipitation by City",
subtitle = "Comparing rainfall across tourism locations",
x = "City",
y = "Precipitation (inches)",
fill = "City"
) +
theme_minimal()
This analysis provides actionable insights for the tourism company to optimize customer experiences based on real-time weather data. By adjusting tour schedules, pricing, and marketing strategies based on weather conditions, the company can enhance visitor satisfaction and improve business operations.