Skip to content
Snippets Groups Projects
modn_forefire.f90 1015 B
Newer Older
  • Learn to ignore specific revisions
  • Batti Filippi's avatar
    Batti Filippi committed
    !MNH_LIC Copyright 1994-2023 CNRS, Meteo-France and Universite Paul Sabatier
    
    !MNH_LIC This is part of the Meso-NH software governed by the CeCILL-C licence
    !MNH_LIC version 1. See LICENSE, CeCILL-C_V1-en.txt and CeCILL-C_V1-fr.txt  
    !MNH_LIC for details. version 1.
    !     ######spl
          MODULE MODN_FOREFIRE
    !     ##################
    !-------------------------------------------------------------------------------
    !***	MODN_FOREFIRE  Declaration of namelist NAM_FOREFIRE
    !
    !!    AUTHOR
    !!    ------
    !	           : P. Tulet (LACy / CNRM)
    
    Batti Filippi's avatar
    Batti Filippi committed
    !               X. Pialat (SPE)
    !               J.B.Filippi (SPE)
    
    !	Creation   : 09.10.2010
    !-------------------------------------------------------------------------------
    !
    !
    !*       0.   DECLARATIONS
    !             ------------
    !
    USE MODD_FOREFIRE
    !
    IMPLICIT NONE
    !
    NAMELIST /NAM_FOREFIRE/LFOREFIRE, COUPLINGRES, &
    		NFFSCALARS, FFSVNAMES, &
    		LFFCHEM, NFFCHEMVAR, FFCVNAMES, &
    		NFFCHEMVAROUT, FFCONAMES, &
    		FFOUTUPS, FLOWOUT, PHYSOUT, CHEMOUT
    ! 
    END MODULE MODN_FOREFIRE