地理加权回归

gwr.sel <- function(formula, data = list(), coords, adapt=FALSE,  
                    gweight=gwr.Gauss, method="cv", verbose=TRUE, longlat=NULL, 
                    RMSE=FALSE, weights, tol=.Machine$double.eps^0.25, 
                    show.error.messages=FALSE) { 
  if (!is.logical(adapt)) stop("adapt must be logical") 
  if (is(data, "Spatial")) { 
    if (!missing(coords)) 
      warning("data is Spatial* object, ignoring coords argument") 
    coords <- coordinates(data) 
    if (is.null(longlat) || !is.logical(longlat)) { 
      if (!is.na(is.projected(data)) && !is.projected(data)) { 
        longlat <- TRUE 
      } else { 
        longlat <- FALSE 
      } 
    } 
    data <- as(data, "data.frame") 
  } 
  if (is.null(longlat) || !is.logical(longlat)) longlat <- FALSE 
  if (missing(coords)) 
    stop("Observation coordinates have to be given") 
  mf <- match.call(expand.dots = FALSE) 
  m <- match(c("formula", "data", "weights"), names(mf), 0) 
  mf <- mf[c(1, m)] 
  mf$drop.unused.levels <- TRUE 
  mf[[1]] <- as.name("model.frame") 
  mf <- eval(mf, parent.frame()) 
  mt <- attr(mf, "terms") 
  dp.n <- length(model.extract(mf, "response")) 
  #	mt <- terms(formula, data = data) 
  #	mf <- lm(formula, data, method="model.frame", na.action=na.fail) 
  #	dist2 <- (as.matrix(dist(coords)))^2 
  weights <- as.vector(model.extract(mf, "weights")) 
  # set up default weights 
  if (!is.null(weights) && !is.numeric(weights))  
    stop("'weights' must be a numeric vector") 
  if (is.null(weights)) weights <- rep(as.numeric(1), dp.n) 
  if (any(is.na(weights))) stop("NAs in weights") 
  if (any(weights < 0)) stop("negative weights") 
  y <- model.extract(mf, "response") 
  x <- model.matrix(mt, mf) 
  #	if (
  • 0
    点赞
  • 9
    收藏
    觉得还不错? 一键收藏
  • 0
    评论

“相关推荐”对你有帮助么?

  • 非常没帮助
  • 没帮助
  • 一般
  • 有帮助
  • 非常有帮助
提交
评论
添加红包

请填写红包祝福语或标题

红包个数最小为10个

红包金额最低5元

当前余额3.43前往充值 >
需支付:10.00
成就一亿技术人!
领取后你会自动成为博主和红包主的粉丝 规则
hope_wisdom
发出的红包
实付
使用余额支付
点击重新获取
扫码支付
钱包余额 0

抵扣说明:

1.余额是钱包充值的虚拟货币,按照1:1的比例进行支付金额的抵扣。
2.余额无法直接购买下载,可以购买VIP、付费专栏及课程。

余额充值