8 amn_ion, zn_ion, z_ion, &
9 amn_imp, zn_imp, maxz_imp, &
11 ncold, nthermal, nfast, nnbi)
19 USE deallocate_structures
26 TYPE (type_coreprof
),
POINTER :: coreprof_out(:)
27 TYPE (type_compositionc
),
POINTER :: compositionc(:)
30 INTEGER,
PARAMETER :: nocur = 1
31 INTEGER :: nnucl, inucl
34 INTEGER,
ALLOCATABLE :: nzimp(:)
36 INTEGER :: nneut, ineut
37 INTEGER,
ALLOCATABLE :: ncomp(:)
39 INTEGER,
ALLOCATABLE :: ntype(:)
42 INTEGER :: ncold, nthermal, nfast, nnbi
44 REAL (R8),
ALLOCATABLE :: amn_ion(:), zn_ion(:), z_ion(:)
45 REAL (R8),
ALLOCATABLE :: amn_imp(:), zn_imp(:), maxz_imp(:)
47 INTEGER :: ncomp_in(:)
48 INTEGER :: ntype_in(:)
50 INTEGER,
ALLOCATABLE :: nucindex_ion(:)
51 INTEGER,
ALLOCATABLE :: nucindex_imp(:)
52 INTEGER,
ALLOCATABLE :: nucindex_neut(:)
53 INTEGER :: neut_flag(4)
54 CHARACTER :: neut_id(4)
55 CHARACTER :: neut_desc(4)
58 DATA neutrals /
'cold',
'thermal',
'fast',
'NBI'/
59 INTEGER :: intype(4), i, i_ion
62 REAL (R8),
ALLOCATABLE :: amn(:), zn(:)
68 IF(min(
SIZE(amn_ion),
SIZE(zn_ion),
SIZE(z_ion)).LT.nion)
THEN
69 WRITE (*,*)
'COMPOSITION INFORMATION IS NOT COMPETE FOR {1:NION}'
72 IF(min(
SIZE(amn_imp),
SIZE(zn_imp),
SIZE(maxz_imp)).LT.nimp)
THEN
73 WRITE (*,*)
'COMPOSITION INFORMATION IS NOT COMPETE FOR {1:NIMP}'
80 ALLOCATE (amn(nion+nimp))
81 ALLOCATE (zn(nion+nimp))
82 ALLOCATE (nucindex_ion(nion))
83 ALLOCATE (nucindex_imp(nimp))
84 ALLOCATE (nucindex_neut(nion+nimp))
89 IF (amn_ion(iion).GT.0._r8.AND.zn_ion(iion).GT.0._r8)
THEN
92 IF (abs(amn(inucl)-amn_ion(iion)) .LE. 0.25 .AND. &
93 abs(zn(inucl)-zn_ion(iion)) .LE. 0.25)
THEN
94 nucindex_ion(iion) = inucl
95 nucindex_neut(iion) = inucl
101 amn(nnucl) = amn_ion(iion)
102 zn(nnucl) = zn_ion(iion)
103 nucindex_ion(iion) = nnucl
104 nucindex_neut(iion) = nnucl
109 IF (amn_imp(iimp).GT.0._r8.AND.zn_imp(iimp).GT.0._r8)
THEN
112 IF (abs(amn(inucl)-amn_imp(iimp)) .LE. 0.25 .AND. &
113 abs(zn(inucl)-zn_imp(iimp)) .LE. 0.25)
THEN
114 nucindex_imp(iimp) = inucl
115 nucindex_neut(nion+iimp) = inucl
121 amn(nnucl) = amn_imp(iimp)
122 zn(nnucl) = zn_imp(iimp)
123 nucindex_imp(iimp) = nnucl
124 nucindex_neut(nion+iimp) = nnucl
132 ALLOCATE (nzimp(nimp))
136 nzimp(iimp) = int(maxz_imp(iimp))
143 ALLOCATE (ncomp(nneut))
144 ALLOCATE (ntype(nneut))
145 ncomp(1:nneut) = ncomp_in(1:nneut)
146 ntype(1:nneut) = ntype_in(1:nneut)
154 IF (intype(i).EQ.1)
THEN
157 neut_flag(itype) = i-1
173 compositionc(1)%compositions%NUCLEI(inucl)%zn = zn(inucl)
174 compositionc(1)%compositions%NUCLEI(inucl)%amn = amn(inucl)
175 compositionc(1)%compositions%NUCLEI(inucl)%label =
" "
182 compositionc(1)%compositions%IONS(iion)%nucindex = nucindex_ion(iion)
183 compositionc(1)%compositions%IONS(iion)%zion = z_ion(iion)
184 compositionc(1)%compositions%IONS(iion)%imp_flag = 0
185 compositionc(1)%compositions%IONS(iion)%label =
" "
192 compositionc(1)%compositions%IMPURITIES(iimp)%nucindex = nucindex_imp(iimp)
195 IF (nucindex_imp(iimp).EQ.nucindex_ion(iion)) i_ion = iion
197 compositionc(1)%compositions%IMPURITIES(iimp)%i_ion = i_ion
198 compositionc(1)%compositions%IMPURITIES(iimp)%nzimp = nzimp(iimp)
199 DO izimp = 1, nzimp(iimp)
200 compositionc(1)%compositions%IMPURITIES(iimp)%zmin(izimp) = izimp
201 compositionc(1)%compositions%IMPURITIES(iimp)%zmax(izimp) = izimp
202 compositionc(1)%compositions%IMPURITIES(iimp)%label(izimp) =
" "
210 DO icomp = 1, ncomp(ineut)
211 compositionc(1)%compositions%NEUTRALSCOMP(ineut)%NEUTCOMP(icomp)%nucindex = nucindex_neut(ineut)
212 compositionc(1)%compositions%NEUTRALSCOMP(ineut)%NEUTCOMP(icomp)%multiplicity = 1
214 DO itype = 1, ntype(ineut)
215 compositionc(1)%compositions%NEUTRALSCOMP(ineut)%TYPE(itype)%id = neut_id(itype)
216 compositionc(1)%compositions%NEUTRALSCOMP(ineut)%TYPE(itype)%flag = neut_flag(itype)
217 compositionc(1)%compositions%NEUTRALSCOMP(ineut)%TYPE(itype)%description = neut_desc(itype)
224 ALLOCATE (coreprof_out(1))
225 CALL copy_cpo(compositionc(1)%compositions, coreprof_out(1)%compositions)
230 CALL deallocate_cpo(compositionc)
239 DEALLOCATE (nucindex_ion)
240 DEALLOCATE (nucindex_imp)
241 DEALLOCATE (nucindex_neut)
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)
subroutine allocate_compositionc_cpo(NSLICE, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, COMPOSITIONC)