17 integer,
parameter :: nreac=4, nspec=6
18 type (amns_handle_type
),
save :: amns
19 type (amns_handle_rx_type
),
save :: nuclear(nreac)
31 use coresource_identifier
, only: t_fusion=>fusion, get_type_name, get_type_description__ind
35 type (type_coreprof
),
pointer :: coreprof(:)
36 type (type_coresource
),
pointer :: coresource(:)
38 type (amns_reaction_type
) :: xx_rx
39 type (amns_query_type
) :: query
40 type (amns_answer_type
) :: answer
41 type (amns_set_type
) :: set
42 type (amns_reactants_type
) :: species
43 type (amns_reactant_type
) :: nuclei(nspec)
44 real (kind=R8),
allocatable :: energy(:), density(:,:), source(:,:), heating(:), rate(:)
45 integer :: i, j, nr, ns, nucindex, im, iz
46 integer,
save :: ions_index(nspec)
47 real (kind=R8),
save :: mass(nspec) = &
48 (/ itm_mass_h_1, itm_mass_h_2, itm_mass_h_3, itm_mass_he_3, itm_mass_he_4, itm_mn /)
49 integer (kind=R8),
save :: rm(4,nreac)
50 real (kind=R8),
save :: fusion_energy(nreac)
51 real (kind=R8) :: fraction
52 logical,
save :: first=.true.
56 call itm_amns_setup(amns)
57 query%string =
'version'
58 call itm_amns_query(amns,query,answer)
59 write(*,*)
'fusion: amns data base version = ',trim(answer%string)
61 nuclei(1) = amns_reactant_type(1, 0, 1, 0)
62 nuclei(2) = amns_reactant_type(1, 0, 2, 0)
63 nuclei(3) = amns_reactant_type(1, 0, 3, 0)
64 nuclei(4) = amns_reactant_type(2, 0, 3, 0)
65 nuclei(5) = amns_reactant_type(2, 0, 4, 0)
66 nuclei(6) = amns_reactant_type(0, 0, 1, 0)
68 rm(:,1) = (/ 2, 2, 1, 3 /)
69 rm(:,2) = (/ 2, 2, 6, 4 /)
70 rm(:,3) = (/ 2, 3, 6, 5 /)
71 rm(:,4) = (/ 2, 4, 1, 5 /)
75 im = nint(nuclei(rm(1,nr))%mi) + nint(nuclei(rm(2,nr))%mi) - &
76 nint(nuclei(rm(3,nr))%mi) - nint(nuclei(rm(4,nr))%mi)
78 write(*,*)
'fusion: baryons not conserved for reaction ', nr
81 iz = nint(nuclei(rm(1,nr))%zn) + nint(nuclei(rm(2,nr))%zn) - &
82 nint(nuclei(rm(3,nr))%zn) - nint(nuclei(rm(4,nr))%zn)
84 write(*,*)
'fusion: protons not conserved for reaction ', iz
90 allocate(species%components(4))
92 xx_rx%isotope_resolved=
'1'
95 species%components = (/ &
100 species%components(3)%LR=1
101 species%components(4)%LR=1
102 if(nuclei(rm(3,nr))%zn .eq.0.0_r8)
then
103 fraction = mass(rm(3,nr)) / (mass(rm(3,nr))+mass(rm(4,nr)))
104 elseif(nuclei(rm(4,nr))%zn .eq.0.0_r8)
then
105 fraction = mass(rm(4,nr)) / (mass(rm(3,nr))+mass(rm(4,nr)))
109 fusion_energy(nr) = &
110 (mass(rm(1,nr)) + mass(rm(2,nr)) - mass(rm(3,nr)) - mass(rm(4,nr))) * itm_c**2 * &
112 call itm_amns_setup_table(amns, xx_rx, species, nuclear(nr))
113 query%string =
'reactants'
114 call itm_amns_query_table(nuclear(nr), query, answer)
115 write(*,*)
'fusion: ', nr, trim(answer%string), fusion_energy(nr)/itm_qe/1.0e6
118 deallocate(species%components)
123 do i = 1,
size(coreprof(1)%ni%value, dim=2)
124 nucindex = coreprof(1)%compositions%ions(i)%nucindex
127 (nint(coreprof(1)%compositions%nuclei(nucindex)%zn) .eq. nuclei(ns)%zn) .and. &
128 (nint(coreprof(1)%compositions%nuclei(nucindex)%amn) .eq. nuclei(ns)%mi)
134 write(*,*)
'fusion: ions_index = ', ions_index
141 allocate(energy(
size(coreprof(1)%ni%value, dim=1)))
142 allocate(density(
size(energy),nspec))
143 allocate(source(
size(energy),nspec))
144 allocate(heating(
size(energy)))
145 allocate(rate(
size(energy)))
148 energy = sum(coreprof(1)%ti%value * coreprof(1)%ni%value, 2) / sum(coreprof(1)%ni%value,2)
153 if(ions_index(ns) .ne. 0)
then
154 density(:,ns) = coreprof(1)%ni%value(:,ions_index(ns))
162 call itm_amns_rx(nuclear(nr), rate, energy)
163 rate(:) = rate(:) * density(:,rm(1,nr)) * density(:,rm(2,nr))
164 if(rm(1,nr) .eq. rm(2,nr)) rate = rate * 0.5
165 source(:,rm(1,nr)) = source(:,rm(1,nr)) - rate(:)
166 source(:,rm(2,nr)) = source(:,rm(2,nr)) - rate(:)
167 source(:,rm(3,nr)) = source(:,rm(3,nr)) + rate(:)
168 source(:,rm(4,nr)) = source(:,rm(4,nr)) + rate(:)
169 heating(:) = heating + rate(:) * fusion_energy(nr)
172 write(*,*)
'fusion: density = ', density(1,:)
173 write(*,*)
'fusion: source = ', source(1,:)
174 write(*,*)
'fusion: heating = ', heating(1)
177 allocate(coresource(1))
178 allocate(coresource(1)%codeparam%codename(1))
179 allocate(coresource(1)%codeparam%codeversion(1))
180 allocate(coresource(1)%codeparam%output_diag(1))
181 coresource(1)%codeparam%codename =
'fusion'
182 coresource(1)%codeparam%codeversion = version
183 coresource(1)%codeparam%output_diag =
'OK'
184 coresource(1)%codeparam%output_flag = 0
185 coresource(1)%time = coreprof(1)%time
186 call copy_cpo(coreprof(1)%compositions, coresource(1)%compositions)
187 allocate(coresource(1)%values(1))
188 allocate(coresource(1)%values(1)%sourceid%id(1))
189 allocate(coresource(1)%values(1)%sourceid%description(1))
190 coresource(1)%values(1)%sourceid%flag = t_fusion
191 coresource(1)%values(1)%sourceid%id = get_type_name(t_fusion)
192 coresource(1)%values(1)%sourceid%description = get_type_description__ind(t_fusion)
193 call copy_cpo(coreprof(1)%rho_tor, coresource(1)%values(1)%rho_tor)
194 allocate(coresource(1)%values(1)%si%exp(
size(coreprof(1)%ni%value,dim=1),
size(coreprof(1)%ni%value,dim=2)))
195 coresource(1)%values(1)%si%exp=0
197 if(ions_index(ns) .ne. 0)
then
198 coresource(1)%values(1)%si%exp(:,ions_index(ns)) = source(:,ns)
201 allocate(coresource(1)%values(1)%qe%exp(
size(coreprof(1)%ni%value,dim=1)))
202 coresource(1)%values(1)%qe%exp(:)=heating(:)
205 deallocate(energy, density, source, heating, rate)
220 call itm_amns_finish_table(nuclear(nr))
222 call itm_amns_finish(amns)
subroutine fusion_sources(coreprof, coresource)
Module implementing fusion sources.
subroutine fusion_finalize()