如何在 R 项目中找到不规则多边形的最小外接圆?

How to find the smallest circumcircle of an irregular polygon on R project?

我想知道如何找到不规则多边形的最小外接圆。我在 R 中使用过空间多边形。

我想在矢量模式下重现一些 fragstats 指标,因为我在使用包 'landscapemetrics' 获取大量数据时遇到了困难。具体来说,我想实现圆圈(http://www.umass.edu/landeco/research/fragstats/documents/Metrics/Shape%20Metrics/Metrics/P11%20-%20CIRCLE.htm)。到目前为止,我找不到最小外接圆的公式或脚本。

非常欢迎您提出所有意见。

比你

正如我在评论中提到的,我不知道现有的 R 代码,但如果你没有太多需要在圆圈中的点,那么蛮力搜索应该足够快。我刚写了这个。 center() 函数基于维基百科中用于围绕三角形绘制圆的代码; circumcircle() 是你想要的功能,通过强力搜索找到通过集合中的 2 或 3 个点的所有圆。在我的笔记本电脑上,处理 100 个点大约需要 4 秒。如果你有更大的集合,你可能可以通过转换为 C++ 来获得可以接受的结果,但这是一个 n^4 的增长率,所以你需要一个更好的解决方案 对于一个非常大的集合。

center <- function(D) {
  if (NROW(D) == 0)
    matrix(numeric(), ncol = 2)
  else if (NROW(D) == 1)
    D
  else if (NROW(D) == 2) {
    (D[1,] + D[2,])/2
  } else if (NROW(D) == 3) {
    B <- D[2,] - D[1,]
    C <- D[3,] - D[1,]
    Dprime <- 2*(B[1]*C[2] - B[2]*C[1])
    if (Dprime == 0) {
      drop <- which.max(c(sum((B-C)^2), sum(C^2), sum(B^2)))
      center(D[-drop,])
    } else 
      c((C[2]*sum(B^2) - B[2]*sum(C^2))/Dprime,
        (B[1]*sum(C^2) - C[1]*sum(B^2))/Dprime) + D[1,]
  } else 
    center(circumcircle(D))
}

radius <- function(D, U = center(D))
  sqrt(sum((D[1,] - U)^2))

circumcircle <- function(P) {
  n <- NROW(P)
  if (n < 3) 
    return(P)
  P <- P[sample(n),]
  bestset <- NULL
  bestrsq <- Inf
  # Brute force search
  for (i in 1:(n-1)) {
    for (j in (i+1):n) {
      D <- P[c(i,j),]
      U <- center(D)
      rsq <- sum((D[1,] - U)^2)
      if (rsq >= bestrsq)
        next
      failed <- FALSE
      for (k in (1:n)[-j][-i]) {
        Pk <- P[k,,drop = FALSE]
        if (sum((Pk - U)^2) > rsq) {
          failed <- TRUE
          break
        }
      }
      if (!failed) {
        bestset <- c(i,j)
        bestrsq <- rsq
      }
    }
  }
  # Look for the best 3 point set
  for (i in 1:(n-2)) {
    for (j in (i+1):(n-1)) {
      for (l in (j+1):n) {
        D <- P[c(i,j,l),]
        U <- center(D)
        rsq <- sum((D[1,] - U)^2)
        if (rsq >= bestrsq)
          next
        failed <- FALSE
        for (k in (1:n)[-l][-j][-i]) {
          Pk <- P[k,,drop = FALSE]
          if (sum((Pk - U)^2) > rsq) {
            failed <- TRUE
            break
          }
        }
        if (!failed) {
          bestset <- c(i,j,l)
          bestrsq <- rsq
        }
      }
    }  
  }
  P[bestset,]
}

showP <- function(P, ...) {
  plot(P, asp = 1, type = "n", ...)
  text(P, labels = seq_len(nrow(P)))
}

showD <- function(D) {
  U <- center(D)
  r <- radius(D, U)
  theta <- seq(0, 2*pi, len = 100)
  lines(U[1] + r*cos(theta), U[2] + r*sin(theta))
}

n <- 100
P <- cbind(rnorm(n), rnorm(n))
D <- circumcircle(P)
showP(P)
showD(D)

这显示了输出