ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
fusion_sources_module.f90
Go to the documentation of this file.
1 
13 
15 
16  use amns_types
17  integer, parameter :: nreac=4, nspec=6
18  type (amns_handle_type), save :: amns ! AMNS global handle
19  type (amns_handle_rx_type), save :: nuclear(nreac) ! AMNS table handle
20 
21 contains
22 
23  subroutine fusion_sources(coreprof, coresource)
24 
25  use itm_types
26  use amns_module
27  use copy_structures
28  use ets_version
29  use itm_constants
30 ! use coresource_types, only: t_fusion=>fusion, get_type_name, get_type_description__ind ! itmconstants/1.0
31  use coresource_identifier, only: t_fusion=>fusion, get_type_name, get_type_description__ind ! itmconstants/1.3
32 
33  implicit none
34 
35  type (type_coreprof), pointer :: coreprof(:)
36  type (type_coresource), pointer :: coresource(:)
37 
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) ! p, D, T, 3He, 4He, n
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.
53  logical :: found
54 
55  if(first) then
56  call itm_amns_setup(amns) ! set up the AMNS system
57  query%string = 'version'
58  call itm_amns_query(amns,query,answer)
59  write(*,*) 'fusion: amns data base version = ',trim(answer%string)
60 
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)
67 
68  rm(:,1) = (/ 2, 2, 1, 3 /) ! D_D_p_T
69  rm(:,2) = (/ 2, 2, 6, 4 /) ! D_D_n_He
70  rm(:,3) = (/ 2, 3, 6, 5 /) ! D_T_n_He
71  rm(:,4) = (/ 2, 4, 1, 5 /) ! D_He_p_He
72 
73 ! sanity check for the reactions
74  do nr = 1, nreac
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)
77  if(im.ne.0) then
78  write(*,*) 'fusion: baryons not conserved for reaction ', nr
79  stop 'Error'
80  endif
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)
83  if(iz.ne.0) then
84  write(*,*) 'fusion: protons not conserved for reaction ', iz
85  stop 'Error'
86  endif
87  enddo
88 
89 ! calculate the information we will need later for the reactions
90  allocate(species%components(4)) ! set up reactants
91  xx_rx%string='NUC_TT' ! set up reaction
92  xx_rx%isotope_resolved='1'
93 
94  do nr = 1, nreac
95  species%components = (/ &
96  nuclei(rm(1,nr)), &
97  nuclei(rm(2,nr)), &
98  nuclei(rm(3,nr)), &
99  nuclei(rm(4,nr)) /)
100  species%components(3)%LR=1 ! product
101  species%components(4)%LR=1 ! product
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)))
106  else
107  fraction = 1.0_r8
108  endif
109  fusion_energy(nr) = &
110  (mass(rm(1,nr)) + mass(rm(2,nr)) - mass(rm(3,nr)) - mass(rm(4,nr))) * itm_c**2 * &
111  fraction
112  call itm_amns_setup_table(amns, xx_rx, species, nuclear(nr)) ! set up table
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
116  enddo
117 
118  deallocate(species%components)
119 
120 ! calculate the mapping vector from external to internal species
121  found = .false.
122  ions_index = 0
123  do i = 1, size(coreprof(1)%ni%value, dim=2)
124  nucindex = coreprof(1)%compositions%ions(i)%nucindex
125  do ns = 1, nspec
126  found = &
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)
129  if(found) then
130  ions_index(ns) = i
131  endif
132  enddo
133  enddo
134  write(*,*) 'fusion: ions_index = ', ions_index
135 
136  first = .false.
137 
138  endif
139 
140 ! arrays we will need
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)))
146 
147 ! energy of the reactants
148  energy = sum(coreprof(1)%ti%value * coreprof(1)%ni%value, 2) / sum(coreprof(1)%ni%value,2)
149 
150 ! densities of reactants
151  density = 0
152  do ns = 1, nspec
153  if(ions_index(ns) .ne. 0) then
154  density(:,ns) = coreprof(1)%ni%value(:,ions_index(ns))
155  endif
156  enddo
157 
158 ! calculate sources
159  source = 0
160  heating = 0
161  do nr = 1, nreac
162  call itm_amns_rx(nuclear(nr), rate, energy) ! get results
163  rate(:) = rate(:) * density(:,rm(1,nr)) * density(:,rm(2,nr))
164  if(rm(1,nr) .eq. rm(2,nr)) rate = rate * 0.5 ! this was missed earlier
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)
170  enddo
171 
172  write(*,*) 'fusion: density = ', density(1,:)
173  write(*,*) 'fusion: source = ', source(1,:)
174  write(*,*) 'fusion: heating = ', heating(1)
175 
176 ! prepare the output CPO
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
196  do ns = 1, nspec
197  if(ions_index(ns) .ne. 0) then
198  coresource(1)%values(1)%si%exp(:,ions_index(ns)) = source(:,ns)
199  endif
200  enddo
201  allocate(coresource(1)%values(1)%qe%exp(size(coreprof(1)%ni%value,dim=1)))
202  coresource(1)%values(1)%qe%exp(:)=heating(:)
203 
204 ! deallocate no longer needed internal arrays
205  deallocate(energy, density, source, heating, rate)
206 
207  return
208 
209  end subroutine fusion_sources
210 
211  subroutine fusion_finalize()
212 
213  use amns_module
214 
215  implicit none
216 
217  integer :: nr
218 
219  do nr = 1, nreac
220  call itm_amns_finish_table(nuclear(nr)) ! finish with table
221  enddo
222  call itm_amns_finish(amns) ! finish with amns
223 
224  end subroutine fusion_finalize
225 
226 end module fusion_sources_module
subroutine fusion_sources(coreprof, coresource)
Module implementing fusion sources.