V3FIT
island_params.f90
Go to the documentation of this file.
1 !*******************************************************************************
4 !
5 ! Note separating the Doxygen comment block here so detailed decription is
6 ! found in the Module not the file.
7 !
9 !*******************************************************************************
11  USE stel_kinds
12  USE fourier, ONLY: fourier_class
13 
14  IMPLICIT NONE
15 
16 !*******************************************************************************
17 ! island_params module variables
18 !*******************************************************************************
19 ! Number of radial grid points.
20  INTEGER :: ns_i
21 ! Number of polodial grid points. FIXME: This should go in the fourier_class
22  INTEGER :: nu_i
23 ! Number of toroidal grid points. FIXME: This should go in the fourier_class
24  INTEGER :: nv_i
25 ! Number of polodial and toroidal grid points. FIXME: Is this really needed?
26  INTEGER :: nuv_i
27 ! Number of poloidal modes. FIXME: This should go in the fourier_class
28  INTEGER :: mpol_i
29 ! Number of toroidal modes. FIXME: This should go in the fourier_class
30  INTEGER :: ntor_i
31 ! Number of radial grid vmec grid points. FIXME: This should be in vmec_info
32  INTEGER :: ns_v
33 ! Number of poloidal vmec modes. FIXME: This should be in vmec_info
34  INTEGER :: mpol_v
35 ! Number of toroidal vmec modes. FIXME: This should be in vmec_info
36  INTEGER :: ntor_v
37 ! Number of field periods. FIXME: This should go in the fourier_class
38  INTEGER :: nfp_i
39 ! Number of total toroidal and poloidal vmec modes. FIXME: This should be in vmec_info
40  INTEGER :: mnmax_i
41 ! Number of radial points on the half mesh. FIXME: is this really needed?
42  INTEGER :: nsh
43 ! FIXME: These don't get used. Delete them.
44 ! INTEGER, ALLOCATABLE :: irefu(:)
45 ! INTEGER, ALLOCATABLE :: jrefv(:) ! -u, -v indices
47  REAL (dp) :: hs_i
51  REAL (dp) :: ohs_i
54  REAL (dp) :: dnorm_i
56  REAL (dp) :: gnorm_i
58  REAL (dp) :: wb_i
60  REAL (dp) :: wp_i
62  REAL (dp) :: volume_i
64  REAL (dp) :: rmajor_i
66  REAL(dp), PARAMETER :: gamma = 5._dp/3._dp
68  REAL(dp), ALLOCATABLE, DIMENSION(:) :: phipf_i
70  REAL(dp), ALLOCATABLE, DIMENSION(:) :: chipf_i
72  REAL(dp), ALLOCATABLE, DIMENSION(:) :: presf_i
74  REAL(dp), ALLOCATABLE, DIMENSION(:) :: vp_f
76  TYPE (fourier_class), POINTER :: fourier_context => null()
77 
78  END MODULE
island_params::dnorm_i
real(dp) dnorm_i
Differential area element. dudv 1/(ntheta*nzeta) (1)
Definition: island_params.f90:54
island_params::phipf_i
real(dp), dimension(:), allocatable phipf_i
Radial toroidal flux derivative.
Definition: island_params.f90:68
island_params::fourier_context
type(fourier_class), pointer fourier_context
Fourier transform object.
Definition: island_params.f90:76
fourier
Module contains subroutines for computing FFT on parallel radial intervals. Converts quantities betwe...
Definition: fourier.f90:13
island_params::wp_i
real(dp) wp_i
Thermal energy. 2Pi*wp read_wout_mod::wp.
Definition: island_params.f90:60
island_params::rmajor_i
real(dp) rmajor_i
Major radius.
Definition: island_params.f90:64
island_params
This file contains fix parameters related to the computational grids.
Definition: island_params.f90:10
island_params::wb_i
real(dp) wb_i
Magnetic energy. 2Pi*wb read_wout_mod::wb.
Definition: island_params.f90:58
island_params::gamma
real(dp), parameter gamma
Adiabatic constant.
Definition: island_params.f90:66
island_params::hs_i
real(dp) hs_i
Radial grid spacing. hs = s_i+1 - s_i.
Definition: island_params.f90:47
island_params::chipf_i
real(dp), dimension(:), allocatable chipf_i
Radial poloidal flux derivative.
Definition: island_params.f90:70
island_params::presf_i
real(dp), dimension(:), allocatable presf_i
Radial pressure. FIXME: Check if this is really needed.
Definition: island_params.f90:72
island_params::volume_i
real(dp) volume_i
Equilibrium volume read_wout_mod::volume.
Definition: island_params.f90:62
island_params::ohs_i
real(dp) ohs_i
Radial grid derivative factor. d X/ ds = (x_i+1 - x_i)/(s_i+1 - s_i) (1) Where ohs = 1/(s_i+1 - s_i) ...
Definition: island_params.f90:51
fourier::fourier_class
Base class containing fourier memory.
Definition: fourier.f90:77
island_params::vp_f
real(dp), dimension(:), allocatable vp_f
Volume of a radial grid surface.
Definition: island_params.f90:74