dyn_coupling.F90 Source File


Files dependent on this one

sourcefile~~dyn_coupling.f90~~AfferentGraph sourcefile~dyn_coupling.f90 dyn_coupling.F90 sourcefile~dyn_comp_impl.f90 dyn_comp_impl.F90 sourcefile~dyn_comp_impl.f90->sourcefile~dyn_coupling.f90 sourcefile~dyn_coupling_impl.f90 dyn_coupling_impl.F90 sourcefile~dyn_coupling_impl.f90->sourcefile~dyn_coupling.f90 sourcefile~stepon.f90 stepon.F90 sourcefile~stepon.f90->sourcefile~dyn_coupling.f90

Source Code

! Copyright (C) 2025 University Corporation for Atmospheric Research (UCAR)
! SPDX-License-Identifier: Apache-2.0

!> This module, part of the MPAS interface, integrates MPAS dynamical core with CAM-SIMA by
!> implementing the necessary APIs and managing their interaction.
!>
!> It implements the bidirectional coupling between dynamics and physics states.
!> For constituent states, their coupling is handled separately as a special case due to
!> complications in CAM-SIMA.
module dyn_coupling
    implicit none

    private
    ! Provide APIs required by CAM-SIMA.
    public :: dyn_exchange_constituent_states
    public :: dynamics_to_physics_coupling
    public :: physics_to_dynamics_coupling

    interface
        module subroutine dyn_exchange_constituent_states(direction, exchange, conversion)
            character(*), intent(in) :: direction
            logical, intent(in) :: exchange
            logical, intent(in) :: conversion
        end subroutine dyn_exchange_constituent_states

        module subroutine dynamics_to_physics_coupling()
        end subroutine dynamics_to_physics_coupling

        module subroutine physics_to_dynamics_coupling()
        end subroutine physics_to_dynamics_coupling
    end interface
contains
end module dyn_coupling