ia_tether_m.f90 Source File


This file depends on

sourcefile~~ia_tether_m.f90~~EfferentGraph sourcefile~ia_tether_m.f90 ia_tether_m.f90 sourcefile~constants_m.f90 constants_m.f90 sourcefile~ia_tether_m.f90->sourcefile~constants_m.f90 sourcefile~atmcfg_m.f90 atmcfg_m.f90 sourcefile~ia_tether_m.f90->sourcefile~atmcfg_m.f90 sourcefile~atmcfg_m.f90->sourcefile~constants_m.f90

Files dependent on this one

sourcefile~~ia_tether_m.f90~~AfferentGraph sourcefile~ia_tether_m.f90 ia_tether_m.f90 sourcefile~interaction_m.f90 interaction_m.f90 sourcefile~interaction_m.f90->sourcefile~ia_tether_m.f90 sourcefile~setup_m.f90 setup_m.f90 sourcefile~setup_m.f90->sourcefile~interaction_m.f90 sourcefile~bd_solver_m.f90 bd_solver_m.f90 sourcefile~setup_m.f90->sourcefile~bd_solver_m.f90 sourcefile~bd_solver_m.f90->sourcefile~interaction_m.f90 sourcefile~main.f90 main.f90 sourcefile~main.f90->sourcefile~setup_m.f90

Contents

Source Code


Source Code

module ia_tether_m
!! Tether potentials
!!
!! *Style 0: None
!! *Style 1: Rigid connector (not implemented)
!! *Style 2: Harmonic spring. See [[teth_harm_set]].

use constants_m
use atmcfg_m

implicit none

private

public :: ia_tether_setup, ia_get_tether_force

contains

!******************************************************************************

subroutine ia_tether_setup(num_tether_types, tether_styles, tether_params)
    !! Sets up parameters for tether potentials 

    integer, intent(in) :: num_tether_types
        !! Number of tether types
    integer, dimension(:), intent(in) :: tether_styles
        !! Styles for each type
    real(rp), dimension(:,:), intent(in out) :: tether_params
        !! Parameters for each type, depending on style
    integer :: i, sty

    !Set tether interactions
    do i = 1, num_tether_types
        sty = tether_styles(i)
        select case(sty)
        case(1)
            call teth_rigid_set(tether_params(:,i))
        case(2)
            call teth_harm_set(tether_params(:,i))
        case default
            continue
        end select
    end do

    end subroutine

!******************************************************************************

subroutine ia_get_tether_force(qmag, sty, params, enrg, frc, ierr)
    !! Calculates the energy and its derivative due to a tether.

    real(rp), intent(in) :: qmag
        !! Distance between the tethered atom & the tether point
    integer, intent(in)   :: sty
        !! Tether style
    real(rp), dimension(:), intent(in) :: params
        !! Parameters for tether interaction
    real(rp), intent(out) :: enrg
        !! Energy due to this tether
    real(rp), intent(out) :: frc
    integer, intent(out)  :: ierr
        !! Error flag

    ierr = 0
    enrg = 0.0_rp; frc = 0.0_rp

    select case (sty)
    case (1)
        call teth_rigid(qmag, params, enrg, frc, ierr) 
    case (2)
        call teth_harm(qmag, params, enrg, frc) 
    case default
        continue
    end select

    end subroutine

!********************************************************************************

subroutine teth_rigid_set(params, r0, eps)
    !! Setter for rigid tether interaction.
    !!
    !! User-set parameters:
    !!
    !! * params(1) = `r0` (fixed separation distance)
    !! * params(2) = `eps` (allowed tolerance)

    real(rp), dimension(:), intent(in out) :: params
    real(rp), intent(in), optional :: r0
    real(rp), intent(in), optional :: eps

    if (present(r0)) params(1) = r0
    if (present(eps)) params(2) = eps

    end subroutine

!********************************************************************************

subroutine teth_rigid(r, params, enrg, frc, ierr)
    !! Not implemented, needs constraint formalism. See [[teth_rigid_set]].
    !!
    !! Calculates energy for rigid tether interaction.

    real(rp), intent(in) :: r
    real(rp), dimension(:), intent(in) :: params
    real(rp), intent(out) :: enrg
    real(rp), intent(out) :: frc
    integer, intent(out) :: ierr

    ierr = 0; enrg = 0.0_rp; frc = 0.0_rp

    if ( abs(r-params(1)) < params(2) ) then
        enrg = 0.0_rp; frc = 0.0_rp
    else
        ierr = 1
        return
    end if

    end subroutine

!********************************************************************************

!params(1) = k, params(2) = r0 (equilibrium distance)
subroutine teth_harm_set(params, k, r0)
    !! Setter for harmonic tether interaction.
    !!
    !!```
    !!  U = (1/2)*k*(r - r0)^2
    !!```
    !! User-set parameters:
    !!
    !! * params(1) = `k` (spring constant)
    !! * params(2) = `r0` (equilibrium distance)

    real(rp), dimension(:), intent(in out) :: params
    real(rp), intent(in), optional :: k
    real(rp), intent(in), optional :: r0

    if (present(k)) params(1) = k
    if (present(r0)) params(2) = r0

    end subroutine

!********************************************************************************

subroutine teth_harm(r, params, enrg, frc)
    !! Calculates energy and its derivative for harmonic tether interaction. See
    !! [[teth_harm_set]].

    real(rp), intent(in) :: r
    real(rp), dimension(:), intent(in) :: params
    real(rp), intent(out) :: enrg
    real(rp), intent(out) :: frc

    enrg = 0.5_rp*params(1)*(r-params(2))*(r-params(2))
    frc = params(1)*(r-params(2))

    end subroutine

!******************************************************************************

end module ia_tether_m