[CENFA] spatial statistics

Hello all,
It's my first post here so if I made something wrong I apologize!
I'm working with a special package called CENFA that allows me to make predictions about a species distribution regarding climate change.
However my datas are not matching and I don't know why. Does anybody using this package could help me ?
Here is my script:

#Background

library(CENFA)
library(BIEN)


#downloading datas
##Climate datas
bio<-raster::getData('worldclim',var='bio',res=10)

##Spatial datas
Full_data_frame<- BIEN_occurrence_species(species = "Phoenix dactylifera",cultivated = T,only.new.world = F,all.taxonomy = T,native.status = T,observation.type = T,political.boundaries = T)
which(is.na(Full_data_frame$longitude))
which(is.na(Full_data_frame$latitude))
Full_data_frame$CODE <- 1
distribution<- Full_data_frame[,c("longitude","latitude", "CODE")]
coordinates(distribution) <- ~longitude+latitude
plot(distribution)


mod.enfa <- enfa(x = bio, s.dat = distribution, field = "species")
1 Like

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.