n <- 40
d <- 2
n2 <- 20
f1 <- function(x) {x[1]*sin(2*pi*x[1]) + sqrt(x[1])*exp(x[2])}
X1 <- matrix(runif(n*d),n,d)
Z1 <- apply(X1,1,f1) + rnorm(n, 0, 1e-2)
X2 <- matrix(runif(n2*d),n2,d)
Z2 <- apply(X2,1,f1)
XX1 <- matrix(runif(10),5,2)
ZZ1 <- apply(XX1, 1, f1)
u <- IGP_hetGP$new(X=X1,Z=Z1)
cbind(u$predict(XX1), ZZ1)
u$predict.se(XX1)
# \donttest{
ContourFunctions::cf(function(x) u$predict(x), pts=X1)
ContourFunctions::cf(function(x) u$predict(x, se.fit=TRUE)$se, pts=X1)
# }
u$update(Xnew=X2,Znew=Z2)
u$predict(XX1)
ContourFunctions::cf(function(x) u$predict(x), pts=rbind(X1, X2))
u$delete()
n <- 10
d <- 1
X1 <- runif(n)
X1 <- c(X1, X1)
f1 <- function(x) {abs(sin(pi*x))+sqrt(x)+rnorm(1,0,.1)}
Z1 <- sapply(X1, f1)
plot(X1, Z1)
h1 <- hetGP::mleHetGP(X=matrix(X1,ncol=1),Z=matrix(Z1, ncol=1), lower=c(.1), upper=c(50))
curve(predict(h1, matrix(x, ncol=1))$mean, add=TRUE, col=3)
u <- IGP_hetGP$new(X=X1,Z=Z1)
plot(X1, Z1, col=2); curve(u$predict(matrix(x,ncol=1)), add=TRUE)
Run the code above in your browser using DataLab