Nothing
#
# fields is a package for analysis of spatial data written for
# the R software environment.
# Copyright (C) 2024 Colorado School of Mines
# 1500 Illinois St., Golden, CO 80401
# Contact: Douglas Nychka, douglasnychka@gmail.com,
#
# This program is free software; you can redistribute it and/or modify
# it under the terms of the GNU General Public License as published by
# the Free Software Foundation; either version 2 of the License, or
# (at your option) any later version.
# This program is distributed in the hope that it will be useful,
# but WITHOUT ANY WARRANTY; without even the implied warranty of
# MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
# GNU General Public License for more details.
#
# You should have received a copy of the GNU General Public License
# along with the R software environment if not, write to the Free Software
# Foundation, Inc., 51 Franklin St, Fifth Floor, Boston, MA 02110-1301 USA
# or see http://www.r-project.org/Licenses/GPL-2
##END HEADER
circulantEmbeddingSetup <- function(
grid, M = NULL,
mKrigObject=NULL,
cov.function="stationary.cov",
cov.args=NULL,
delta=NULL,
giveWarnings=TRUE,
...) {
#
#
if( !is.null(mKrigObject)){
# mine the mKrigObject to get the covariance model.
cov.args<- mKrigObject$args
cov.function<- mKrigObject$cov.function.name
}
else{
cov.args<-c( cov.args, list(...))
}
L<- length( grid)
dx<- rep( NA, L)
m<- rep( NA, L)
for( i in 1:L){
gridTmp<- grid[[i]]
dx[i]<- gridTmp[2]- gridTmp[1]
m[i]<- length( gridTmp)
}
# M is the larger grid size for the circulant covariance that includes m
# and should be at least 2*m for the embedding to be exact.
# It can also be made larger to enforce positive definiteness
# by an extra delta.
if( !is.null(delta)){
M<- rep( NA, L)
for( i in 1:L){
M[i]<- m[i] + ceiling( delta/ dx[i])
}
}
# choose a good composite if M is not specified
if( is.null(M)){
# table of composite M with factors of 2 and 3
p23<-expand.grid( 0:15, 0:15)
value<- 2^p23[,1] * 3^p23[,2]
# all values from 2 and 3 up to 100000
value<- sort( value[ value <= 1e6])
M<- rep( NA, L)
for( i in 1:L){
# smallest composite choice >= to 2*m
valueGreater<- value[ value >= 2*m[i] ]
M[i]<- min( valueGreater )
}
}
if( length(M)!= length( grid)){
stop("M should be same length as grid")
}
# create the larger multigrid now using M
bigIndex<- makeMultiIndex( M)
MCenter<- round( M/2)
center<- rbind( MCenter* dx)
# this might be made more efficient another way ....
bigGrid<- array( NA, dim(bigIndex) )
for( i in 1:L){
bigGrid[,i]<- bigIndex[,i]*dx[i]
}
#
# here is where the actual covariance form is used
# note passed arguments from call for parameters etc.
#
out<- do.call(cov.function, c(cov.args,
list(x1 = bigGrid, x2 = center)))
# coerce to an array note that this depends on the bigIndex varying in the right way
out<- array( c(out),M)
#
# a simple way to normalize. This could be avoided by
# translating image from the center putting at the image corner and
# using periodic wrapping to place the rest of the image in the other corners.
# the choice was made to pay for code simplicity using an extra fft ...
# fft of "delta function" that is the middle point in the array
# -- matches the center of covariance from above
temp <- array( 0, M)
temp[rbind( MCenter)] <- 1
wght <- fft(out)/(fft(temp) * prod(M))
#
if( giveWarnings){
if( any( Re( wght) < 0)){
warning( "Some spectral weights are negative")
}
}
covObject <- list(
m = m,
grid = grid,
dx = dx,
M = M,
delta = delta,
wght = wght,
call = match.call(),
bigGrid= bigGrid,
covTemplate= out
)
return( covObject)
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.