erf_en_ncoord_type Derived Type

type, public, extends(erf_ncoord_type) :: erf_en_ncoord_type

Coordination number evaluator


Components

Type Visibility Attributes Name Initial
real(kind=wp), public :: cut = -1.0_wp

Cutoff for the maximum coordination number (negative value, no cutoff)

real(kind=wp), public :: cutoff

Radial cutoff for the coordination number

real(kind=wp), public :: directed_factor

Factor determining whether the CN is evaluated with direction if +1 the CN contribution is added equally to both partners if -1 (i.e. with the EN-dep.) it is added to one and subtracted from the other

real(kind=wp), public, allocatable :: en(:)

Electronegativity

real(kind=wp), public :: kcn

Steepness of counting function

real(kind=wp), public :: norm_exp

Exponent of the distance normalization

real(kind=wp), public, allocatable :: rcov(:)

Covalent radii


Type-Bound Procedures

procedure, public :: add_coordination_number_derivs

Add CN derivative of an arbitrary function

  • private subroutine add_coordination_number_derivs(self, mol, trans, dEdcn, gradient, sigma)

    Arguments

    Type IntentOptional Attributes Name
    class(ncoord_type), intent(in) :: self

    Coordination number container

    type(structure_type), intent(in) :: mol

    Molecular structure data

    real(kind=wp), intent(in) :: trans(:,:)

    Lattice points

    real(kind=wp), intent(in) :: dEdcn(:)

    Derivative of expression with respect to the coordination number

    real(kind=wp), intent(inout) :: gradient(:,:)

    Derivative of the CN with respect to the Cartesian coordinates

    real(kind=wp), intent(inout) :: sigma(:,:)

    Derivative of the CN with respect to strain deformations

procedure, public :: get_cn

Obtains lattice information and calls get_coordination number

  • private subroutine get_cn(self, mol, cn, dcndr, dcndL)

    Wrapper for CN using the CN cutoff for the lattice

    Arguments

    Type IntentOptional Attributes Name
    class(ncoord_type), intent(in) :: self

    Coordination number container

    type(structure_type), intent(in) :: mol

    Molecular structure data

    real(kind=wp), intent(out) :: cn(:)

    Error function coordination number.

    real(kind=wp), intent(out), optional :: dcndr(:,:,:)

    Derivative of the CN with respect to the Cartesian coordinates.

    real(kind=wp), intent(out), optional :: dcndL(:,:,:)

    Derivative of the CN with respect to strain deformations.

procedure, public :: get_coordination_number

Decides whether the energy or gradient is calculated

  • private subroutine get_coordination_number(self, mol, trans, cn, dcndr, dcndL)

    Geometric fractional coordination number

    Arguments

    Type IntentOptional Attributes Name
    class(ncoord_type), intent(in) :: self

    Coordination number container

    type(structure_type), intent(in) :: mol

    Molecular structure data

    real(kind=wp), intent(in) :: trans(:,:)

    Lattice points

    real(kind=wp), intent(out) :: cn(:)

    Error function coordination number.

    real(kind=wp), intent(out), optional :: dcndr(:,:,:)

    Derivative of the CN with respect to the Cartesian coordinates.

    real(kind=wp), intent(out), optional :: dcndL(:,:,:)

    Derivative of the CN with respect to strain deformations.

procedure, public :: get_en_factor

Evaluates pairwise electronegativity factor

  • private elemental function get_en_factor(self, izp, jzp) result(en_factor)

    Evaluates pairwise electronegativity factor

    Arguments

    Type IntentOptional Attributes Name
    class(erf_en_ncoord_type), intent(in) :: self

    Coordination number container

    integer, intent(in) :: izp

    Atom i index

    integer, intent(in) :: jzp

    Atom j index

    Return Value real(kind=wp)

procedure, public :: ncoord

Evaluates the CN from the specific counting function

  • private subroutine ncoord(self, mol, trans, cn)

    Arguments

    Type IntentOptional Attributes Name
    class(ncoord_type), intent(in) :: self

    Coordination number container

    type(structure_type), intent(in) :: mol

    Molecular structure data

    real(kind=wp), intent(in) :: trans(:,:)

    Lattice points

    real(kind=wp), intent(out) :: cn(:)

    Error function coordination number.

procedure, public :: ncoord_count

Evaluates the error counting function

  • private elemental function ncoord_count(self, izp, jzp, r) result(count)

    Error counting function for coordination number contributions.

    Arguments

    Type IntentOptional Attributes Name
    class(erf_ncoord_type), intent(in) :: self

    Coordination number container

    integer, intent(in) :: izp

    Atom i index

    integer, intent(in) :: jzp

    Atom j index

    real(kind=wp), intent(in) :: r

    Current distance.

    Return Value real(kind=wp)

procedure, public :: ncoord_d

Evaluates derivative of the CN from the specific counting function

  • private subroutine ncoord_d(self, mol, trans, cn, dcndr, dcndL)

    Arguments

    Type IntentOptional Attributes Name
    class(ncoord_type), intent(in) :: self

    Coordination number container

    type(structure_type), intent(in) :: mol

    Molecular structure data

    real(kind=wp), intent(in) :: trans(:,:)

    Lattice points

    real(kind=wp), intent(out) :: cn(:)

    Error function coordination number.

    real(kind=wp), intent(out) :: dcndr(:,:,:)

    Derivative of the CN with respect to the Cartesian coordinates.

    real(kind=wp), intent(out) :: dcndL(:,:,:)

    Derivative of the CN with respect to strain deformations.

procedure, public :: ncoord_dcount

Evaluates the derivative of the error counting function

  • private elemental function ncoord_dcount(self, izp, jzp, r) result(count)

    Derivative of the error counting function w.r.t. the distance.

    Arguments

    Type IntentOptional Attributes Name
    class(erf_ncoord_type), intent(in) :: self

    Coordination number container

    integer, intent(in) :: izp

    Atom i index

    integer, intent(in) :: jzp

    Atom j index

    real(kind=wp), intent(in) :: r

    Current distance.

    Return Value real(kind=wp)

Source Code

   type, public, extends(erf_ncoord_type) :: erf_en_ncoord_type
      !> Electronegativity
      real(wp), allocatable :: en(:)
   contains
      !> Evaluates pairwise electronegativity factor
      procedure :: get_en_factor
   end type erf_en_ncoord_type