ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fc2k_plasma_composition.f90
Go to the documentation of this file.
1 
2 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
3 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
4  SUBROUTINE fc2k_plasma_composition (COREPROF_DB, COREPROF_OUT, &
5  nion, nimp, nneut, &
6  amn_ion, zn_ion, z_ion, &
7  amn_imp, zn_imp, maxz_imp, &
8  ncomp_in, ntype_in, &
9  ncold, nthermal, nfast, nnbi)
10 
11 
12 ! +++ Declaration of variables:
13  use itm_types
14  USE euitm_schemas
16  USE copy_structures
17  USE deallocate_structures
19 
20 
21 
22  IMPLICIT NONE
23 
24 ! +++ CPO derived types:
25  TYPE (type_coreprof), POINTER :: coreprof_db(:) !input CPO slice
26  TYPE (type_coreprof), POINTER :: coreprof_out(:) !output CPO slice
27  TYPE (type_compositionc), POINTER :: compositionc(:)
28 
29 ! +++ Input:
30  INTEGER, PARAMETER :: nocur = 1 !number of CPO ocurancies in the work flow
31  INTEGER :: nnucl !number of nuclei species
32  INTEGER :: nion !number of ion species
33  INTEGER :: nimp !number of impurity species
34  INTEGER, ALLOCATABLE :: nzimp(:) !number of ionization states for each impurity
35  INTEGER :: nneut !number of neutrals species
36  INTEGER, ALLOCATABLE :: ncomp(:) !number of components for each neutral
37  INTEGER, ALLOCATABLE :: ntype(:) !number of types for each neutral
38 
39  INTEGER :: ncold, nthermal, nfast, nnbi
40 
41  REAL (R8) :: amn_ion(30), zn_ion(30), z_ion(30)
42  REAL (R8) :: amn_imp(100), zn_imp(100), maxz_imp(100)
43 
44  INTEGER :: ncomp_in(130)
45  INTEGER :: ntype_in(130)
46 
47 ! +++ Local:
48  REAL (R8), ALLOCATABLE :: amn(:), zn(:), zion(:)
49  REAL (R8), ALLOCATABLE :: amnimp(:), znimp(:), maxzimp(:)
50 
51 
52  ALLOCATE (amn(30), zn(30), zion(30))
53  ALLOCATE (amnimp(130), znimp(130), maxzimp(130))
54 
55  amn = amn_ion
56  zn = zn_ion
57  zion = z_ion
58  amnimp = amn_imp
59  znimp = zn_imp
60  maxzimp = maxz_imp
61 
62 
63 
64  CALL set_plasma_composition(coreprof_out, &
65  nion, nimp, nneut, &
66  amn, zn, zion, &
67  amnimp, znimp, maxzimp, &
68  ncomp_in, ntype_in, &
69  ncold, nthermal, nfast, nnbi)
70 
71 
72 
73  RETURN
74 
75 
76  END SUBROUTINE fc2k_plasma_composition
77 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
78 ! + + + + + + + + + + + + + + + + + + + + + + + + + + + +
subroutine fc2k_plasma_composition(COREPROF_DB, COREPROF_OUT, NION, NIMP, NNEUT, AMN_ION, ZN_ION, Z_ION, AMN_IMP, ZN_IMP, MAXZ_IMP, NCOMP_IN, NTYPE_IN, NCOLD, NTHERMAL, NFAST, NNBI)
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine set_plasma_composition(COREPROF_OUT, NION, NIMP, NNEUT, AMN_ION, ZN_ION, Z_ION, AMN_IMP, ZN_IMP, MAXZ_IMP, NCOMP_IN, NTYPE_IN, NCOLD, NTHERMAL, NFAST, NNBI)