SG MAP
suppressWarnings(suppressMessages(library(ggplot2)))
suppressWarnings(suppressMessages(library(tidyverse)))
suppressWarnings(suppressMessages(library(ggmap)))
map.sg <- get_map("singapore")
## Map from URL : http://maps.googleapis.com/maps/api/staticmap?center=singapore&zoom=10&size=640x640&scale=2&maptype=terrain&language=en-EN&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=singapore&sensor=false
ggmap(map.sg)

Zoomed
get_map("singapore jurong east", zoom = 17) %>% ggmap()
## Map from URL : http://maps.googleapis.com/maps/api/staticmap?center=singapore+jurong+east&zoom=17&size=640x640&scale=2&maptype=terrain&language=en-EN&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=singapore%20jurong%20east&sensor=false

# get jurong east map
df.singapore_locations <- tibble(location = c("jurong east, singapore"))
geo.singapore_locations <- geocode(df.singapore_locations$location)
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=jurong%20east,%20singapore&sensor=false
mapImageData1 <- get_map(location = geo.singapore_locations,
color = "color",
source = "google",
maptype = "hybrid",
zoom = 17)
## Map from URL : http://maps.googleapis.com/maps/api/staticmap?center=1.332857,103.743552&zoom=17&size=640x640&scale=2&maptype=hybrid&language=en-EN&sensor=false
ggmap(mapImageData1,extent = "panel")

# # get glendale park condo
# df.singapore_locations <- tibble(location = c("glendale park, singapore"))
#
# geo.singapore_locations <- geocode(df.singapore_locations$location)
#
# mapImageData1 <- get_map(location = geo.singapore_locations,
# color = "color",
# source = "google",
# maptype = "hybrid",
# zoom = 17)
#
# ggmap(mapImageData1,extent = "panel")
Remove Lines
# ggmap(mapImageData1) +
# theme(axis.line = element_blank(),
# axis.text = element_blank(),
# axis.ticks = element_blank(),
# plot.margin = unit(c(0, 0, -1, -1), 'lines')) +
# xlab('') +
# ylab('')