ETS  \$Id: Doxyfile 2162 2020-02-26 14:16:09Z g2dpc $
 All Classes Files Functions Variables Pages
etaigb.F90
Go to the documentation of this file.
1 SUBROUTINE etaigb(eq, coreprof, coretransp, code_parameters)
2 
3 !... a simple turbulent transport model using gyroBohm diffusion
4 !... includes an ITG threshold model
5 !... mainly for testing purposes
6 !... simple pinches are assumed to relax density to eta_e = etae_pinch
7 !... pure deuterium fully ionised neutral plasma is assumed
8 !... fluxes are assumed to be defined _between_ coreprof grid points
9 !... edit this if you want many ion species
10 
11 #ifdef MPI
12  USE mpes
13 #endif
14  USE phys_constants
15  USE mod_turb
16  USE etaigb_coeff
17 
18 
19  IMPLICIT NONE
20 
21  TYPE (type_equilibrium), pointer :: eq(:)
22  TYPE (type_coreprof), pointer :: coreprof(:)
23  TYPE (type_coretransp), pointer :: coretransp(:)
24  type (type_param) :: code_parameters
25 
26  INTEGER(ITM_I4) :: i,jm,j0,j1,j2
27  INTEGER(ITM_I4) :: nrho_prof,nion_prof
28  REAL(R8) :: x,aintm,aint0,aint1,aint2,xm,x0,x1,x2
29  REAL(R8) :: a00,b00,r00,hra
30  REAL(R8) :: nne,tte,nni,tti,taui,rlne,rlte,rlti,rhos,cs,zeff,qq
31  REAL(R8) :: rnue,rnui,beta,shat,rmue,epss,lperp
32  REAL(R8) :: chigb,ffe,ffi,gge,ggi
33  REAL(R8) :: diffe,diffi,chie,chii,vconve,vconvi,yconve,yconvi
34 
35 !... XML declarations
36 
37  integer(ITM_I4) :: return_status
38 
39  character(len = 132), target :: codename(1) = 'ETAIGB'
40  character(len = 132), target :: codeversion(1) = '0'
41 
42 !... if running MPI you need these
43 
44 #ifdef MPI
45  INTEGER :: mype,npes
46  CALL mpi_comm_size( mpi_comm_world, npes, ierr )
47  CALL mpi_comm_rank( mpi_comm_world, mype, ierr )
48 #endif
49 
50 !... find grid size for profiles
51 !... default sets grid size to that of profiles
52 !... find number of ion species also from coreprof
53 
54  nrho_prof=SIZE(coreprof(1)%rho_tor)
55  nion_prof=SIZE(coreprof(1)%ni%value)/nrho_prof
56 
57 !... allocations
58 
59  IF (.NOT. ASSOCIATED(coretransp)) THEN
60  ALLOCATE(coretransp(1))
61  allocate(coretransp(1)%values(1))
62 
63 !... open files and get parms
64 
65 #ifdef MPI
66  DO ipe=0,npes-1
67  IF (ipe == mype) THEN
68 #endif
69 
70  if (.not. associated(code_parameters%parameters)) then
71  write(6, *) 'ERROR: code parameters not associated!'
72  stop
73  else
74  allocate(coretransp(1)%codeparam%parameters(size(code_parameters%parameters)))
75  end if
76 
77  allocate(coretransp(1)%codeparam%codename(1))
78  allocate(coretransp(1)%codeparam%codeversion(1))
79 
80  coretransp(1)%codeparam%codename = codename
81  coretransp(1)%codeparam%codeversion = codeversion
82  coretransp(1)%codeparam%parameters = code_parameters%parameters
83 
84  call assign_etaigb_parameters(code_parameters, return_status)
85 
86  if (return_status /= 0) then
87  write(*,*) 'ERROR: Could not assign ETAIGB parameters.'
88  return
89  end if
90 
91  write(*,*) 'done assigning ETAIGB parameters'
92 
93 #ifdef MPI
94  END IF
95  CALL mpi_barrier(mpi_comm_world,ierr)
96  END DO
97 #endif
98 
99 !... allocations
100 
101  IF (nrho_transp == 0) nrho_transp = nrho_prof
102  IF (nion == 0) nion = nion_prof
103 
104  CALL turb_constructor(coretransp(1), 1, nrho_transp, nion)
105 
106 !... done initialisation
107 
108  END IF
109 
110 !... find grid sizes for transp
111 
112  nrho_transp=SIZE(coretransp(1)%values(1)%rho_tor)
113  nion=SIZE(coretransp(1)%values(1)%ti_transp%flux)/nrho_transp
114 
115 !... set up transport as a function of parameters
116 
117  a00=eq(1)%eqgeometry%a_minor
118  b00=eq(1)%global_param%toroid_field%b0
119  r00=eq(1)%global_param%toroid_field%r0
120 
121 !... set transport grid
122 
123  hra=1.0_r8/nrho_transp
124  coretransp(1)%values(1)%rho_tor_norm=(/ (hra*(i-0.5_r8),i=1,nrho_transp) /)
125  coretransp(1)%values(1)%rho_tor=coretransp(1)%values(1)%rho_tor_norm*a00
126 
127 !... at each location...
128 
129  j1=3
130  DO i=1,nrho_transp
131 
132 !... find the radial point against the coreprof grid
133 
134  x=coretransp(1)%values(1)%rho_tor(i)
135  DO WHILE (x >= coreprof(1)%rho_tor(j1) .AND. j1 < nrho_prof-1)
136  j1=j1+1
137  END DO
138 
139  j2=j1+1
140  j0=j1-1
141  jm=j1-2
142 
143  x2=coreprof(1)%rho_tor(j2)
144  x1=coreprof(1)%rho_tor(j1)
145  x0=coreprof(1)%rho_tor(j0)
146  xm=coreprof(1)%rho_tor(jm)
147 
148  aintm=(x-x0)*(x-x1)*(x-x2)/((xm-x0)*(xm-x1)*(xm-x2))
149  aint0=(x-xm)*(x-x1)*(x-x2)/((x0-xm)*(x0-x1)*(x0-x2))
150  aint1=(x-xm)*(x-x0)*(x-x2)/((x1-xm)*(x1-x0)*(x1-x2))
151  aint2=(x-xm)*(x-x0)*(x-x1)/((x2-xm)*(x2-x0)*(x2-x1))
152 
153 !... local parameters
154 
155  nne=aintm*coreprof(1)%ne%value(jm)+ &
156  aint0*coreprof(1)%ne%value(j0)+ &
157  aint1*coreprof(1)%ne%value(j1)+ &
158  aint2*coreprof(1)%ne%value(j2)
159  tte=aintm*coreprof(1)%te%value(jm)+ &
160  aint0*coreprof(1)%te%value(j0)+ &
161  aint1*coreprof(1)%te%value(j1)+ &
162  aint2*coreprof(1)%te%value(j2)
163  if(associated(coreprof(1)%profiles1d%zeff%value)) then
164  zeff=aintm*coreprof(1)%profiles1d%zeff%value(jm)+ &
165  aint0*coreprof(1)%profiles1d%zeff%value(j0)+ &
166  aint1*coreprof(1)%profiles1d%zeff%value(j1)+ &
167  aint2*coreprof(1)%profiles1d%zeff%value(j2)
168  else
169  zeff=1.0_r8
170  endif
171  nni=aintm*coreprof(1)%ni%value(jm,1)+ &
172  aint0*coreprof(1)%ni%value(j0,1)+ &
173  aint1*coreprof(1)%ni%value(j1,1)+ &
174  aint2*coreprof(1)%ni%value(j2,1)
175  tti=aintm*coreprof(1)%ti%value(jm,1)+ &
176  aint0*coreprof(1)%ti%value(j0,1)+ &
177  aint1*coreprof(1)%ti%value(j1,1)+ &
178  aint2*coreprof(1)%ti%value(j2,1)
179  qq=aintm*coreprof(1)%profiles1d%q%value(jm)+ &
180  aint0*coreprof(1)%profiles1d%q%value(j0)+ &
181  aint1*coreprof(1)%profiles1d%q%value(j1)+ &
182  aint2*coreprof(1)%profiles1d%q%value(j2)
183 
184 !... local gradients
185 
186  aintm=((x-x1)*(x-x2)+(x-x0)*(x-x2)+(x-x0)*(x-x1)) &
187  /((xm-x0)*(xm-x1)*(xm-x2))
188  aint0=((x-x1)*(x-x2)+(x-xm)*(x-x2)+(x-xm)*(x-x1)) &
189  /((x0-xm)*(x0-x1)*(x0-x2))
190  aint1=((x-x0)*(x-x2)+(x-xm)*(x-x2)+(x-xm)*(x-x0)) &
191  /((x1-xm)*(x1-x0)*(x1-x2))
192  aint2=((x-x0)*(x-x1)+(x-xm)*(x-x1)+(x-xm)*(x-x0)) &
193  /((x2-xm)*(x2-x0)*(x2-x1))
194 
195  rlne=aintm*coreprof(1)%ne%value(jm)+ &
196  aint0*coreprof(1)%ne%value(j0)+ &
197  aint1*coreprof(1)%ne%value(j1)+ &
198  aint2*coreprof(1)%ne%value(j2)
199  rlte=aintm*coreprof(1)%te%value(jm)+ &
200  aint0*coreprof(1)%te%value(j0)+ &
201  aint1*coreprof(1)%te%value(j1)+ &
202  aint2*coreprof(1)%te%value(j2)
203  rlti=aintm*coreprof(1)%ti%value(jm,1)+ &
204  aint0*coreprof(1)%ti%value(j0,1)+ &
205  aint1*coreprof(1)%ti%value(j1,1)+ &
206  aint2*coreprof(1)%ti%value(j2,1)
207  shat=aintm*coreprof(1)%profiles1d%q%value(jm)+ &
208  aint0*coreprof(1)%profiles1d%q%value(j0)+ &
209  aint1*coreprof(1)%profiles1d%q%value(j1)+ &
210  aint2*coreprof(1)%profiles1d%q%value(j2)
211 
212  rlne=rlne/nne
213  rlte=rlte/tte
214  rlti=rlti/tti
215  shat=shat*x/qq
216 
217 !... define local parameters
218 
219  rhos=cc*sqrt(md*kb*tte)/(ee*b00)
220  cs=sqrt(kb*tte/md)
221  taui=tti/tte
222 
223  beta=mu_0*nne*kb*tte/(b00*b00)
224  rmue=me/md
225  rnue=(lcoul/3.44e11_r8)*zeff*nne/(tte**1.5)
226  rnui=(lcoul/2.09e13_r8)*nni/(tti**1.5)
227 
228 !... normalised parameters
229 
230  lperp=1./max( 1./(64.*rhos), abs(rlte), abs(rlti), abs(rlne))
231 
232  epss=qq*r00/lperp
233  epss=epss*epss
234  rmue=rmue*epss
235  beta=beta*epss
236  rnue=rnue*lperp/cs
237 
238 !... the baseline gyroBohm diffusion coefficient uses R_0
239 !... simple downward correction due to usual beta values
240 
241  chigb=rhos*rhos*cs/r00
242 
243  chigb=chigb*40.0_r8/sqrt(1.0_r8+(beta_reduction*beta)**2.0_r8)
244 
245  chigb=chigb*max(tfloor, (1.0_r8-thresh/abs((r00*rlti))))
246 
247 !... the diffusion coefficients in this model
248 !... the coefficient is 3/2 due to the Poynting flux cancellation
249 
250  diffe=chigb/chi_d
251  diffi=diffe
252  chie=chigb
253  chii=chigb
254 
255  coretransp(1)%values(1)%ne_transp%diff_eff(i,2) = diffe
256  coretransp(1)%values(1)%te_transp%diff_eff(i) = chie
257  coretransp(1)%values(1)%ni_transp%diff_eff(i,1,2) = diffi
258  coretransp(1)%values(1)%ti_transp%diff_eff(i,1) = chii
259 
260 !... the effective flux velocities in this model
261 !... the coefficient is 3/2 due to the Poynting flux cancellation
262 !... for temperatures use the conductive part
263 
264  ffe= - diffe*(rlne-rlte/etae_pinch)/r00
265  gge= - chie*rlte/r00
266  ffi=ffe
267  ggi= - chii*rlti/r00
268 
269 !... basic pinch dynamics in this model
270 
271  coretransp(1)%values(1)%ne_transp%vconv_eff(i,2) = diffe*(rlte/etae_pinch)
272  coretransp(1)%values(1)%te_transp%vconv_eff(i) = 0._r8
273  coretransp(1)%values(1)%ni_transp%vconv_eff(i,1,2) = diffe*(rlte/etae_pinch)
274  coretransp(1)%values(1)%ti_transp%vconv_eff(i,1) = 0._r8
275 
276 !... the fluxes themselves
277 !... for a mean field conserved quantity solver heat fluxes are totals
278 !... different models can reconstruct theirs using the D's and V's
279 !... the coefficient is 3/2 due to the Poynting flux cancellation
280 
281  coretransp(1)%values(1)%ne_transp%flux(i) = nne*ffe
282  coretransp(1)%values(1)%te_transp%flux(i) = nne*kb*tte*(1.5_r8*ffe+gge)
283  coretransp(1)%values(1)%ni_transp%flux(i,1) = nni*ffe
284  coretransp(1)%values(1)%ti_transp%flux(i,1) = nni*kb*tti*(1.5_r8*ffe+ggi)
285 
286  END DO
287 
288 END SUBROUTINE etaigb
subroutine md
Definition: SPAR.f:347
subroutine, public turb_constructor(coretransp, nrho0, nrho, nion)
Definition: mod_turb.f90:14
subroutine eq(pcequi, psicon, ncequi, nstep, ngrid,
Definition: Eq_m.f:310
subroutine etaigb(eq, coreprof, coretransp, code_parameters)
Definition: etaigb.F90:1
subroutine assign_etaigb_parameters(codeparameters, return_status)