system_utilities.f90 Source File


This file depends on

sourcefile~~system_utilities.f90~~EfferentGraph sourcefile~system_utilities.f90 system_utilities.f90 sourcefile~mpi_var.f90 mpi_var.f90 sourcefile~system_utilities.f90->sourcefile~mpi_var.f90 sourcefile~precision_def.f90 precision_def.F90 sourcefile~mpi_var.f90->sourcefile~precision_def.f90

Files dependent on this one

sourcefile~~system_utilities.f90~~AfferentGraph sourcefile~system_utilities.f90 system_utilities.f90 sourcefile~start_all.f90 start_all.F90 sourcefile~start_all.f90->sourcefile~system_utilities.f90 sourcefile~aladyn.f90 ALaDyn.F90 sourcefile~aladyn.f90->sourcefile~start_all.f90

Contents

Source Code


Source Code

!*****************************************************************************************************!
!                            Copyright 2008-2020  The ALaDyn Collaboration                            !
!*****************************************************************************************************!

!*****************************************************************************************************!
!  This file is part of ALaDyn.                                                                       !
!                                                                                                     !
!  ALaDyn is free software: you can redistribute it and/or modify                                     !
!  it under the terms of the GNU General Public License as published by                               !
!  the Free Software Foundation, either version 3 of the License, or                                  !
!  (at your option) any later version.                                                                !
!                                                                                                     !
!  ALaDyn is distributed in the hope that it will be useful,                                          !
!  but WITHOUT ANY WARRANTY; without even the implied warranty of                                     !
!  MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the                                      !
!  GNU General Public License for more details.                                                       !
!                                                                                                     !
!  You should have received a copy of the GNU General Public License                                  !
!  along with ALaDyn.  If not, see <http://www.gnu.org/licenses/>.                                    !
!*****************************************************************************************************!

 module system_utilities
  use mpi_var
  implicit none
 contains
!--------------------------

  subroutine create_timestep_folder(iout)
   integer, intent(in) :: iout
   character(4) :: foldername

   write (foldername, '(i4.4)') iout
   if (pe0) call create_folder(foldername)

  end subroutine

  subroutine create_initial_folders

   if (pe0) call create_folder('dumpRestart')
   if (pe0) call create_folder('diagnostics')
  end subroutine

!---------------------------
 end module