stim_models.F90 Source File


This file depends on

sourcefile~~stim_models.f90~~EfferentGraph sourcefile~stim_models.f90 stim_models.F90 sourcefile~stim_variables.f90 stim_variables.F90 sourcefile~stim_models.f90->sourcefile~stim_variables.f90

Files dependent on this one

sourcefile~~stim_models.f90~~AfferentGraph sourcefile~stim_models.f90 stim_models.F90 sourcefile~gotm_stim.f90 gotm_stim.F90 sourcefile~gotm_stim.f90->sourcefile~stim_models.f90

Contents

Source Code


Source Code

   module stim_models
     !! Collection of the various ice models in STIM
     !!
     !! Author: Karsten Bolding

   use stim_variables

#if 0
#ifdef STIM_OBSICE
   use stim_obsice, only: init_stim_obsice, do_stim_obsice
#endif
#endif
#ifdef STIM_BASAL_MELT
   use stim_basal_melt, only: init_stim_basal_melt, do_stim_basal_melt, clean_stim_basal_melt
#endif
#ifdef STIM_LEBEDEV
   use stim_lebedev, only: init_stim_lebedev, do_stim_lebedev, clean_stim_lebedev
#endif
#ifdef STIM_MYLAKE
   use stim_mylake, only: init_stim_mylake, do_stim_mylake, clean_stim_mylake
#endif
#ifdef STIM_WINTON
   use stim_winton, only: init_stim_winton, do_stim_winton
#endif
   IMPLICIT NONE

   public

!-----------------------------------------------------------------------

   end module stim_models

!-----------------------------------------------------------------------
! Copyright by the STIM-team under the GNU Public License - www.gnu.org
!-----------------------------------------------------------------------