Does anyone know what package replaced SDMTools? it was removed from CRAN.
I need to get the % coverage from a raster, I'm sending you my script:
m<-c(-0.2,0.2,1,0.2,0.6,2,0.6,1,3) # reclassified the scale of the NDVI
mat<-matrix(m,ncol=3,byrow=TRUE) #MATRIX of categorical value classes
mat
rc<-reclassify(ndvi,mat) # reclassify is important to make further analysis
plot(rc)
library(SDMTools) (Devtools), (adehabitatMA), etc. ->They did not work, I could not find the
ClassStat function.
the reclassified raster is in UTM, we need it in lat/long
c=ClassStat(rc,cellsize=30,latlon=FALSE)
head(c)