Lead Author: Jonathan M. Lees

GEOmap & geomapdata

GEOmap

Set of routines for making Map Projections (forward and inverse), Topographic Maps, Perspective plots, Geological Maps, geological map symbols, geological databases, interactive plotting and selection of focus regions.

geomapdata

Set of data for use in package GEOmap. Includes world map, USA map, Coso map, Japan Map, ETOPO5

Allows for plotting of maps and spatial data.

Use plotGEOmapXY() to draw a map of Japan

library(geomapdata)
library(GEOmap)
data('japmap', package='geomapdata' )
isel1 = which( japmap$STROKES$code != "i" & japmap$STROKES$num>120 )
PLOC=list(LON=c(137.008, 141.000), LAT=c(34.000, 36.992),
x=c(137.008, 141.000), y=c(34.000, 36.992) )
PROJ = setPROJ(type=2, LAT0=mean(PLOC$y) , LON0=mean(PLOC$x) )
gxy = GLOB.XY(PLOC$LAT, PLOC$LON, PROJ)
PLAT = pretty(PLOC$LAT)
PLAT = c(min(PLOC$LAT),
PLAT[PLAT>min(PLOC$LAT) & PLAT<max(PLOC$LAT)],max(PLOC$LAT))
PLON = pretty(PLOC$LON)
PLON = c(min(PLOC$LON),
PLON[PLON>min(PLOC$LON) & PLON<max(PLOC$LON)], max(PLOC$LON))
plot(gxy$x, gxy$y, asp=TRUE, ann=FALSE , axes=FALSE)
plotGEOmapXY(japmap,SEL=isel1, LIM=c(PLOC$LON[1], PLOC$LAT[1],PLOC$LON[2],
PLOC$LAT[2]) , PROJ=PROJ, add=TRUE )
addLLXY(PLAT, PLON, PROJ=PROJ, LABS=TRUE, PMAT=NULL, TICS=c(.1,.1) )

###############
#### rotated map
PMAT = rotdelta4(-34)
plotGEOmapXY(japmap, PMAT=PMAT,SEL=isel1, xpd=TRUE)

Options

GEOmap provides plotting options for plotGEOmapXY:

Option Description
MAP Map Structure
LIM Lat-Lon limits
PROJ Projection List
PMAT Perspective matrix conversion
add logical, TRUE=add to existing plot
SEL Index vector of strokes to be used in plotting, default=NULL (use all that pass other tests)
GRID logical, TRUE=add grid lines
GRIDcol color for grid lines
MAPcol override color for maps
MAPstyle override plotting style for maps
border color, add border to polygons
cenlon center longitude of plot
shiftlong degrees, rotate longitude
linelty Line type
linewd Line width
ptpch plotting character for strokes (style=1) that are plotted as points
ptcex character expansion factor for style=1 strokes
NUMB logical, number the strokes on the map

and more graphical parameters

Plot UTM

Global View

Syncline and Anticline traces with SynAnticline()