First we load the pcds
package:
library(pcds)
For illustration of construction of PCDs and related quantities, we first focus on one Delaunay cell, which is a tetrahedron in the 3D setting. Due to geometry invariance of PE- and CS-PCDs with vertices from uniform distribution in a tetrahedron in \(\mathbb R^3\), most data generation and computations can be done in the standard regular tetrahedron, and for AS-PCD, one can restrict attention to the basic tetrahedron. Here, we only consider the PE-PCD with vertices being 3D data points, extension of the other PCDs is left for future work. The standard regular tetrahedron is \(T_{reg}=T(A,B,C,D)\) with vertices \(A=(0,0,0)\), \(B=(1,0,0)\), and \(C=\left(1/2,\sqrt{3}/2,0\right)\), and \(D=\left(1/2,\sqrt{3}/6,\sqrt{6}/3\right)\).
For more detail on the extension of PCDs to higher dimensions, see Ceyhan (2005), Ceyhan, Priebe, and Wierman (2006), Ceyhan, Priebe, and Marchette (2007), and Ceyhan and Priebe (2007).
We first choose an arbitrary tetrahedron. We choose the arbitrary tetrahedron \(T=T(A,B,C,D)\) with vertices jittered around the vertices of the standard regular tetrahedron (for better visualization).
set.seed(1)
<-c(0,0,0)+runif(3,-.25,.25);
A<-c(1,0,0)+runif(3,-.25,.25);
B<-c(1/2,sqrt(3)/2,0)+runif(3,-.25,.25);
C<-c(1/2,sqrt(3)/6,sqrt(6)/3)+runif(3,-.25,.25)
D<-rbind(A,B,C,D)
tetra<-5 #try also n<-10 or 20 n
And we generate \(n=\) 5 \(\mathcal{X}\) points uniformly
in the tetrahedron \(T\) using the function runif.tetra
in pcds
.
One can use the center of mass (default) or the circumcenter of the tetrahedron to construct the vertex regions.
\(\mathcal{X}\) points are denoted as Xp
and \(\mathcal{Y}\) points correspond to the vertices of the tetrahedron \(T\) (i.e. \(\{A,B,C,D\}\)).
<-runif.tetra(n,tetra)$g #try also Xp[,1]<-Xp[,1]+1 Xp
Plot of the tetrahedron \(T\) and the \(\mathcal{X}\) points in it,
and we also add the vertex names using the text3D
function from package plot3D
.
<-range(tetra[,1],Xp[,1])
xlim<-range(tetra[,2],Xp[,2])
ylim<-range(tetra[,3],Xp[,3])
zlim
<-xlim[2]-xlim[1]
xr<-ylim[2]-ylim[1]
yr<-zlim[2]-zlim[1]
zr
::scatter3D(Xp[,1],Xp[,2],Xp[,3], phi=0,theta=-60, bty = "g",main="Points in One Tetrahedron",
plot3Dxlab="x", ylab="y", zlab="z", xlim=xlim+xr*c(-.05,.05), ylim=ylim+yr*c(-.05,.05),
zlim=zlim+zr*c(-.05,.05), pch = 20, cex = 1, ticktype = "detailed")
#add the vertices of the tetrahedron
::points3D(tetra[,1],tetra[,2],tetra[,3], add = TRUE)
plot3D<-tetra[1,]; B<-tetra[2,]; C<-tetra[3,]; D<-tetra[4,]
A<-rbind(A,A,A,B,B,C); R<-rbind(B,C,D,C,D,D)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3], add=TRUE,lwd=1,lty=2)
plot3D#now we add the vertex names and annotation
<-tetra
txt<-txt[,1]+c(-.02,.02,-.15,.02)
xc<-txt[,2]+c(.02,.02,.02,.02)
yc<-txt[,3]+c(-.04,.02,.02,.02)
zc<-c("A","B","C","D")
txt.str::text3D(xc,yc,zc,txt.str, add = TRUE) plot3D
Figure 1.1: Scatterplot of the uniform \(X\) points in the tetrahedron \(T\).
We use the same tetrahedron \(T\) and the generated data above,
and choose the expansion parameter \(r=1.5\)
and center M="CM"
to illustrate the PE proximity region construction.
The function NPEtetra
is used for the construction of PE proximity regions taking the arguments
p,th,r,M,rv
where
p
, a 3D point whose PE proximity region is to be computed,r
, a positive real number which serves as the expansion parameter in PE proximity region; must be \(\ge 1\).th
, A \(4 \times 3\) matrix with each row representing a vertex of the tetrahedron,M
, the center to be used in the construction of the vertex regions in the tetrahedron, th
,
Currently it only takes "CC"
for circumcenter and "CM"
for center of mass; default="CM"
,rv
, the index of the vertex region containing the point, either 1,2,3,4
(default is NULL
).NPEtetra
returns the proximity region as the the vertices of the tetrahedron proximity region.
<-"CM" #try also M<-"CC"
M<-1.5
rNPEtetra(Xp[1,],tetra,r) #uses the default M="CM"
#> [,1] [,2] [,3]
#> [1,] 0.72233763 0.9464243 0.06455702
#> [2,] 0.06169821 0.1514047 0.04242222
#> [3,] 1.10142305 0.0843472 0.17049892
#> [4,] 0.37498004 0.3131847 0.52897936
Indicator for the presence of an arc from a (data or \(\mathcal{X}\)) point to another for PE-PCDs is the function IndNPEtetra
which takes arguments p1,p2,th,r,M,rv
where
p1
, a 3D point whose PE proximity region is constructed.p2
, a 3D point. The function determines whether p2
is inside the PE proximity region of p1
or not.th,r,M,rv
are as in NPEtetra
.This function returns \(I(p_2 \in N_{PE}(p_1,r))\),
that is, returns 1 if p2
is in \(N_{PE}(p_1,r)\), 0 otherwise.
One can use it for points in the data set or for arbitrary points (as if they were in the data set).
IndNPEtetra(Xp[1,],Xp[2,],tetra,r) #uses the default M="CM"
#> [1] 1
IndNPEtetra(Xp[2,],Xp[1,],tetra,r,M)
#> [1] 1
Number of arcs of the PE-PCD can be computed by the function NumArcsPEtetra
,
which takes arguments Xp,th,r,M
where Xp
is the data set, and th,r,M
are as in NPEtetra
.
This function returns the list of
num.arcs
: Number of arcs of the PE-PCD,num.in.tetra
: Number of Xp
points in the tetrahedron tetra
,ind.in.tetra
: The vector of indices of the Xp
points that reside in the tetrahedron.The output is as in NumArcsPEtri
.
NumArcsPEtetra(Xp,tetra,r,M)
#> $num.arcs
#> [1] 10
#>
#> $num.in.tetra
#> [1] 5
#>
#> $ind.in.tetra
#> [1] 1 2 3 4 5
The arc density of the PE-PCD can be computed by the function PEarcdens.tetra
.
It takes the arguments Xp,th,r,M,th.cor
where Xp,th,r,M
are as in NumArcsPEtetra
and th.cor
is a logical argument for computing the arc density for only the points inside the tetrahedron,
th
. (default is th.cor=FALSE
), i.e., if th.cor=TRUE
only the induced digraph
with the vertices inside th
are considered in the computation of arc density.
Arc density can be adjusted (or corrected) for the points outside the triangle by using the option th.cor=TRUE
.
PEarcdens.tetra(Xp,tetra,r,M)
#> [1] 0.5
The incidence matrix of the PE-PCD for the one tetrahedron case can be found by IncMatPEtetra
,
using the IncMatPEtetra(Xp,tetra,r,M)
command.
It has the same arguments as NumArcsPEtetra
function.
Plots of the PE proximity region for one of the \(\mathcal{X}\) points only (for better visualization).
plotPEregs.tetra(Xp[1,],tetra,r=1.5) #uses the default M="CM"
Figure 1.2: PE proximity regions for one of the \(X\) points in the tetrahedron \(T\) for better visualization.
We first define the standard regular tetrahedron \(T_{reg}\) as in Section 1.
<-c(0,0,0); B<-c(1,0,0); C<-c(1/2,sqrt(3)/2,0); D<-c(1/2,sqrt(3)/6,sqrt(6)/3)
A<-rbind(A,B,C,D)
tetra
<-10 #try also n<-20 n
And we generate \(\mathcal{X}\) points of size \(n=\) 5 using the function runif.std.tetra
in the pcds
package,
and use either center of mass (default) or the circumcenter of \(T_{reg}\) to construct vertex regions.
<-runif.std.tetra(n)$g Xp
Plot of the standard regular tetrahedron \(T_{reg}\) and the \(\mathcal{X}\) points in it are provided
using the below code.
We also add the vertex names using the text3D
function from package plot3D
.
<-range(tetra[,1],Xp[,1])
xlim<-range(tetra[,2],Xp[,2])
ylim<-range(tetra[,3],Xp[,3])
zlim
<-xlim[2]-xlim[1]
xr<-ylim[2]-ylim[1]
yr<-zlim[2]-zlim[1]
zr
::scatter3D(Xp[,1],Xp[,2],Xp[,3], phi=0,theta=-60, bty = "g",main="Points in the Standard Regular Tetrahedron",
plot3Dxlab="x", ylab="y", zlab="z", xlim=xlim+xr*c(-.05,.05), ylim=ylim+yr*c(-.05,.05),
zlim=zlim+zr*c(-.05,.05), pch = 20, cex = 1, ticktype = "detailed")
#add the vertices of the tetrahedron
::points3D(tetra[,1],tetra[,2],tetra[,3], add = TRUE)
plot3D<-tetra[1,]; B<-tetra[2,]; C<-tetra[3,]; D<-tetra[4,]
A<-rbind(A,A,A,B,B,C); R<-rbind(B,C,D,C,D,D)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3], add=TRUE,lwd=1,lty=2)
plot3D
#now we add the vertex names and annotation
<-tetra
txt<-txt[,1]+c(-.01,.02,-.12,.02)
xc<-txt[,2]+c(.02,.02,.02,-.01)
yc<-txt[,3]+c(-.04,.02,.02,.02)
zc<-c("A","B","C","D")
txt.str::text3D(xc,yc,zc,txt.str, add = TRUE) plot3D
The function NPEstd.tetra
is used for the construction of PE proximity regions for points in \(T_{reg}\)
taking arguments p,r,rv
which are same as in NPEtetra
.
This function returns the proximity region as the the vertices of the tetrahedron proximity region.
Center of mass is equivalent to circumcenter for \(T_{reg}\), so no argument is specified for the center.
<-1.5
rNPEstd.tetra(Xp[1,],r)
#> [,1] [,2] [,3]
#> [1,] 0.5000000 0.8660254 0.0000000
#> [2,] 0.1618881 0.2803983 0.0000000
#> [3,] 0.5000000 0.4756074 0.5521345
#> [4,] 0.8381119 0.2803983 0.0000000
NPEstd.tetra(Xp[5,],r)
#> [,1] [,2] [,3]
#> [1,] 1.00000000 0.0000000 0.0000000
#> [2,] 0.52499658 0.8227301 0.0000000
#> [3,] 0.52499658 0.2742434 0.7756773
#> [4,] 0.04999316 0.0000000 0.0000000
Indicator for the presence of an arc from a (data or \(\mathcal{X}\)) point to another for PE-PCDs is the function IndNPEstd.tetra
which takes arguments p1,p2,r,rv
and
returns \(I(p_2 \in N_{PE}(p_1,r))\) which are same as in IndNPEtetra
.
One can use it for points in the data set or for arbitrary points (as if they were in the data set).
IndNPEstd.tetra(Xp[1,],Xp[3,],r) #uses the default M="CM"
#> [1] 1
Plots of the PE proximity regions for all points can be obtained with the below code:
plotPEregs.std.tetra(Xp,r)
We only use circumcenter (CC) or center of mass (CM) to construct vertex regions in a tetrahedron,
and here we illustrate finding CC (as CM is just the componentwise arithmetic average of the vertices)
of a tetrahedron.
The function circ.cent.tetra
takes the sole argument th
for a \(4 \times 3\) matrix with each row representing a vertex of the tetrahedron and returns the circumcenter of a general tetrahedron.
We use a tetrahedron \(T\) whose vertices are jittered around the vertices of a standard regular tetrahedron for better visualization
in the plots.
set.seed(123)
<-c(0,0,0)+runif(3,-.2,.2);
A<-c(1,0,0)+runif(3,-.2,.2);
B<-c(1/2,sqrt(3)/2,0)+runif(3,-.2,.2);
C<-c(1/2,sqrt(3)/6,sqrt(6)/3)+runif(3,-.2,.2);
D<-rbind(A,B,C,D)
tetra
<-circ.cent.tetra(tetra)
CC
CC#> [1] 0.5516851 0.3386671 0.1212977
We can also illustrate the CC in a tetrahedron in a plot with vertex and CC annotation.
Type ? circ.cent.tetra
for the code to generate the corresponding figure.
The function rv.tetraCC
takes arguments p,th
and
returns the index of the \(CC\)-vertex region in a tetrahedron th
where the point p
resides.
<-10 #try also n<-20
n<-runif.tetra(n,tetra)$g
Xprv.tetraCC(Xp[1,],tetra)
#> $rv
#> [1] 2
#>
#> $tetra
#> [,1] [,2] [,3]
#> vertex 1 -0.08496899 0.1153221 -0.03640923
#> vertex 2 1.15320696 0.1761869 -0.18177740
#> vertex 3 0.51124220 1.0229930 0.02057401
#> vertex 4 0.48264589 0.4714085 0.79783024
<-vector()
Rvfor (i in 1:n)
<-c(Rv,rv.tetraCC(Xp[i,],tetra)$rv)
Rv
Rv#> [1] 2 2 1 3 2 1 2 3 2 1
We also generate \(n=\) 5 \(\mathcal{X}\) points uniformly in the tetrahedron and find the indices of the vertex regions they reside in.
We illustrate the CC-vertex regions using the following code.
We annotate the vertices and CC and provide the scatterplot of these points labeled according to the vertex region they reside in.
Type also ? rv.tetraCC
for the code to generate this figure.
<-circ.cent.tetra(tetra)
CC
CC
<-range(tetra[,1],Xp[,1],CC[1])
Xlim<-range(tetra[,2],Xp[,2],CC[2])
Ylim<-range(tetra[,3],Xp[,3],CC[3])
Zlim<-Xlim[2]-Xlim[1]
xd<-Ylim[2]-Ylim[1]
yd<-Zlim[2]-Zlim[1]
zd
::scatter3D(tetra[,1],tetra[,2],tetra[,3], phi =0,theta=40, bty = "g",
plot3Dmain="Scatterplot of data points \n and CC-vertex regions",
xlim=Xlim+xd*c(-.05,.05),ylim=Ylim+yd*c(-.05,.05), zlim=Zlim+zd*c(-.05,.05),
pch = 20, cex = 1, ticktype = "detailed")
<-rbind(A,A,A,B,B,C); R<-rbind(B,C,D,C,D,D)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3], add=TRUE,lwd=2)
plot3D#add the data points
::points3D(Xp[,1],Xp[,2],Xp[,3],pch=".",cex=3, add=TRUE)
plot3D
::text3D(tetra[,1],tetra[,2],tetra[,3], labels=c("A","B","C","D"), add=TRUE)
plot3D::text3D(CC[1],CC[2],CC[3], labels=c("CC"), add=TRUE)
plot3D
<-(A+B)/2; D2<-(A+C)/2; D3<-(A+D)/2; D4<-(B+C)/2; D5<-(B+D)/2; D6<-(C+D)/2;
D1<-rbind(D1,D2,D3,D4,D5,D6); R<-matrix(rep(CC,6),ncol=3,byrow=TRUE)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3], add=TRUE,lty=2)
plot3D
<-int.line.plane(A,CC,B,C,D)
F1<-matrix(rep(F1,4),ncol=3,byrow=TRUE); R<-rbind(D4,D5,D6,CC)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3],col=2, add=TRUE,lty=2)
plot3D
<-int.line.plane(B,CC,A,C,D)
F2<-matrix(rep(F2,4),ncol=3,byrow=TRUE); R<-rbind(D2,D3,D6,CC)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3],col=3, add=TRUE,lty=2)
plot3D
<-int.line.plane(C,CC,A,B,D)
F3<-matrix(rep(F3,4),ncol=3,byrow=TRUE); R<-rbind(D3,D5,D6,CC)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3],col=4, add=TRUE,lty=2)
plot3D
<-int.line.plane(D,CC,A,B,C)
F4<-matrix(rep(F4,4),ncol=3,byrow=TRUE); R<-rbind(D1,D2,D4,CC)
L::segments3D(L[,1], L[,2], L[,3], R[,1], R[,2],R[,3],col=5, add=TRUE,lty=2)
plot3D
::text3D(Xp[,1],Xp[,2],Xp[,3], labels=factor(Rv), add=TRUE) plot3D
The function rv.tetraCM
takes the same arguments as rv.tetraCC
and
returns the index of the \(CM\)-vertex region in a tetrahedron th
where the point p
resides.
We use standard regular tetrahedron in this example.
#The index of the $CM$-vertex region in a tetrahedron that contains a point
<-c(0,0,0); B<-c(1,0,0); C<-c(1/2,sqrt(3)/2,0); D<-c(1/2,sqrt(3)/6,sqrt(6)/3)
A<-rbind(A,B,C,D)
tetra
<-10 #try also n<-20
n<-runif.std.tetra(n)$g
Xprv.tetraCM(Xp[1,],tetra)
#> $rv
#> [1] 4
#>
#> $tetra
#> [,1] [,2] [,3]
#> vertex 1 0.0 0.0000000 0.0000000
#> vertex 2 1.0 0.0000000 0.0000000
#> vertex 3 0.5 0.8660254 0.0000000
#> vertex 4 0.5 0.2886751 0.8164966
<-vector()
Rvfor (i in 1:n)
<-c(Rv, rv.tetraCM(Xp[i,],tetra)$rv )
Rv
Rv#> [1] 4 4 3 4 4 1 1 3 3 2
We also generate \(n=\) 5 \(\mathcal{X}\) points in the tetrahedron and find the indices of the vertex regions they reside in.
We can also illustrate the CC in a tetrahedron in a plot with vertex and CC annotation.
Type ? rv.tetraCM
for the code to generate the corresponding figure.