https://github.com/cran/spatstat
Raw File
Tip revision: 4f764006a6ac33ca3116c0fb6be1666158b57cf1 authored by Adrian Baddeley on 26 July 2010, 09:31:38 UTC
version 1.20-1
Tip revision: 4f76400
nncross.R
#
#   nncross.R
#
#
#    $Revision: 1.6 $  $Date: 2009/08/29 01:43:09 $
#


nncross <- function(X, Y, iX=NULL, iY=NULL) {
  X <- as.ppp(X, W=bounding.box.xy)
  stopifnot(is.ppp(Y) || is.psp(Y))

  # deal with null cases
  nX <- X$n
  nY <- Y$n
  if(nX == 0)
    return(data.frame(dist=numeric(0), which=integer(0)))
  if(nY == 0)
    return(data.frame(dist=rep(Inf, nX), which=rep(NA, nX)))

  # Y is a line segment pattern 
  if(is.psp(Y))
    return(ppllengine(X,Y,"distance"))

  if(is.null(iX) != is.null(iY))
    stop("If one of iX, iY is given, then both must be given")
  exclude <- (!is.null(iX) || !is.null(iY))
  if(exclude) {
    stopifnot(is.integer(iX) && is.integer(iY))
    if(length(iX) != nX)
      stop("length of iX does not match the number of points in X")
    if(length(iY) != nY)
      stop("length of iY does not match the number of points in Y")
  }
    
  # sort in increasing order of y coordinate
  oX <- order(X$y)
  X <- X[oX]
  oY <- order(Y$y)
  Y <- Y[oY]
  if(exclude) {
    iX <- iX[oX]
    iY <- iY[oY]
  }

  # call C code
  nndv <- numeric(X$n)
  nnwh <- integer(X$n)

  DUP <- spatstat.options("dupC")
  
  if(!exclude) 
    z <- .C("nnXwhich",
            n1=as.integer(X$n),
            x1=as.double(X$x),
            y1=as.double(X$y),
            n2=as.integer(Y$n),
            x2=as.double(Y$x),
            y2=as.double(Y$y),
            nnd=as.double(nndv),
            nnwhich=as.integer(nnwh),
            huge=as.double(diameter(X$window)),
            DUP=DUP,
            PACKAGE="spatstat")
  else
    z <- .C("nnXexclude",
            n1=as.integer(nX),
            x1=as.double(X$x),
            y1=as.double(X$y),
            id1=as.integer(iX),
            n2=as.integer(nY),
            x2=as.double(Y$x),
            y2=as.double(Y$y),
            id2=as.integer(iY),
            nnd=as.double(nndv),
            nnwhich=as.integer(nnwh),
            huge=as.double(diameter(X$window)),
            DUP=DUP,
            PACKAGE="spatstat")
    
  # reinterpret in original ordering
  nndv[oX] <- z$nnd
  nnwcode <- z$nnwhich + 1
  nnwcode[nnwcode < 1] <- NA
  nnwh[oX] <- oY[nnwcode]
  return(data.frame(dist=nndv, which=nnwh))
}

back to top