Loading [MathJax]/extensions/TeX/AMSmath.js
MPI-AMRVAC 3.1
The MPI - Adaptive Mesh Refinement - Versatile Advection Code (development version)
All Classes Namespaces Files Functions Variables Pages
mod_mhd_phys.t
Go to the documentation of this file.
1!> Magneto-hydrodynamics module
3
4#include "amrvac.h"
5
6 use mod_global_parameters, only: std_len, const_c
10 use mod_physics
11 use mod_comm_lib, only: mpistop
13
14 implicit none
15 private
16
17 !> The adiabatic index
18 double precision, public :: mhd_gamma = 5.d0/3.0d0
19 !> The adiabatic constant
20 double precision, public :: mhd_adiab = 1.0d0
21 !> The MHD resistivity
22 double precision, public :: mhd_eta = 0.0d0
23 !> The MHD hyper-resistivity
24 double precision, public :: mhd_eta_hyper = 0.0d0
25 !> Hall resistivity
26 double precision, public :: mhd_etah = 0.0d0
27 !> The MHD ambipolar coefficient
28 double precision, public :: mhd_eta_ambi = 0.0d0
29 !> The small_est allowed energy
30 double precision, protected :: small_e
31 !> Height of the mask used in the TRAC method
32 double precision, public, protected :: mhd_trac_mask = 0.d0
33 !> GLM-MHD parameter: ratio of the diffusive and advective time scales for div b
34 !> taking values within [0, 1]
35 double precision, public :: mhd_glm_alpha = 0.5d0
36 !> Reduced speed of light for semirelativistic MHD: 2% of light speed
37 double precision, public, protected :: mhd_reduced_c = 0.02d0*const_c
38 !> The thermal conductivity kappa in hyperbolic thermal conduction
39 double precision, public :: hypertc_kappa
40 !> Coefficient of diffusive divB cleaning
41 double precision :: divbdiff = 0.8d0
42 !> Helium abundance over Hydrogen
43 double precision, public, protected :: he_abundance=0.1d0
44 !> Ionization fraction of H
45 !> H_ion_fr = H+/(H+ + H)
46 double precision, public, protected :: h_ion_fr=1d0
47 !> Ionization fraction of He
48 !> He_ion_fr = (He2+ + He+)/(He2+ + He+ + He)
49 double precision, public, protected :: he_ion_fr=1d0
50 !> Ratio of number He2+ / number He+ + He2+
51 !> He_ion_fr2 = He2+/(He2+ + He+)
52 double precision, public, protected :: he_ion_fr2=1d0
53 ! used for eq of state when it is not defined by units,
54 ! the units do not contain terms related to ionization fraction
55 ! and it is p = RR * rho * T
56 double precision, public, protected :: rr=1d0
57 !> gamma minus one and its inverse
58 double precision :: gamma_1, inv_gamma_1
59 !> inverse of squared speed of light c0 and reduced speed of light c
60 double precision :: inv_squared_c0, inv_squared_c
61 !> equi vars indices in the state%equi_vars array
62 integer, public :: equi_rho0_ = -1
63 integer, public :: equi_pe0_ = -1
64 !> Number of tracer species
65 integer, public, protected :: mhd_n_tracer = 0
66 !> Index of the density (in the w array)
67 integer, public, protected :: rho_
68 !> Indices of the momentum density
69 integer, allocatable, public, protected :: mom(:)
70 !> Indices of the momentum density for the form of better vectorization
71 integer, public, protected :: ^c&m^C_
72 !> Index of the energy density (-1 if not present)
73 integer, public, protected :: e_
74 !> Indices of the momentum density for the form of better vectorization
75 integer, public, protected :: ^c&b^C_
76 !> Index of the gas pressure (-1 if not present) should equal e_
77 integer, public, protected :: p_
78 !> Index of the heat flux q
79 integer, public, protected :: q_
80 !> Indices of the GLM psi
81 integer, public, protected :: psi_
82 !> Indices of temperature
83 integer, public, protected :: te_
84 !> Index of the cutoff temperature for the TRAC method
85 integer, public, protected :: tcoff_
86 integer, public, protected :: tweight_
87 !> Indices of the tracers
88 integer, allocatable, public, protected :: tracer(:)
89 !> The number of waves
90 integer :: nwwave=8
91 !> Method type in a integer for good performance
92 integer :: type_divb
93 !> To skip * layer of ghost cells during divB=0 fix for boundary
94 integer, public, protected :: boundary_divbfix_skip(2*^nd)=0
95 ! DivB cleaning methods
96 integer, parameter :: divb_none = 0
97 integer, parameter :: divb_multigrid = -1
98 integer, parameter :: divb_glm = 1
99 integer, parameter :: divb_powel = 2
100 integer, parameter :: divb_janhunen = 3
101 integer, parameter :: divb_linde = 4
102 integer, parameter :: divb_lindejanhunen = 5
103 integer, parameter :: divb_lindepowel = 6
104 integer, parameter :: divb_lindeglm = 7
105 integer, parameter :: divb_ct = 8
106 !> Whether an energy equation is used
107 logical, public, protected :: mhd_energy = .true.
108 !> Whether thermal conduction is used
109 logical, public, protected :: mhd_thermal_conduction = .false.
110 !> Whether radiative cooling is added
111 logical, public, protected :: mhd_radiative_cooling = .false.
112 !> Whether thermal conduction is used
113 logical, public, protected :: mhd_hyperbolic_thermal_conduction = .false.
114 !> Whether viscosity is added
115 logical, public, protected :: mhd_viscosity = .false.
116 !> Whether gravity is added
117 logical, public, protected :: mhd_gravity = .false.
118 !> Whether rotating frame is activated
119 logical, public, protected :: mhd_rotating_frame = .false.
120 !> Whether Hall-MHD is used
121 logical, public, protected :: mhd_hall = .false.
122 !> Whether Ambipolar term is used
123 logical, public, protected :: mhd_ambipolar = .false.
124 !> Whether Ambipolar term is implemented using supertimestepping
125 logical, public, protected :: mhd_ambipolar_sts = .false.
126 !> Whether Ambipolar term is implemented explicitly
127 logical, public, protected :: mhd_ambipolar_exp = .false.
128 !> Whether particles module is added
129 logical, public, protected :: mhd_particles = .false.
130 !> Whether magnetofriction is added
131 logical, public, protected :: mhd_magnetofriction = .false.
132 !> Whether GLM-MHD is used to control div B
133 logical, public, protected :: mhd_glm = .false.
134 !> Whether extended GLM-MHD is used with additional sources
135 logical, public, protected :: mhd_glm_extended = .true.
136 !> Whether TRAC method is used
137 logical, public, protected :: mhd_trac = .false.
138 !> Which TRAC method is used
139 integer, public, protected :: mhd_trac_type=1
140 !> Distance between two adjacent traced magnetic field lines (in finest cell size)
141 integer, public, protected :: mhd_trac_finegrid=4
142 !> Whether internal energy is solved instead of total energy
143 logical, public, protected :: mhd_internal_e = .false.
144 !TODO this does not work with the splitting: check mhd_check_w_hde and mhd_handle_small_values_hde
145 !> Whether hydrodynamic energy is solved instead of total energy
146 logical, public, protected :: mhd_hydrodynamic_e = .false.
147 !> Whether divB cleaning sources are added splitting from fluid solver
148 logical, public, protected :: source_split_divb = .false.
149 !TODO this does not work with the splitting: check mhd_check_w_semirelati and mhd_handle_small_values_semirelati
150 !> Whether semirelativistic MHD equations (Gombosi 2002 JCP) are solved
151 logical, public, protected :: mhd_semirelativistic = .false.
152 !> Whether plasma is partially ionized
153 logical, public, protected :: mhd_partial_ionization = .false.
154 !> Whether CAK radiation line force is activated
155 logical, public, protected :: mhd_cak_force = .false.
156 !> MHD fourth order
157 logical, public, protected :: mhd_4th_order = .false.
158 !> whether split off equilibrium density
159 logical, public :: has_equi_rho0 = .false.
160 !> whether split off equilibrium thermal pressure
161 logical, public :: has_equi_pe0 = .false.
162 logical, public :: mhd_equi_thermal = .false.
163 !> whether dump full variables (when splitting is used) in a separate dat file
164 logical, public, protected :: mhd_dump_full_vars = .false.
165 !> Whether divB is computed with a fourth order approximation
166 integer, public, protected :: mhd_divb_nth = 1
167 !> Use a compact way to add resistivity
168 logical :: compactres = .false.
169 !> Add divB wave in Roe solver
170 logical, public :: divbwave = .true.
171 !> clean initial divB
172 logical, public :: clean_initial_divb = .false.
173 ! remove the below flag and assume default value = .false.
174 ! when eq state properly implemented everywhere
175 ! and not anymore through units
176 logical, public, protected :: eq_state_units = .true.
177 !> To control divB=0 fix for boundary
178 logical, public, protected :: boundary_divbfix(2*^nd)=.true.
179 !> B0 field is force-free
180 logical, public, protected :: b0field_forcefree=.true.
181 !> Whether an total energy equation is used
182 logical :: total_energy = .true.
183 !> Whether an internal or hydrodynamic energy equation is used
184 logical, public :: partial_energy = .false.
185 !> Whether gravity work is included in energy equation
186 logical :: gravity_energy
187 !> gravity work is calculated use density times velocity or conservative momentum
188 logical :: gravity_rhov = .false.
189 !> Method type to clean divergence of B
190 character(len=std_len), public, protected :: typedivbfix = 'linde'
191 !> Method type of constrained transport
192 character(len=std_len), public, protected :: type_ct = 'uct_contact'
193 !> Update all equations due to divB cleaning
194 character(len=std_len) :: typedivbdiff = 'all'
195 !> type of fluid for thermal conduction
196 type(tc_fluid), public, allocatable :: tc_fl
197 !> type of fluid for thermal emission synthesis
198 type(te_fluid), public, allocatable :: te_fl_mhd
199 !> type of fluid for radiative cooling
200 type(rc_fluid), public, allocatable :: rc_fl
201
202 !define the subroutine interface for the ambipolar mask
203 abstract interface
204
205 subroutine mask_subroutine(ixI^L,ixO^L,w,x,res)
207 integer, intent(in) :: ixi^l, ixo^l
208 double precision, intent(in) :: x(ixi^s,1:ndim)
209 double precision, intent(in) :: w(ixi^s,1:nw)
210 double precision, intent(inout) :: res(ixi^s)
211 end subroutine mask_subroutine
212
213 end interface
214
215 procedure(mask_subroutine), pointer :: usr_mask_ambipolar => null()
216 procedure(sub_convert), pointer :: mhd_to_primitive => null()
217 procedure(sub_convert), pointer :: mhd_to_conserved => null()
218 procedure(sub_small_values), pointer :: mhd_handle_small_values => null()
219 procedure(sub_get_pthermal), pointer :: mhd_get_pthermal => null()
220 procedure(sub_get_pthermal), pointer :: mhd_get_rfactor => null()
221 procedure(sub_get_pthermal), pointer :: mhd_get_temperature=> null()
222 ! Public methods
223 public :: usr_mask_ambipolar
224 public :: mhd_phys_init
225 public :: mhd_get_pthermal
226 public :: mhd_get_temperature
227 public :: mhd_get_v
228 public :: mhd_get_rho
229 public :: mhd_to_conserved
230 public :: mhd_to_primitive
231 public :: mhd_e_to_ei
232 public :: mhd_ei_to_e
233 public :: mhd_face_to_center
234 public :: get_divb
235 public :: get_current
236 !> needed public if we want to use the ambipolar coefficient in the user file
237 public :: multiplyambicoef
238 public :: get_normalized_divb
240 public :: mhd_mag_en_all
241 {^nooned
243 }
244
245contains
246
247 !> Read this module"s parameters from a file
248 subroutine mhd_read_params(files)
250 use mod_particles, only: particles_eta, particles_etah
251 character(len=*), intent(in) :: files(:)
252 integer :: n
253
254 namelist /mhd_list/ mhd_energy, mhd_n_tracer, mhd_gamma, mhd_adiab,&
258 typedivbdiff, type_ct, compactres, divbwave, he_abundance, &
261 particles_eta, particles_etah,has_equi_rho0, has_equi_pe0,mhd_equi_thermal,&
266
267 do n = 1, size(files)
268 open(unitpar, file=trim(files(n)), status="old")
269 read(unitpar, mhd_list, end=111)
270111 close(unitpar)
271 end do
272
273 end subroutine mhd_read_params
274
275 !> Write this module's parameters to a snapsoht
276 subroutine mhd_write_info(fh)
278 integer, intent(in) :: fh
279
280 integer :: er
281 integer, parameter :: n_par = 1
282 double precision :: values(n_par)
283 integer, dimension(MPI_STATUS_SIZE) :: st
284 character(len=name_len) :: names(n_par)
285
286 call mpi_file_write(fh, n_par, 1, mpi_integer, st, er)
287
288 names(1) = "gamma"
289 values(1) = mhd_gamma
290 call mpi_file_write(fh, values, n_par, mpi_double_precision, st, er)
291 call mpi_file_write(fh, names, n_par * name_len, mpi_character, st, er)
292 end subroutine mhd_write_info
293
294 subroutine mhd_phys_init()
299 use mod_gravity, only: gravity_init
300 use mod_particles, only: particles_init, particles_eta, particles_etah
305 use mod_cak_force, only: cak_init
308 {^nooned
310 }
311
312 integer :: itr, idir
313
314 call mhd_read_params(par_files)
315
316 if(mhd_internal_e) then
317 if(mhd_hydrodynamic_e) then
318 mhd_hydrodynamic_e=.false.
319 if(mype==0) write(*,*) 'WARNING: set mhd_hydrodynamic_e=F when mhd_internal_e=T'
320 end if
321 end if
322
323 if(mhd_semirelativistic) then
324 if(b0field) b0fieldalloccoarse=.true.
325 end if
326
327 if(.not. mhd_energy) then
328 if(mhd_internal_e) then
329 mhd_internal_e=.false.
330 if(mype==0) write(*,*) 'WARNING: set mhd_internal_e=F when mhd_energy=F'
331 end if
332 if(mhd_hydrodynamic_e) then
333 mhd_hydrodynamic_e=.false.
334 if(mype==0) write(*,*) 'WARNING: set mhd_hydrodynamic_e=F when mhd_energy=F'
335 end if
338 if(mype==0) write(*,*) 'WARNING: set mhd_thermal_conduction=F when mhd_energy=F'
339 end if
342 if(mype==0) write(*,*) 'WARNING: set mhd_hyperbolic_thermal_conduction=F when mhd_energy=F'
343 end if
344 if(mhd_radiative_cooling) then
346 if(mype==0) write(*,*) 'WARNING: set mhd_radiative_cooling=F when mhd_energy=F'
347 end if
348 if(mhd_trac) then
349 mhd_trac=.false.
350 if(mype==0) write(*,*) 'WARNING: set mhd_trac=F when mhd_energy=F'
351 end if
354 if(mype==0) write(*,*) 'WARNING: set mhd_partial_ionization=F when mhd_energy=F'
355 end if
356 if(b0field) then
357 b0field=.false.
358 if(mype==0) write(*,*) 'WARNING: set B0field=F when mhd_energy=F'
359 end if
360 if(has_equi_rho0) then
361 has_equi_rho0=.false.
362 if(mype==0) write(*,*) 'WARNING: set has_equi_rho0=F when mhd_energy=F'
363 end if
364 if(has_equi_pe0) then
365 has_equi_pe0=.false.
366 if(mype==0) write(*,*) 'WARNING: set has_equi_pe0=F when mhd_energy=F'
367 end if
368 end if
369 if(.not.eq_state_units) then
372 if(mype==0) write(*,*) 'WARNING: set mhd_partial_ionization=F when eq_state_units=F'
373 end if
374 end if
375
378 if(mype==0) write(*,*) 'WARNING: turn off parabolic TC when using hyperbolic TC'
379 end if
380
381
382 physics_type = "mhd"
383 phys_energy=mhd_energy
384 phys_internal_e=mhd_internal_e
387 phys_partial_ionization=mhd_partial_ionization
388
389 phys_gamma = mhd_gamma
391
392 if(mhd_energy) then
394 partial_energy=.true.
395 total_energy=.false.
396 else
397 partial_energy=.false.
398 total_energy=.true.
399 end if
400 else
401 total_energy=.false.
402 end if
403 phys_total_energy=total_energy
404 if(mhd_energy) then
405 if(mhd_internal_e) then
406 gravity_energy=.false.
407 else
408 gravity_energy=.true.
409 end if
410 if(has_equi_rho0) then
411 gravity_rhov=.true.
412 end if
414 gravity_rhov=.true.
415 end if
416 else
417 gravity_energy=.false.
418 end if
419
420 {^ifoned
421 if(mhd_trac .and. mhd_trac_type .gt. 2) then
423 if(mype==0) write(*,*) 'WARNING: reset mhd_trac_type=1 for 1D simulation'
424 end if
425 }
426 if(mhd_trac .and. mhd_trac_type .le. 4) then
427 mhd_trac_mask=bigdouble
428 if(mype==0) write(*,*) 'WARNING: set mhd_trac_mask==bigdouble for global TRAC method'
429 end if
431
432 ! set default gamma for polytropic/isothermal process
434 if(ndim==1) typedivbfix='none'
435 select case (typedivbfix)
436 case ('none')
437 type_divb = divb_none
438 {^nooned
439 case ('multigrid')
440 type_divb = divb_multigrid
441 use_multigrid = .true.
442 mg%operator_type = mg_laplacian
443 phys_global_source_after => mhd_clean_divb_multigrid
444 }
445 case ('glm')
446 mhd_glm = .true.
447 need_global_cmax = .true.
448 type_divb = divb_glm
449 case ('powel', 'powell')
450 type_divb = divb_powel
451 case ('janhunen')
452 type_divb = divb_janhunen
453 case ('linde')
454 type_divb = divb_linde
455 case ('lindejanhunen')
456 type_divb = divb_lindejanhunen
457 case ('lindepowel')
458 type_divb = divb_lindepowel
459 case ('lindeglm')
460 mhd_glm = .true.
461 need_global_cmax = .true.
462 type_divb = divb_lindeglm
463 case ('ct')
464 type_divb = divb_ct
465 stagger_grid = .true.
466 case default
467 call mpistop('Unknown divB fix')
468 end select
469
470 allocate(start_indices(number_species),stop_indices(number_species))
471 ! set the index of the first flux variable for species 1
472 start_indices(1)=1
473 ! Determine flux variables
474 rho_ = var_set_rho()
475
476 allocate(mom(ndir))
477 mom(:) = var_set_momentum(ndir)
478 m^c_=mom(^c);
479
480 ! Set index of energy variable
481 if (mhd_energy) then
482 nwwave = 8
483 e_ = var_set_energy() ! energy density
484 p_ = e_ ! gas pressure
485 else
486 nwwave = 7
487 e_ = -1
488 p_ = -1
489 end if
490
491 allocate(mag(ndir))
492 mag(:) = var_set_bfield(ndir)
493 b^c_=mag(^c);
494
495 if (mhd_glm) then
496 psi_ = var_set_fluxvar('psi', 'psi', need_bc=.false.)
497 else
498 psi_ = -1
499 end if
500
502 ! hyperbolic thermal conduction flux q
503 q_ = var_set_q()
504 need_global_cmax=.true.
505 else
506 q_=-1
507 end if
508
509 allocate(tracer(mhd_n_tracer))
510 ! Set starting index of tracers
511 do itr = 1, mhd_n_tracer
512 tracer(itr) = var_set_fluxvar("trc", "trp", itr, need_bc=.false.)
513 end do
514
515 !if(mhd_hyperbolic_thermal_conduction) then
516 ! ! hyperbolic thermal conduction flux q
517 ! q_ = var_set_auxvar('q','q')
518 ! need_global_cmax=.true.
519 !else
520 ! q_=-1
521 !end if
522
523 ! set temperature as an auxiliary variable to get ionization degree
525 te_ = var_set_auxvar('Te','Te')
526 else
527 te_ = -1
528 end if
529
530 ! set number of variables which need update ghostcells
531 nwgc=nwflux+nwaux
532
533 ! set the index of the last flux variable for species 1
534 stop_indices(1)=nwflux
535
536 ! set cutoff temperature when using the TRAC method, as well as an auxiliary weight
537 tweight_ = -1
538 if(mhd_trac) then
539 tcoff_ = var_set_wextra()
540 iw_tcoff=tcoff_
541 if(mhd_trac_type .ge. 3) then
542 tweight_ = var_set_wextra()
543 endif
544 else
545 tcoff_ = -1
546 end if
547
548 ! set indices of equi vars and update number_equi_vars
550 if(has_equi_rho0) then
553 iw_equi_rho = equi_rho0_
554 endif
555 if(has_equi_pe0) then
558 iw_equi_p = equi_pe0_
559 phys_equi_pe=.true.
560 endif
561 ! determine number of stagger variables
562 nws=ndim
563
564 nvector = 2 ! No. vector vars
565 allocate(iw_vector(nvector))
566 iw_vector(1) = mom(1) - 1 ! TODO: why like this?
567 iw_vector(2) = mag(1) - 1 ! TODO: why like this?
568
569 ! Check whether custom flux types have been defined
570 if (.not. allocated(flux_type)) then
571 allocate(flux_type(ndir, nwflux))
572 flux_type = flux_default
573 else if (any(shape(flux_type) /= [ndir, nwflux])) then
574 call mpistop("phys_check error: flux_type has wrong shape")
575 end if
576
577 if(nwflux>mag(ndir)) then
578 ! for flux of tracers, using hll flux
579 flux_type(:,mag(ndir)+1:nwflux)=flux_hll
580 end if
581
582 if(ndim>1) then
583 if(mhd_glm) then
584 flux_type(:,psi_)=flux_special
585 do idir=1,ndir
586 flux_type(idir,mag(idir))=flux_special
587 end do
588 else
589 do idir=1,ndir
590 flux_type(idir,mag(idir))=flux_tvdlf
591 end do
592 end if
593 end if
594
595 phys_get_rho => mhd_get_rho
596 phys_get_dt => mhd_get_dt
597 if(mhd_semirelativistic) then
598 if(mhd_energy) then
599 phys_get_cmax => mhd_get_cmax_semirelati
600 else
601 phys_get_cmax => mhd_get_cmax_semirelati_noe
602 end if
603 else
604 if(mhd_energy) then
605 phys_get_cmax => mhd_get_cmax_origin
606 else
607 phys_get_cmax => mhd_get_cmax_origin_noe
608 end if
609 end if
610 phys_get_a2max => mhd_get_a2max
611 phys_get_tcutoff => mhd_get_tcutoff
612 phys_get_h_speed => mhd_get_h_speed
613 if(has_equi_rho0) then
614 phys_get_cbounds => mhd_get_cbounds_split_rho
615 else if(mhd_semirelativistic) then
616 phys_get_cbounds => mhd_get_cbounds_semirelati
617 else
618 phys_get_cbounds => mhd_get_cbounds
619 end if
620 if(mhd_hydrodynamic_e) then
621 phys_to_primitive => mhd_to_primitive_hde
622 mhd_to_primitive => mhd_to_primitive_hde
623 phys_to_conserved => mhd_to_conserved_hde
624 mhd_to_conserved => mhd_to_conserved_hde
625 else if(mhd_semirelativistic) then
626 if(mhd_energy) then
627 phys_to_primitive => mhd_to_primitive_semirelati
628 mhd_to_primitive => mhd_to_primitive_semirelati
629 phys_to_conserved => mhd_to_conserved_semirelati
630 mhd_to_conserved => mhd_to_conserved_semirelati
631 else
632 phys_to_primitive => mhd_to_primitive_semirelati_noe
633 mhd_to_primitive => mhd_to_primitive_semirelati_noe
634 phys_to_conserved => mhd_to_conserved_semirelati_noe
635 mhd_to_conserved => mhd_to_conserved_semirelati_noe
636 end if
637 else
638 if(has_equi_rho0) then
639 phys_to_primitive => mhd_to_primitive_split_rho
640 mhd_to_primitive => mhd_to_primitive_split_rho
641 phys_to_conserved => mhd_to_conserved_split_rho
642 mhd_to_conserved => mhd_to_conserved_split_rho
643 else if(mhd_internal_e) then
644 phys_to_primitive => mhd_to_primitive_inte
645 mhd_to_primitive => mhd_to_primitive_inte
646 phys_to_conserved => mhd_to_conserved_inte
647 mhd_to_conserved => mhd_to_conserved_inte
648 else if(mhd_energy) then
649 phys_to_primitive => mhd_to_primitive_origin
650 mhd_to_primitive => mhd_to_primitive_origin
651 phys_to_conserved => mhd_to_conserved_origin
652 mhd_to_conserved => mhd_to_conserved_origin
653 else
654 phys_to_primitive => mhd_to_primitive_origin_noe
655 mhd_to_primitive => mhd_to_primitive_origin_noe
656 phys_to_conserved => mhd_to_conserved_origin_noe
657 mhd_to_conserved => mhd_to_conserved_origin_noe
658 end if
659 end if
660 if(mhd_hydrodynamic_e) then
661 phys_get_flux => mhd_get_flux_hde
662 else if(mhd_semirelativistic) then
663 if(mhd_energy) then
664 phys_get_flux => mhd_get_flux_semirelati
665 else
666 phys_get_flux => mhd_get_flux_semirelati_noe
667 end if
668 else
669 if(b0field.or.has_equi_rho0.or.has_equi_pe0) then
670 phys_get_flux => mhd_get_flux_split
671 else if(mhd_energy) then
672 phys_get_flux => mhd_get_flux
673 else
674 phys_get_flux => mhd_get_flux_noe
675 end if
676 end if
677 phys_get_v => mhd_get_v
678 if(mhd_semirelativistic) then
679 phys_add_source_geom => mhd_add_source_geom_semirelati
680 else if(b0field.or.has_equi_rho0) then
681 phys_add_source_geom => mhd_add_source_geom_split
682 else
683 phys_add_source_geom => mhd_add_source_geom
684 end if
685 phys_add_source => mhd_add_source
686 phys_check_params => mhd_check_params
687 phys_write_info => mhd_write_info
688
689 if(mhd_internal_e) then
690 phys_handle_small_values => mhd_handle_small_values_inte
691 mhd_handle_small_values => mhd_handle_small_values_inte
692 phys_check_w => mhd_check_w_inte
693 else if(mhd_hydrodynamic_e) then
694 phys_handle_small_values => mhd_handle_small_values_hde
695 mhd_handle_small_values => mhd_handle_small_values_hde
696 phys_check_w => mhd_check_w_hde
697 else if(mhd_semirelativistic) then
698 phys_handle_small_values => mhd_handle_small_values_semirelati
699 mhd_handle_small_values => mhd_handle_small_values_semirelati
700 phys_check_w => mhd_check_w_semirelati
701 else if(mhd_energy) then
702 phys_handle_small_values => mhd_handle_small_values_origin
703 mhd_handle_small_values => mhd_handle_small_values_origin
704 phys_check_w => mhd_check_w_origin
705 else
706 phys_handle_small_values => mhd_handle_small_values_noe
707 mhd_handle_small_values => mhd_handle_small_values_noe
708 phys_check_w => mhd_check_w_noe
709 end if
710
711 if(mhd_internal_e) then
712 phys_get_pthermal => mhd_get_pthermal_inte
713 mhd_get_pthermal => mhd_get_pthermal_inte
714 else if(mhd_hydrodynamic_e) then
715 phys_get_pthermal => mhd_get_pthermal_hde
716 mhd_get_pthermal => mhd_get_pthermal_hde
717 else if(mhd_semirelativistic) then
718 phys_get_pthermal => mhd_get_pthermal_semirelati
719 mhd_get_pthermal => mhd_get_pthermal_semirelati
720 else if(mhd_energy) then
721 phys_get_pthermal => mhd_get_pthermal_origin
722 mhd_get_pthermal => mhd_get_pthermal_origin
723 else
724 phys_get_pthermal => mhd_get_pthermal_noe
725 mhd_get_pthermal => mhd_get_pthermal_noe
726 end if
727
728 if(number_equi_vars>0) then
729 phys_set_equi_vars => set_equi_vars_grid
730 endif
731
732 if(type_divb==divb_glm) then
733 phys_modify_wlr => mhd_modify_wlr
734 end if
735
736 ! choose Rfactor in ideal gas law
738 mhd_get_rfactor=>rfactor_from_temperature_ionization
739 phys_update_temperature => mhd_update_temperature
740 else if(associated(usr_rfactor)) then
741 mhd_get_rfactor=>usr_rfactor
742 else
743 mhd_get_rfactor=>rfactor_from_constant_ionization
744 end if
745
747 mhd_get_temperature => mhd_get_temperature_from_te
748 else
749 if(mhd_internal_e) then
750 if(has_equi_pe0 .and. has_equi_rho0) then
751 mhd_get_temperature => mhd_get_temperature_from_eint_with_equi
752 else
753 mhd_get_temperature => mhd_get_temperature_from_eint
754 end if
755 else
756 if(has_equi_pe0 .and. has_equi_rho0) then
757 mhd_get_temperature => mhd_get_temperature_from_etot_with_equi
758 else
759 mhd_get_temperature => mhd_get_temperature_from_etot
760 end if
761 end if
762 end if
763
764 ! if using ct stagger grid, boundary divb=0 is not done here
765 if(stagger_grid) then
766 phys_get_ct_velocity => mhd_get_ct_velocity
767 phys_update_faces => mhd_update_faces
768 phys_face_to_center => mhd_face_to_center
769 phys_modify_wlr => mhd_modify_wlr
770 else if(ndim>1) then
771 phys_boundary_adjust => mhd_boundary_adjust
772 end if
773
774 {^nooned
775 ! clean initial divb
776 if(clean_initial_divb) phys_clean_divb => mhd_clean_divb_multigrid
777 }
778
779 ! derive units from basic units
780 call mhd_physical_units()
781
784 end if
785 if(.not. mhd_energy .and. mhd_thermal_conduction) then
786 call mpistop("thermal conduction needs mhd_energy=T")
787 end if
789 call mpistop("hyperbolic thermal conduction needs mhd_energy=T")
790 end if
791 if(.not. mhd_energy .and. mhd_radiative_cooling) then
792 call mpistop("radiative cooling needs mhd_energy=T")
793 end if
794
795 ! initialize thermal conduction module
796 if (mhd_thermal_conduction) then
797 call sts_init()
799
800 allocate(tc_fl)
801 call tc_get_mhd_params(tc_fl,tc_params_read_mhd)
802 call add_sts_method(mhd_get_tc_dt_mhd,mhd_sts_set_source_tc_mhd,e_,1,e_,1,.false.)
803 if(phys_internal_e) then
804 if(has_equi_pe0 .and. has_equi_rho0) then
805 tc_fl%get_temperature_from_conserved => mhd_get_temperature_from_eint_with_equi
806 else
807 tc_fl%get_temperature_from_conserved => mhd_get_temperature_from_eint
808 end if
809 else
810 if(has_equi_pe0 .and. has_equi_rho0) then
811 tc_fl%get_temperature_from_conserved => mhd_get_temperature_from_etot_with_equi
812 else
813 tc_fl%get_temperature_from_conserved => mhd_get_temperature_from_etot
814 end if
815 end if
816 if(has_equi_pe0 .and. has_equi_rho0) then
817 tc_fl%get_temperature_from_eint => mhd_get_temperature_from_eint_with_equi
818 if(mhd_equi_thermal) then
819 tc_fl%has_equi = .true.
820 tc_fl%get_temperature_equi => mhd_get_temperature_equi
821 tc_fl%get_rho_equi => mhd_get_rho_equi
822 else
823 tc_fl%has_equi = .false.
824 end if
825 else
826 tc_fl%get_temperature_from_eint => mhd_get_temperature_from_eint
827 end if
828 if(.not.mhd_internal_e) then
829 if(mhd_hydrodynamic_e) then
830 call set_conversion_methods_to_head(mhd_e_to_ei_hde, mhd_ei_to_e_hde)
831 else if(mhd_semirelativistic) then
832 call set_conversion_methods_to_head(mhd_e_to_ei_semirelati, mhd_ei_to_e_semirelati)
833 else
835 end if
836 end if
837 call set_error_handling_to_head(mhd_tc_handle_small_e)
838 tc_fl%get_rho => mhd_get_rho
839 tc_fl%e_ = e_
840 tc_fl%Tcoff_ = tcoff_
841 end if
842
843 ! Initialize radiative cooling module
844 if (mhd_radiative_cooling) then
846 allocate(rc_fl)
847 call radiative_cooling_init(rc_fl,rc_params_read)
848 rc_fl%get_rho => mhd_get_rho
849 rc_fl%get_pthermal => mhd_get_pthermal
850 rc_fl%get_var_Rfactor => mhd_get_rfactor
851 rc_fl%e_ = e_
852 rc_fl%Tcoff_ = tcoff_
853 if(has_equi_pe0 .and. has_equi_rho0 .and. mhd_equi_thermal) then
854 rc_fl%has_equi = .true.
855 rc_fl%get_rho_equi => mhd_get_rho_equi
856 rc_fl%get_pthermal_equi => mhd_get_pe_equi
857 else
858 rc_fl%has_equi = .false.
859 end if
860 end if
861 allocate(te_fl_mhd)
862 te_fl_mhd%get_rho=> mhd_get_rho
863 te_fl_mhd%get_pthermal=> mhd_get_pthermal
864 te_fl_mhd%get_var_Rfactor => mhd_get_rfactor
865{^ifthreed
866 phys_te_images => mhd_te_images
867}
868 ! Initialize viscosity module
869 if (mhd_viscosity) call viscosity_init(phys_wider_stencil)
870
871 ! Initialize gravity module
872 if(mhd_gravity) then
873 call gravity_init()
874 end if
875
876 ! Initialize rotating frame module
878
879 ! Initialize particles module
880 if(mhd_particles) then
881 call particles_init()
882 if (particles_eta < zero) particles_eta = mhd_eta
883 if (particles_etah < zero) particles_eta = mhd_etah
884 if(mype==0) then
885 write(*,*) '*****Using particles: with mhd_eta, mhd_etah :', mhd_eta, mhd_etah
886 write(*,*) '*****Using particles: particles_eta, particles_etah :', particles_eta, particles_etah
887 end if
888 end if
889
890 ! initialize magnetofriction module
891 if(mhd_magnetofriction) then
893 end if
894
895 ! For Hall, we need one more reconstructed layer since currents are computed
896 ! in mhd_get_flux: assuming one additional ghost layer (two for FOURTHORDER) was
897 ! added in nghostcells.
898 if(mhd_hall) then
899 if(mhd_4th_order) then
900 phys_wider_stencil = 2
901 else
902 phys_wider_stencil = 1
903 end if
904 end if
905
906 if(mhd_ambipolar) then
907 if(mhd_ambipolar_sts) then
908 call sts_init()
909 if(mhd_internal_e) then
910 call add_sts_method(get_ambipolar_dt,sts_set_source_ambipolar,mag(1),&
911 ndir,mag(1),ndir,.true.)
912 else
913 call add_sts_method(get_ambipolar_dt,sts_set_source_ambipolar,mom(ndir)+1,&
914 mag(ndir)-mom(ndir),mag(1),ndir,.true.)
915 end if
916 else
917 mhd_ambipolar_exp=.true.
918 ! For flux ambipolar term, we need one more reconstructed layer since currents are computed
919 ! in mhd_get_flux: assuming one additional ghost layer (two for FOURTHORDER) was
920 ! added in nghostcells.
921 if(mhd_4th_order) then
922 phys_wider_stencil = 2
923 else
924 phys_wider_stencil = 1
925 end if
926 end if
927 end if
928
929 ! initialize ionization degree table
931
932 ! Initialize CAK radiation force module
934
935 end subroutine mhd_phys_init
936
937{^ifthreed
938 subroutine mhd_te_images
941
942 select case(convert_type)
943 case('EIvtiCCmpi','EIvtuCCmpi')
945 case('ESvtiCCmpi','ESvtuCCmpi')
947 case('SIvtiCCmpi','SIvtuCCmpi')
949 case('WIvtiCCmpi','WIvtuCCmpi')
951 case default
952 call mpistop("Error in synthesize emission: Unknown convert_type")
953 end select
954 end subroutine mhd_te_images
955}
956
957!!start th cond
958 ! wrappers for STS functions in thermal_conductivity module
959 ! which take as argument the tc_fluid (defined in the physics module)
960 subroutine mhd_sts_set_source_tc_mhd(ixI^L,ixO^L,w,x,wres,fix_conserve_at_step,my_dt,igrid,nflux)
964 integer, intent(in) :: ixi^l, ixo^l, igrid, nflux
965 double precision, intent(in) :: x(ixi^s,1:ndim)
966 double precision, intent(inout) :: wres(ixi^s,1:nw), w(ixi^s,1:nw)
967 double precision, intent(in) :: my_dt
968 logical, intent(in) :: fix_conserve_at_step
969 call sts_set_source_tc_mhd(ixi^l,ixo^l,w,x,wres,fix_conserve_at_step,my_dt,igrid,nflux,tc_fl)
970 end subroutine mhd_sts_set_source_tc_mhd
971
972 function mhd_get_tc_dt_mhd(w,ixI^L,ixO^L,dx^D,x) result(dtnew)
973 !Check diffusion time limit dt < dx_i**2/((gamma-1)*tc_k_para_i/rho)
974 !where tc_k_para_i=tc_k_para*B_i**2/B**2
975 !and T=p/rho
978
979 integer, intent(in) :: ixi^l, ixo^l
980 double precision, intent(in) :: dx^d, x(ixi^s,1:ndim)
981 double precision, intent(in) :: w(ixi^s,1:nw)
982 double precision :: dtnew
983
984 dtnew=get_tc_dt_mhd(w,ixi^l,ixo^l,dx^d,x,tc_fl)
985 end function mhd_get_tc_dt_mhd
986
987 subroutine mhd_tc_handle_small_e(w, x, ixI^L, ixO^L, step)
989
990 integer, intent(in) :: ixi^l,ixo^l
991 double precision, intent(inout) :: w(ixi^s,1:nw)
992 double precision, intent(in) :: x(ixi^s,1:ndim)
993 integer, intent(in) :: step
994 character(len=140) :: error_msg
995
996 write(error_msg,"(a,i3)") "Thermal conduction step ", step
997 call mhd_handle_small_ei(w,x,ixi^l,ixo^l,e_,error_msg)
998 end subroutine mhd_tc_handle_small_e
999
1000 ! fill in tc_fluid fields from namelist
1001 subroutine tc_params_read_mhd(fl)
1003 type(tc_fluid), intent(inout) :: fl
1004
1005 double precision :: tc_k_para=0d0
1006 double precision :: tc_k_perp=0d0
1007 integer :: n
1008 ! list parameters
1009 logical :: tc_perpendicular=.false.
1010 logical :: tc_saturate=.false.
1011 character(len=std_len) :: tc_slope_limiter="MC"
1012
1013 namelist /tc_list/ tc_perpendicular, tc_saturate, tc_slope_limiter, tc_k_para, tc_k_perp
1014
1015 do n = 1, size(par_files)
1016 open(unitpar, file=trim(par_files(n)), status="old")
1017 read(unitpar, tc_list, end=111)
1018111 close(unitpar)
1019 end do
1020
1021 fl%tc_perpendicular = tc_perpendicular
1022 fl%tc_saturate = tc_saturate
1023 fl%tc_k_para = tc_k_para
1024 fl%tc_k_perp = tc_k_perp
1025 select case(tc_slope_limiter)
1026 case ('no','none')
1027 fl%tc_slope_limiter = 0
1028 case ('MC')
1029 ! montonized central limiter Woodward and Collela limiter (eq.3.51h), a factor of 2 is pulled out
1030 fl%tc_slope_limiter = 1
1031 case('minmod')
1032 ! minmod limiter
1033 fl%tc_slope_limiter = 2
1034 case ('superbee')
1035 ! Roes superbee limiter (eq.3.51i)
1036 fl%tc_slope_limiter = 3
1037 case ('koren')
1038 ! Barry Koren Right variant
1039 fl%tc_slope_limiter = 4
1040 case default
1041 call mpistop("Unknown tc_slope_limiter, choose MC, minmod")
1042 end select
1043 end subroutine tc_params_read_mhd
1044!!end th cond
1045
1046!!rad cool
1047 subroutine rc_params_read(fl)
1049 use mod_constants, only: bigdouble
1050 type(rc_fluid), intent(inout) :: fl
1051
1052 double precision :: cfrac=0.1d0
1053 !> Lower limit of temperature
1054 double precision :: tlow=bigdouble
1055 double precision :: rad_cut_hgt=0.5d0
1056 double precision :: rad_cut_dey=0.15d0
1057 integer :: n
1058 ! list parameters
1059 integer :: ncool = 4000
1060 !> Fixed temperature not lower than tlow
1061 logical :: tfix=.false.
1062 !> Add cooling source in a split way (.true.) or un-split way (.false.)
1063 logical :: rc_split=.false.
1064 logical :: rad_cut=.false.
1065 !> Name of cooling curve
1066 character(len=std_len) :: coolcurve='JCcorona'
1067 !> Name of cooling method
1068 character(len=std_len) :: coolmethod='exact'
1069
1070 namelist /rc_list/ coolcurve, coolmethod, ncool, cfrac, tlow, tfix, rc_split,rad_cut,rad_cut_hgt,rad_cut_dey
1071
1072 do n = 1, size(par_files)
1073 open(unitpar, file=trim(par_files(n)), status="old")
1074 read(unitpar, rc_list, end=111)
1075111 close(unitpar)
1076 end do
1077
1078 fl%ncool=ncool
1079 fl%coolcurve=coolcurve
1080 fl%coolmethod=coolmethod
1081 fl%tlow=tlow
1082 fl%Tfix=tfix
1083 fl%rc_split=rc_split
1084 fl%cfrac=cfrac
1085 fl%rad_cut=rad_cut
1086 fl%rad_cut_hgt=rad_cut_hgt
1087 fl%rad_cut_dey=rad_cut_dey
1088 end subroutine rc_params_read
1089!! end rad cool
1090
1091 !> sets the equilibrium variables
1092 subroutine set_equi_vars_grid_faces(igrid,x,ixI^L,ixO^L)
1094 use mod_usr_methods
1095 integer, intent(in) :: igrid, ixi^l, ixo^l
1096 double precision, intent(in) :: x(ixi^s,1:ndim)
1097
1098 double precision :: delx(ixi^s,1:ndim)
1099 double precision :: xc(ixi^s,1:ndim),xshift^d
1100 integer :: idims, ixc^l, hxo^l, ix, idims2
1101
1102 if(slab_uniform)then
1103 ^d&delx(ixi^s,^d)=rnode(rpdx^d_,igrid)\
1104 else
1105 ! for all non-cartesian and stretched cartesian coordinates
1106 delx(ixi^s,1:ndim)=ps(igrid)%dx(ixi^s,1:ndim)
1107 endif
1108
1109 do idims=1,ndim
1110 hxo^l=ixo^l-kr(idims,^d);
1111 if(stagger_grid) then
1112 ! ct needs all transverse cells
1113 ixcmax^d=ixomax^d+nghostcells-nghostcells*kr(idims,^d); ixcmin^d=hxomin^d-nghostcells+nghostcells*kr(idims,^d);
1114 else
1115 ! ixC is centered index in the idims direction from ixOmin-1/2 to ixOmax+1/2
1116 ixcmax^d=ixomax^d; ixcmin^d=hxomin^d;
1117 end if
1118 ! always xshift=0 or 1/2
1119 xshift^d=half*(one-kr(^d,idims));
1120 do idims2=1,ndim
1121 select case(idims2)
1122 {case(^d)
1123 do ix = ixc^lim^d
1124 ! xshift=half: this is the cell center coordinate
1125 ! xshift=0: this is the cell edge i+1/2 coordinate
1126 xc(ix^d%ixC^s,^d)=x(ix^d%ixC^s,^d)+(half-xshift^d)*delx(ix^d%ixC^s,^d)
1127 end do\}
1128 end select
1129 end do
1130 call usr_set_equi_vars(ixi^l,ixc^l,xc,ps(igrid)%equi_vars(ixi^s,1:number_equi_vars,idims))
1131 end do
1132
1133 end subroutine set_equi_vars_grid_faces
1134
1135 !> sets the equilibrium variables
1136 subroutine set_equi_vars_grid(igrid)
1138 use mod_usr_methods
1139
1140 integer, intent(in) :: igrid
1141
1142 !values at the center
1143 call usr_set_equi_vars(ixg^ll,ixg^ll,ps(igrid)%x,ps(igrid)%equi_vars(ixg^t,1:number_equi_vars,0))
1144
1145 !values at the interfaces
1146 call set_equi_vars_grid_faces(igrid,ps(igrid)%x,ixg^ll,ixm^ll)
1147
1148 end subroutine set_equi_vars_grid
1149
1150 ! w, wnew conserved, add splitted variables back to wnew
1151 function convert_vars_splitting(ixI^L,ixO^L, w, x, nwc) result(wnew)
1153 integer, intent(in) :: ixi^l,ixo^l, nwc
1154 double precision, intent(in) :: w(ixi^s, 1:nw)
1155 double precision, intent(in) :: x(ixi^s,1:ndim)
1156 double precision :: wnew(ixo^s, 1:nwc)
1157
1158 if(has_equi_rho0) then
1159 wnew(ixo^s,rho_)=w(ixo^s,rho_)+block%equi_vars(ixo^s,equi_rho0_,0)
1160 else
1161 wnew(ixo^s,rho_)=w(ixo^s,rho_)
1162 endif
1163 wnew(ixo^s,mom(:))=w(ixo^s,mom(:))
1164
1165 if (b0field) then
1166 ! add background magnetic field B0 to B
1167 wnew(ixo^s,mag(1:ndir))=w(ixo^s,mag(1:ndir))+block%B0(ixo^s,1:ndir,0)
1168 else
1169 wnew(ixo^s,mag(1:ndir))=w(ixo^s,mag(1:ndir))
1170 end if
1171
1172 if(mhd_energy) then
1173 wnew(ixo^s,e_)=w(ixo^s,e_)
1174 if(has_equi_pe0) then
1175 wnew(ixo^s,e_)=wnew(ixo^s,e_)+block%equi_vars(ixo^s,equi_pe0_,0)*inv_gamma_1
1176 end if
1177 if(b0field .and. total_energy) then
1178 wnew(ixo^s,e_)=wnew(ixo^s,e_)+0.5d0*sum(block%B0(ixo^s,:,0)**2,dim=ndim+1) &
1179 + sum(w(ixo^s,mag(:))*block%B0(ixo^s,:,0),dim=ndim+1)
1180 end if
1181 end if
1182
1183 end function convert_vars_splitting
1184
1185 subroutine mhd_check_params
1187 use mod_usr_methods
1189
1190 ! after user parameter setting
1191 gamma_1=mhd_gamma-1.d0
1192 if (.not. mhd_energy) then
1193 if (mhd_gamma <= 0.0d0) call mpistop ("Error: mhd_gamma <= 0")
1194 if (mhd_adiab < 0.0d0) call mpistop ("Error: mhd_adiab < 0")
1196 else
1197 if (mhd_gamma <= 0.0d0 .or. mhd_gamma == 1.0d0) &
1198 call mpistop ("Error: mhd_gamma <= 0 or mhd_gamma == 1")
1199 inv_gamma_1=1.d0/gamma_1
1200 small_e = small_pressure * inv_gamma_1
1201 end if
1202
1203 if (number_equi_vars > 0 .and. .not. associated(usr_set_equi_vars)) then
1204 call mpistop("usr_set_equi_vars has to be implemented in the user file")
1205 endif
1206 if(convert .or. autoconvert) then
1207 if(convert_type .eq. 'dat_generic_mpi') then
1208 if(mhd_dump_full_vars) then
1209 if(mype .eq. 0) print*, " add conversion method: split -> full "
1210 call add_convert_method(convert_vars_splitting, nw, cons_wnames, "new")
1211 endif
1212 endif
1213 endif
1214 end subroutine mhd_check_params
1215
1216 subroutine mhd_physical_units()
1218 double precision :: mp,kb,miu0,c_lightspeed
1219 double precision :: a,b
1220 ! Derive scaling units
1221 if(si_unit) then
1222 mp=mp_si
1223 kb=kb_si
1224 miu0=miu0_si
1225 c_lightspeed=c_si
1226 else
1227 mp=mp_cgs
1228 kb=kb_cgs
1229 miu0=4.d0*dpi ! G^2 cm^2 dyne^-1
1230 c_lightspeed=const_c
1231 end if
1232 if(eq_state_units) then
1233 a = 1d0 + 4d0 * he_abundance
1234 if(mhd_partial_ionization) then
1235 b = 2+.3d0
1236 else
1237 b = 1d0 + h_ion_fr + he_abundance*(he_ion_fr*(he_ion_fr2 + 1d0)+1d0)
1238 end if
1239 rr = 1d0
1240 else
1241 a = 1d0
1242 b = 1d0
1243 rr = (1d0 + h_ion_fr + he_abundance*(he_ion_fr*(he_ion_fr2 + 1d0)+1d0))/(1d0 + 4d0 * he_abundance)
1244 end if
1245 if(unit_density/=1.d0) then
1247 else
1248 ! unit of numberdensity is independent by default
1250 end if
1251 if(unit_velocity/=1.d0) then
1255 else if(unit_pressure/=1.d0) then
1259 else if(unit_magneticfield/=1.d0) then
1263 else if(unit_temperature/=1.d0) then
1267 end if
1268 if(unit_time/=1.d0) then
1270 else
1271 ! unit of length is independent by default
1273 end if
1274 ! Additional units needed for the particles
1275 c_norm=c_lightspeed/unit_velocity
1277 if (.not. si_unit) unit_charge = unit_charge*const_c
1279
1280 if(mhd_semirelativistic) then
1281 if(mhd_reduced_c<1.d0) then
1282 ! dimensionless speed
1283 inv_squared_c0=1.d0
1284 inv_squared_c=1.d0/mhd_reduced_c**2
1285 else
1286 inv_squared_c0=(unit_velocity/c_lightspeed)**2
1287 inv_squared_c=(unit_velocity/mhd_reduced_c)**2
1288 end if
1289 end if
1290
1291 end subroutine mhd_physical_units
1292
1293 subroutine mhd_check_w_semirelati(primitive,ixI^L,ixO^L,w,flag)
1295
1296 logical, intent(in) :: primitive
1297 logical, intent(inout) :: flag(ixi^s,1:nw)
1298 integer, intent(in) :: ixi^l, ixo^l
1299 double precision, intent(in) :: w(ixi^s,nw)
1300
1301 double precision :: tmp,b2,b(ixo^s,1:ndir)
1302 double precision :: v(ixo^s,1:ndir),gamma2,inv_rho
1303 integer :: ix^d
1304
1305 flag=.false.
1306 where(w(ixo^s,rho_) < small_density) flag(ixo^s,rho_) = .true.
1307
1308 if(mhd_energy) then
1309 if(primitive) then
1310 where(w(ixo^s,p_) < small_pressure) flag(ixo^s,e_) = .true.
1311 else
1312 if(mhd_internal_e) then
1313 {do ix^db=ixomin^db,ixomax^db \}
1314 if(w(ix^d,e_) < small_e) flag(ix^d,e_) = .true.
1315 {end do\}
1316 else
1317 {do ix^db=ixomin^db,ixomax^db \}
1318 b2=(^c&w(ix^d,b^c_)**2+)
1319 if(b2>smalldouble) then
1320 tmp=1.d0/sqrt(b2)
1321 else
1322 tmp=0.d0
1323 end if
1324 ^c&b(ix^d,^c)=w(ix^d,b^c_)*tmp\
1325 tmp=(^c&b(ix^d,^c)*w(ix^d,m^c_)+)
1326 inv_rho = 1d0/w(ix^d,rho_)
1327 ! Va^2/c^2
1328 b2=b2*inv_rho*inv_squared_c
1329 ! equation (15)
1330 gamma2=1.d0/(1.d0+b2)
1331 ! Convert momentum to velocity
1332 ^c&v(ix^d,^c)=gamma2*(w(ix^d,m^c_)+b2*b(ix^d,^c)*tmp*inv_rho)\
1333 ! E=Bxv
1334 {^ifthreec
1335 b(ix^d,1)=w(ix^d,b2_)*v(ix^d,3)-w(ix^d,b3_)*v(ix^d,2)
1336 b(ix^d,2)=w(ix^d,b3_)*v(ix^d,1)-w(ix^d,b1_)*v(ix^d,3)
1337 b(ix^d,3)=w(ix^d,b1_)*v(ix^d,2)-w(ix^d,b2_)*v(ix^d,1)
1338 }
1339 {^iftwoc
1340 b(ix^d,1)=zero
1341 ! switch 3 with 2 to allow ^C from 1 to 2
1342 b(ix^d,2)=w(ix^d,b1_)*v(ix^d,2)-w(ix^d,b2_)*v(ix^d,1)
1343 }
1344 {^ifonec
1345 b(ix^d,1)=zero
1346 }
1347 ! Calculate internal e = e-eK-eB-eE
1348 tmp=w(ix^d,e_)-half*((^c&v(ix^d,^c)**2+)*w(ix^d,rho_)&
1349 +(^c&w(ix^d,b^c_)**2+)+(^c&b(ix^d,^c)**2+)*inv_squared_c)
1350 if(tmp<small_e) flag(ix^d,e_)=.true.
1351 {end do\}
1352 end if
1353 end if
1354 end if
1355
1356 end subroutine mhd_check_w_semirelati
1357
1358 subroutine mhd_check_w_origin(primitive,ixI^L,ixO^L,w,flag)
1360
1361 logical, intent(in) :: primitive
1362 integer, intent(in) :: ixi^l, ixo^l
1363 double precision, intent(in) :: w(ixi^s,nw)
1364 logical, intent(inout) :: flag(ixi^s,1:nw)
1365
1366 double precision :: tmp
1367 integer :: ix^d
1368
1369 flag=.false.
1370 {do ix^db=ixomin^db,ixomax^db\}
1371 if(has_equi_rho0) then
1372 tmp=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
1373 else
1374 tmp=w(ix^d,rho_)
1375 end if
1376 if(tmp<small_density) flag(ix^d,rho_) = .true.
1377 if(primitive) then
1378 if(has_equi_pe0) then
1379 if(w(ix^d,p_)+block%equi_vars(ix^d,equi_pe0_,0)<small_pressure) flag(ix^d,e_) = .true.
1380 else
1381 if(w(ix^d,p_)<small_pressure) flag(ix^d,e_) = .true.
1382 end if
1383 else
1384 tmp=w(ix^d,e_)-half*((^c&w(ix^d,m^c_)**2+)/tmp+(^c&w(ix^d,b^c_)**2+))
1385 if(has_equi_pe0) then
1386 if(tmp+block%equi_vars(ix^d,equi_pe0_,0)*inv_gamma_1<small_e) flag(ix^d,e_) = .true.
1387 else
1388 if(tmp<small_e) flag(ix^d,e_) = .true.
1389 end if
1390 end if
1391 {end do\}
1392
1393 end subroutine mhd_check_w_origin
1394
1395 subroutine mhd_check_w_noe(primitive,ixI^L,ixO^L,w,flag)
1397
1398 logical, intent(in) :: primitive
1399 integer, intent(in) :: ixi^l, ixo^l
1400 double precision, intent(in) :: w(ixi^s,nw)
1401 logical, intent(inout) :: flag(ixi^s,1:nw)
1402
1403 integer :: ix^d
1404
1405 flag=.false.
1406 {do ix^db=ixomin^db,ixomax^db\}
1407 if(has_equi_rho0) then
1408 if(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)<small_density) flag(ix^d,rho_) = .true.
1409 else
1410 if(w(ix^d,rho_)<small_density) flag(ix^d,rho_) = .true.
1411 end if
1412 {end do\}
1413
1414 end subroutine mhd_check_w_noe
1415
1416 subroutine mhd_check_w_inte(primitive,ixI^L,ixO^L,w,flag)
1418
1419 logical, intent(in) :: primitive
1420 integer, intent(in) :: ixi^l, ixo^l
1421 double precision, intent(in) :: w(ixi^s,nw)
1422 logical, intent(inout) :: flag(ixi^s,1:nw)
1423
1424 integer :: ix^d
1425
1426 flag=.false.
1427 {do ix^db=ixomin^db,ixomax^db\}
1428 if(has_equi_rho0) then
1429 if(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)<small_density) flag(ix^d,rho_) = .true.
1430 else
1431 if(w(ix^d,rho_)<small_density) flag(ix^d,rho_) = .true.
1432 end if
1433 if(primitive) then
1434 if(has_equi_pe0) then
1435 if(w(ix^d,p_)+block%equi_vars(ix^d,equi_pe0_,0)<small_pressure) flag(ix^d,e_) = .true.
1436 else
1437 if(w(ix^d,p_) < small_pressure) flag(ix^d,e_) = .true.
1438 end if
1439 else
1440 if(has_equi_pe0) then
1441 if(w(ix^d,e_)+block%equi_vars(ix^d,equi_pe0_,0)*inv_gamma_1<small_e) flag(ix^d,e_) = .true.
1442 else
1443 if(w(ix^d,e_)<small_e) flag(ix^d,e_) = .true.
1444 end if
1445 end if
1446 {end do\}
1447
1448 end subroutine mhd_check_w_inte
1449
1450 subroutine mhd_check_w_hde(primitive,ixI^L,ixO^L,w,flag)
1452
1453 logical, intent(in) :: primitive
1454 integer, intent(in) :: ixi^l, ixo^l
1455 double precision, intent(in) :: w(ixi^s,nw)
1456 logical, intent(inout) :: flag(ixi^s,1:nw)
1457
1458 integer :: ix^d
1459
1460 flag=.false.
1461 {do ix^db=ixomin^db,ixomax^db\}
1462 if(w(ix^d,rho_)<small_density) flag(ix^d,rho_) = .true.
1463 if(primitive) then
1464 if(w(ix^d,p_)<small_pressure) flag(ix^d,e_) = .true.
1465 else
1466 if(w(ix^d,e_)-half*(^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)<small_e) flag(ix^d,e_) = .true.
1467 end if
1468 {end do\}
1469
1470 end subroutine mhd_check_w_hde
1471
1472 !> Transform primitive variables into conservative ones
1473 subroutine mhd_to_conserved_origin(ixI^L,ixO^L,w,x)
1475 integer, intent(in) :: ixi^l, ixo^l
1476 double precision, intent(inout) :: w(ixi^s, nw)
1477 double precision, intent(in) :: x(ixi^s, 1:ndim)
1478
1479 integer :: ix^d
1480
1481 {do ix^db=ixomin^db,ixomax^db\}
1482 ! Calculate total energy from pressure, kinetic and magnetic energy
1483 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1&
1484 +half*((^c&w(ix^d,m^c_)**2+)*w(ix^d,rho_)&
1485 +(^c&w(ix^d,b^c_)**2+))
1486 ! Convert velocity to momentum
1487 ^c&w(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,m^c_)\
1488 {end do\}
1489
1490 end subroutine mhd_to_conserved_origin
1491
1492 !> Transform primitive variables into conservative ones
1493 subroutine mhd_to_conserved_origin_noe(ixI^L,ixO^L,w,x)
1495 integer, intent(in) :: ixi^l, ixo^l
1496 double precision, intent(inout) :: w(ixi^s, nw)
1497 double precision, intent(in) :: x(ixi^s, 1:ndim)
1498
1499 integer :: ix^d
1500
1501 {do ix^db=ixomin^db,ixomax^db\}
1502 ! Convert velocity to momentum
1503 ^c&w(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,m^c_)\
1504 {end do\}
1505
1506 end subroutine mhd_to_conserved_origin_noe
1507
1508 !> Transform primitive variables into conservative ones
1509 subroutine mhd_to_conserved_hde(ixI^L,ixO^L,w,x)
1511 integer, intent(in) :: ixi^l, ixo^l
1512 double precision, intent(inout) :: w(ixi^s, nw)
1513 double precision, intent(in) :: x(ixi^s, 1:ndim)
1514
1515 integer :: ix^d
1516
1517 {do ix^db=ixomin^db,ixomax^db\}
1518 ! Calculate total energy from pressure, kinetic and magnetic energy
1519 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1&
1520 +half*(^c&w(ix^d,m^c_)**2+)*w(ix^d,rho_)
1521 ! Convert velocity to momentum
1522 ^c&w(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,m^c_)\
1523 {end do\}
1524
1525 end subroutine mhd_to_conserved_hde
1526
1527 !> Transform primitive variables into conservative ones
1528 subroutine mhd_to_conserved_inte(ixI^L,ixO^L,w,x)
1530 integer, intent(in) :: ixi^l, ixo^l
1531 double precision, intent(inout) :: w(ixi^s, nw)
1532 double precision, intent(in) :: x(ixi^s, 1:ndim)
1533
1534 integer :: ix^d
1535
1536 {do ix^db=ixomin^db,ixomax^db\}
1537 ! Calculate total energy from pressure, kinetic and magnetic energy
1538 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1
1539 ! Convert velocity to momentum
1540 ^c&w(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,m^c_)\
1541 {end do\}
1542
1543 end subroutine mhd_to_conserved_inte
1544
1545 !> Transform primitive variables into conservative ones
1546 subroutine mhd_to_conserved_split_rho(ixI^L,ixO^L,w,x)
1548 integer, intent(in) :: ixi^l, ixo^l
1549 double precision, intent(inout) :: w(ixi^s, nw)
1550 double precision, intent(in) :: x(ixi^s, 1:ndim)
1551
1552 double precision :: rho
1553 integer :: ix^d
1554
1555 {do ix^db=ixomin^db,ixomax^db\}
1556 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i)
1557 ! Calculate total energy from pressure, kinetic and magnetic energy
1558 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1&
1559 +half*((^c&w(ix^d,m^c_)**2+)*rho&
1560 +(^c&w(ix^d,b^c_)**2+))
1561 ! Convert velocity to momentum
1562 ^c&w(ix^d,m^c_)=rho*w(ix^d,m^c_)\
1563 {end do\}
1564
1565 end subroutine mhd_to_conserved_split_rho
1566
1567 !> Transform primitive variables into conservative ones
1568 subroutine mhd_to_conserved_semirelati(ixI^L,ixO^L,w,x)
1570 integer, intent(in) :: ixi^l, ixo^l
1571 double precision, intent(inout) :: w(ixi^s, nw)
1572 double precision, intent(in) :: x(ixi^s, 1:ndim)
1573
1574 double precision :: e(ixo^s,1:ndir), s(ixo^s,1:ndir)
1575 integer :: ix^d
1576
1577 {do ix^db=ixomin^db,ixomax^db\}
1578 {^ifthreec
1579 e(ix^d,1)=w(ix^d,b2_)*w(ix^d,m3_)-w(ix^d,b3_)*w(ix^d,m2_)
1580 e(ix^d,2)=w(ix^d,b3_)*w(ix^d,m1_)-w(ix^d,b1_)*w(ix^d,m3_)
1581 e(ix^d,3)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
1582 s(ix^d,1)=e(ix^d,2)*w(ix^d,b3_)-e(ix^d,3)*w(ix^d,b2_)
1583 s(ix^d,2)=e(ix^d,3)*w(ix^d,b1_)-e(ix^d,1)*w(ix^d,b3_)
1584 s(ix^d,3)=e(ix^d,1)*w(ix^d,b2_)-e(ix^d,2)*w(ix^d,b1_)
1585 }
1586 {^iftwoc
1587 e(ix^d,1)=zero
1588 ! switch 3 with 2 to add 3 when ^C from 1 to 2
1589 e(ix^d,2)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
1590 s(ix^d,1)=-e(ix^d,2)*w(ix^d,b2_)
1591 s(ix^d,2)=e(ix^d,2)*w(ix^d,b1_)
1592 }
1593 {^ifonec
1594 e(ix^d,1)=zero
1595 s(ix^d,1)=zero
1596 }
1597 if(mhd_internal_e) then
1598 ! internal energy
1599 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1
1600 else
1601 ! equation (9)
1602 ! Calculate total energy from internal, kinetic and magnetic energy
1603 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1&
1604 +half*((^c&w(ix^d,m^c_)**2+)*w(ix^d,rho_)&
1605 +(^c&w(ix^d,b^c_)**2+)&
1606 +(^c&e(ix^d,^c)**2+)*inv_squared_c)
1607 end if
1608
1609 ! Convert velocity to momentum, equation (9)
1610 ^c&w(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,m^c_)+s(ix^d,^c)*inv_squared_c\
1611
1612 {end do\}
1613
1614 end subroutine mhd_to_conserved_semirelati
1615
1616 subroutine mhd_to_conserved_semirelati_noe(ixI^L,ixO^L,w,x)
1618 integer, intent(in) :: ixi^l, ixo^l
1619 double precision, intent(inout) :: w(ixi^s, nw)
1620 double precision, intent(in) :: x(ixi^s, 1:ndim)
1621
1622 double precision :: e(ixo^s,1:ndir), s(ixo^s,1:ndir)
1623 integer :: ix^d
1624
1625 {do ix^db=ixomin^db,ixomax^db\}
1626 {^ifthreec
1627 e(ix^d,1)=w(ix^d,b2_)*w(ix^d,m3_)-w(ix^d,b3_)*w(ix^d,m2_)
1628 e(ix^d,2)=w(ix^d,b3_)*w(ix^d,m1_)-w(ix^d,b1_)*w(ix^d,m3_)
1629 e(ix^d,3)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
1630 s(ix^d,1)=e(ix^d,2)*w(ix^d,b3_)-e(ix^d,3)*w(ix^d,b2_)
1631 s(ix^d,2)=e(ix^d,3)*w(ix^d,b1_)-e(ix^d,1)*w(ix^d,b3_)
1632 s(ix^d,3)=e(ix^d,1)*w(ix^d,b2_)-e(ix^d,2)*w(ix^d,b1_)
1633 }
1634 {^iftwoc
1635 e(ix^d,1)=zero
1636 ! switch 3 with 2 to add 3 when ^C from 1 to 2
1637 e(ix^d,2)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
1638 s(ix^d,1)=-e(ix^d,2)*w(ix^d,b2_)
1639 s(ix^d,2)=e(ix^d,2)*w(ix^d,b1_)
1640 }
1641 {^ifonec
1642 s(ix^d,1)=zero
1643 }
1644 ! Convert velocity to momentum, equation (9)
1645 ^c&w(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,m^c_)+s(ix^d,^c)*inv_squared_c\
1646
1647 {end do\}
1648
1649 end subroutine mhd_to_conserved_semirelati_noe
1650
1651 !> Transform conservative variables into primitive ones
1652 subroutine mhd_to_primitive_origin(ixI^L,ixO^L,w,x)
1654 integer, intent(in) :: ixi^l, ixo^l
1655 double precision, intent(inout) :: w(ixi^s, nw)
1656 double precision, intent(in) :: x(ixi^s, 1:ndim)
1657
1658 double precision :: inv_rho
1659 integer :: ix^d
1660
1661 if (fix_small_values) then
1662 ! fix small values preventing NaN numbers in the following converting
1663 call mhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'mhd_to_primitive_origin')
1664 end if
1665
1666 {do ix^db=ixomin^db,ixomax^db\}
1667 inv_rho = 1.d0/w(ix^d,rho_)
1668 ! Convert momentum to velocity
1669 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)*inv_rho\
1670 ! Calculate pressure = (gamma-1) * (e-ek-eb)
1671 w(ix^d,p_)=gamma_1*(w(ix^d,e_)&
1672 -half*(w(ix^d,rho_)*(^c&w(ix^d,m^c_)**2+)&
1673 +(^c&w(ix^d,b^c_)**2+)))
1674 {end do\}
1675
1676 end subroutine mhd_to_primitive_origin
1677
1678 !> Transform conservative variables into primitive ones
1679 subroutine mhd_to_primitive_origin_noe(ixI^L,ixO^L,w,x)
1681 integer, intent(in) :: ixi^l, ixo^l
1682 double precision, intent(inout) :: w(ixi^s, nw)
1683 double precision, intent(in) :: x(ixi^s, 1:ndim)
1684
1685 double precision :: inv_rho
1686 integer :: ix^d
1687
1688 if (fix_small_values) then
1689 ! fix small values preventing NaN numbers in the following converting
1690 call mhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'mhd_to_primitive_origin_noe')
1691 end if
1692
1693 {do ix^db=ixomin^db,ixomax^db\}
1694 inv_rho = 1.d0/w(ix^d,rho_)
1695 ! Convert momentum to velocity
1696 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)*inv_rho\
1697 {end do\}
1698
1699 end subroutine mhd_to_primitive_origin_noe
1700
1701 !> Transform conservative variables into primitive ones
1702 subroutine mhd_to_primitive_hde(ixI^L,ixO^L,w,x)
1704 integer, intent(in) :: ixi^l, ixo^l
1705 double precision, intent(inout) :: w(ixi^s, nw)
1706 double precision, intent(in) :: x(ixi^s, 1:ndim)
1707
1708 double precision :: inv_rho
1709 integer :: ix^d
1710
1711 if (fix_small_values) then
1712 ! fix small values preventing NaN numbers in the following converting
1713 call mhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'mhd_to_primitive_hde')
1714 end if
1715
1716 {do ix^db=ixomin^db,ixomax^db\}
1717 inv_rho = 1d0/w(ix^d,rho_)
1718 ! Convert momentum to velocity
1719 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)*inv_rho\
1720 ! Calculate pressure = (gamma-1) * (e-ek)
1721 w(ix^d,p_)=gamma_1*(w(ix^d,e_)-half*w(ix^d,rho_)*(^c&w(ix^d,m^c_)**2+))
1722 {end do\}
1723
1724 end subroutine mhd_to_primitive_hde
1725
1726 !> Transform conservative variables into primitive ones
1727 subroutine mhd_to_primitive_inte(ixI^L,ixO^L,w,x)
1729 integer, intent(in) :: ixi^l, ixo^l
1730 double precision, intent(inout) :: w(ixi^s, nw)
1731 double precision, intent(in) :: x(ixi^s, 1:ndim)
1732
1733 double precision :: inv_rho
1734 integer :: ix^d
1735
1736 if (fix_small_values) then
1737 ! fix small values preventing NaN numbers in the following converting
1738 call mhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'mhd_to_primitive_inte')
1739 end if
1740
1741 {do ix^db=ixomin^db,ixomax^db\}
1742 ! Calculate pressure = (gamma-1) * e_internal
1743 w(ix^d,p_)=w(ix^d,e_)*gamma_1
1744 ! Convert momentum to velocity
1745 inv_rho = 1.d0/w(ix^d,rho_)
1746 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)*inv_rho\
1747 {end do\}
1748
1749 end subroutine mhd_to_primitive_inte
1750
1751 !> Transform conservative variables into primitive ones
1752 subroutine mhd_to_primitive_split_rho(ixI^L,ixO^L,w,x)
1754 integer, intent(in) :: ixi^l, ixo^l
1755 double precision, intent(inout) :: w(ixi^s, nw)
1756 double precision, intent(in) :: x(ixi^s, 1:ndim)
1757
1758 double precision :: inv_rho
1759 integer :: ix^d
1760
1761 if (fix_small_values) then
1762 ! fix small values preventing NaN numbers in the following converting
1763 call mhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'mhd_to_primitive_split_rho')
1764 end if
1765
1766 {do ix^db=ixomin^db,ixomax^db\}
1767 inv_rho=1.d0/(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1768 ! Convert momentum to velocity
1769 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)*inv_rho\
1770 ! Calculate pressure = (gamma-1) * (e-ek-eb)
1771 w(ix^d,p_)=gamma_1*(w(ix^d,e_)&
1772 -half*((w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))*&
1773 (^c&w(ix^d,m^c_)**2+)+(^c&w(ix^d,b^c_)**2+)))
1774 {end do\}
1775
1776 end subroutine mhd_to_primitive_split_rho
1777
1778 !> Transform conservative variables into primitive ones
1779 subroutine mhd_to_primitive_semirelati(ixI^L,ixO^L,w,x)
1781 integer, intent(in) :: ixi^l, ixo^l
1782 double precision, intent(inout) :: w(ixi^s, nw)
1783 double precision, intent(in) :: x(ixi^s, 1:ndim)
1784
1785 double precision :: b(ixo^s,1:ndir), tmp, b2, gamma2, inv_rho
1786 integer :: ix^d
1787
1788 if (fix_small_values) then
1789 ! fix small values preventing NaN numbers in the following converting
1790 call mhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'mhd_to_primitive_semirelati')
1791 end if
1792
1793 {do ix^db=ixomin^db,ixomax^db\}
1794 b2=(^c&w(ix^d,b^c_)**2+)
1795 if(b2>smalldouble) then
1796 tmp=1.d0/sqrt(b2)
1797 else
1798 tmp=0.d0
1799 end if
1800 ^c&b(ix^d,^c)=w(ix^d,b^c_)*tmp\
1801 tmp=(^c&b(ix^d,^c)*w(ix^d,m^c_)+)
1802
1803 inv_rho=1.d0/w(ix^d,rho_)
1804 ! Va^2/c^2
1805 b2=b2*inv_rho*inv_squared_c
1806 ! equation (15)
1807 gamma2=1.d0/(1.d0+b2)
1808 ! Convert momentum to velocity
1809 ^c&w(ix^d,m^c_)=gamma2*(w(ix^d,m^c_)+b2*b(ix^d,^c)*tmp)*inv_rho\
1810
1811 if(mhd_internal_e) then
1812 ! internal energy to pressure
1813 w(ix^d,p_)=gamma_1*w(ix^d,e_)
1814 else
1815 ! E=Bxv
1816 {^ifthreec
1817 b(ix^d,1)=w(ix^d,b2_)*w(ix^d,m3_)-w(ix^d,b3_)*w(ix^d,m2_)
1818 b(ix^d,2)=w(ix^d,b3_)*w(ix^d,m1_)-w(ix^d,b1_)*w(ix^d,m3_)
1819 b(ix^d,3)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
1820 }
1821 {^iftwoc
1822 b(ix^d,1)=zero
1823 b(ix^d,2)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
1824 }
1825 {^ifonec
1826 b(ix^d,1)=zero
1827 }
1828 ! Calculate pressure = (gamma-1) * (e-eK-eB-eE)
1829 w(ix^d,p_)=gamma_1*(w(ix^d,e_)&
1830 -half*((^c&w(ix^d,m^c_)**2+)*w(ix^d,rho_)&
1831 +(^c&w(ix^d,b^c_)**2+)&
1832 +(^c&b(ix^d,^c)**2+)*inv_squared_c))
1833 end if
1834 {end do\}
1835
1836 end subroutine mhd_to_primitive_semirelati
1837
1838 !> Transform conservative variables into primitive ones
1839 subroutine mhd_to_primitive_semirelati_noe(ixI^L,ixO^L,w,x)
1841 integer, intent(in) :: ixi^l, ixo^l
1842 double precision, intent(inout) :: w(ixi^s, nw)
1843 double precision, intent(in) :: x(ixi^s, 1:ndim)
1844
1845 double precision :: b(ixo^s,1:ndir),tmp,b2,gamma2,inv_rho
1846 integer :: ix^d, idir
1847
1848 if (fix_small_values) then
1849 ! fix small values preventing NaN numbers in the following converting
1850 call mhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'mhd_to_primitive_semirelati_noe')
1851 end if
1852
1853 {do ix^db=ixomin^db,ixomax^db\}
1854 b2=(^c&w(ix^d,b^c_)**2+)
1855 if(b2>smalldouble) then
1856 tmp=1.d0/sqrt(b2)
1857 else
1858 tmp=0.d0
1859 end if
1860 ^c&b(ix^d,^c)=w(ix^d,b^c_)*tmp\
1861 tmp=(^c&b(ix^d,^c)*w(ix^d,m^c_)+)
1862
1863 inv_rho=1.d0/w(ix^d,rho_)
1864 ! Va^2/c^2
1865 b2=b2*inv_rho*inv_squared_c
1866 ! equation (15)
1867 gamma2=1.d0/(1.d0+b2)
1868 ! Convert momentum to velocity
1869 ^c&w(ix^d,m^c_)=gamma2*(w(ix^d,m^c_)+b2*b(ix^d,^c)*tmp)*inv_rho\
1870 {end do\}
1871
1872 end subroutine mhd_to_primitive_semirelati_noe
1873
1874 !> Transform internal energy to total energy
1875 subroutine mhd_ei_to_e(ixI^L,ixO^L,w,x)
1877 integer, intent(in) :: ixi^l, ixo^l
1878 double precision, intent(inout) :: w(ixi^s, nw)
1879 double precision, intent(in) :: x(ixi^s, 1:ndim)
1880
1881 integer :: ix^d
1882
1883 if(has_equi_rho0) then
1884 {do ix^db=ixomin^db,ixomax^db\}
1885 ! Calculate e = ei + ek + eb
1886 w(ix^d,e_)=w(ix^d,e_)&
1887 +half*((^c&w(ix^d,m^c_)**2+)/&
1888 (w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0))&
1889 +(^c&w(ix^d,b^c_)**2+))
1890 {end do\}
1891 else
1892 {do ix^db=ixomin^db,ixomax^db\}
1893 ! Calculate e = ei + ek + eb
1894 w(ix^d,e_)=w(ix^d,e_)&
1895 +half*((^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)&
1896 +(^c&w(ix^d,b^c_)**2+))
1897 {end do\}
1898 end if
1899
1900 end subroutine mhd_ei_to_e
1901
1902 !> Transform internal energy to hydrodynamic energy
1903 subroutine mhd_ei_to_e_hde(ixI^L,ixO^L,w,x)
1905 integer, intent(in) :: ixi^l, ixo^l
1906 double precision, intent(inout) :: w(ixi^s, nw)
1907 double precision, intent(in) :: x(ixi^s, 1:ndim)
1908
1909 integer :: ix^d
1910
1911 if(has_equi_rho0) then
1912 {do ix^db=ixomin^db,ixomax^db\}
1913 ! Calculate e = ei + ek
1914 w(ix^d,e_)=w(ix^d,e_)&
1915 +half*((^c&w(ix^d,m^c_)**2+)/&
1916 (w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)))
1917 {end do\}
1918 else
1919 {do ix^db=ixomin^db,ixomax^db\}
1920 ! Calculate e = ei + ek
1921 w(ix^d,e_)=w(ix^d,e_)&
1922 +half*(^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)
1923 {end do\}
1924 end if
1925
1926 end subroutine mhd_ei_to_e_hde
1927
1928 !> Transform internal energy to total energy and velocity to momentum
1929 subroutine mhd_ei_to_e_semirelati(ixI^L,ixO^L,w,x)
1931 integer, intent(in) :: ixi^l, ixo^l
1932 double precision, intent(inout) :: w(ixi^s, nw)
1933 double precision, intent(in) :: x(ixi^s, 1:ndim)
1934
1935 w(ixo^s,p_)=w(ixo^s,e_)*gamma_1
1936 call mhd_to_conserved_semirelati(ixi^l,ixo^l,w,x)
1937
1938 end subroutine mhd_ei_to_e_semirelati
1939
1940 !> Transform total energy to internal energy
1941 subroutine mhd_e_to_ei(ixI^L,ixO^L,w,x)
1943 integer, intent(in) :: ixi^l, ixo^l
1944 double precision, intent(inout) :: w(ixi^s, nw)
1945 double precision, intent(in) :: x(ixi^s, 1:ndim)
1946
1947 integer :: ix^d
1948
1949 if(has_equi_rho0) then
1950 {do ix^db=ixomin^db,ixomax^db\}
1951 ! Calculate ei = e - ek - eb
1952 w(ix^d,e_)=w(ix^d,e_)&
1953 -half*((^c&w(ix^d,m^c_)**2+)/&
1954 (w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0))&
1955 +(^c&w(ix^d,b^c_)**2+))
1956 {end do\}
1957 else
1958 {do ix^db=ixomin^db,ixomax^db\}
1959 ! Calculate ei = e - ek - eb
1960 w(ix^d,e_)=w(ix^d,e_)&
1961 -half*((^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)&
1962 +(^c&w(ix^d,b^c_)**2+))
1963 {end do\}
1964 end if
1965
1966 if(fix_small_values) then
1967 call mhd_handle_small_ei(w,x,ixi^l,ixi^l,e_,'mhd_e_to_ei')
1968 end if
1969
1970 end subroutine mhd_e_to_ei
1971
1972 !> Transform hydrodynamic energy to internal energy
1973 subroutine mhd_e_to_ei_hde(ixI^L,ixO^L,w,x)
1975 integer, intent(in) :: ixi^l, ixo^l
1976 double precision, intent(inout) :: w(ixi^s, nw)
1977 double precision, intent(in) :: x(ixi^s, 1:ndim)
1978
1979 integer :: ix^d
1980
1981 if(has_equi_rho0) then
1982 {do ix^db=ixomin^db,ixomax^db\}
1983 ! Calculate ei = e - ek
1984 w(ix^d,e_)=w(ix^d,e_)&
1985 -half*(^c&w(ix^d,m^c_)**2+)/&
1986 (w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0))
1987 {end do\}
1988 else
1989 {do ix^db=ixomin^db,ixomax^db\}
1990 ! Calculate ei = e - ek
1991 w(ix^d,e_)=w(ix^d,e_)&
1992 -half*(^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)
1993 {end do\}
1994 end if
1995
1996 if(fix_small_values) then
1997 call mhd_handle_small_ei(w,x,ixi^l,ixi^l,e_,'mhd_e_to_ei_hde')
1998 end if
1999
2000 end subroutine mhd_e_to_ei_hde
2001
2002 !> Transform total energy to internal energy and momentum to velocity
2003 subroutine mhd_e_to_ei_semirelati(ixI^L,ixO^L,w,x)
2005 integer, intent(in) :: ixi^l, ixo^l
2006 double precision, intent(inout) :: w(ixi^s, nw)
2007 double precision, intent(in) :: x(ixi^s, 1:ndim)
2008
2009 call mhd_to_primitive_semirelati(ixi^l,ixo^l,w,x)
2010 w(ixo^s,e_)=w(ixo^s,p_)*inv_gamma_1
2011
2012 end subroutine mhd_e_to_ei_semirelati
2013
2014 subroutine mhd_handle_small_values_semirelati(primitive, w, x, ixI^L, ixO^L, subname)
2017 logical, intent(in) :: primitive
2018 integer, intent(in) :: ixi^l,ixo^l
2019 double precision, intent(inout) :: w(ixi^s,1:nw)
2020 double precision, intent(in) :: x(ixi^s,1:ndim)
2021 character(len=*), intent(in) :: subname
2022
2023 double precision :: b(ixi^s,1:ndir), pressure(ixi^s), v(ixi^s,1:ndir)
2024 double precision :: tmp, b2, gamma2, inv_rho
2025 integer :: ix^d
2026 logical :: flag(ixi^s,1:nw)
2027
2028 flag=.false.
2029 where(w(ixo^s,rho_) < small_density) flag(ixo^s,rho_) = .true.
2030
2031 if(mhd_energy) then
2032 if(primitive) then
2033 where(w(ixo^s,p_) < small_pressure) flag(ixo^s,e_) = .true.
2034 else
2035 {do ix^db=iximin^db,iximax^db\}
2036 b2=(^c&w(ix^d,b^c_)**2+)
2037 if(b2>smalldouble) then
2038 tmp=1.d0/sqrt(b2)
2039 else
2040 tmp=0.d0
2041 end if
2042 ^c&b(ix^d,^c)=w(ix^d,b^c_)*tmp\
2043 tmp=(^c&b(ix^d,^c)*w(ix^d,m^c_)+)
2044 inv_rho=1.d0/w(ix^d,rho_)
2045 ! Va^2/c^2
2046 b2=b2*inv_rho*inv_squared_c
2047 ! equation (15)
2048 gamma2=1.d0/(1.d0+b2)
2049 ! Convert momentum to velocity
2050 ^c&v(ix^d,^c)=gamma2*(w(ix^d,m^c_)+b2*b(ix^d,^c)*tmp)*inv_rho\
2051 ! E=Bxv
2052 {^ifthreec
2053 b(ix^d,1)=w(ix^d,b2_)*v(ix^d,3)-w(ix^d,b3_)*v(ix^d,2)
2054 b(ix^d,2)=w(ix^d,b3_)*v(ix^d,1)-w(ix^d,b1_)*v(ix^d,3)
2055 b(ix^d,3)=w(ix^d,b1_)*v(ix^d,2)-w(ix^d,b2_)*v(ix^d,1)
2056 }
2057 {^iftwoc
2058 b(ix^d,1)=zero
2059 b(ix^d,2)=w(ix^d,b1_)*v(ix^d,2)-w(ix^d,b2_)*v(ix^d,1)
2060 }
2061 {^ifonec
2062 b(ix^d,1)=zero
2063 }
2064 ! Calculate pressure = (gamma-1) * (e-eK-eB-eE)
2065 pressure(ix^d)=gamma_1*(w(ix^d,e_)&
2066 -half*((^c&v(ix^d,^c)**2+)*w(ix^d,rho_)&
2067 +(^c&w(ix^d,b^c_)**2+)&
2068 +(^c&b(ix^d,^c)**2+)*inv_squared_c))
2069 if(pressure(ix^d) < small_pressure) flag(ix^d,p_) = .true.
2070 {end do\}
2071 end if
2072 end if
2073
2074 if(any(flag)) then
2075 select case (small_values_method)
2076 case ("replace")
2077 where(flag(ixo^s,rho_)) w(ixo^s,rho_) = small_density
2078 {
2079 if(small_values_fix_iw(m^c_)) then
2080 if(flag({ix^d},rho_)) w({ix^d},m^c_)=0.0d0
2081 end if
2082 \}
2083 if(mhd_energy) then
2084 if(primitive) then
2085 where(flag(ixo^s,e_)) w(ixo^s,p_) = small_pressure
2086 else
2087 {do ix^db=ixomin^db,ixomax^db\}
2088 if(flag(ix^d,e_)) then
2089 w(ix^d,e_)=small_pressure*inv_gamma_1+half*((^c&v(ix^d,^c)**2+)*w(ix^d,rho_)&
2090 +(^c&w(ix^d,b^c_)**2+)+(^c&b(ix^d,^c)**2+)*inv_squared_c)
2091 end if
2092 {end do\}
2093 end if
2094 end if
2095 case ("average")
2096 ! do averaging of density
2097 call small_values_average(ixi^l, ixo^l, w, x, flag, rho_)
2098 if(mhd_energy) then
2099 if(primitive) then
2100 call small_values_average(ixi^l, ixo^l, w, x, flag, p_)
2101 else
2102 w(ixi^s,e_)=pressure(ixi^s)
2103 call small_values_average(ixi^l, ixo^l, w, x, flag, p_)
2104 {do ix^db=iximin^db,iximax^db\}
2105 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1+half*((^c&v(ix^d,^c)**2+)*w(ix^d,rho_)&
2106 +(^c&w(ix^d,b^c_)**2+)+(^c&b(ix^d,^c)**2+)*inv_squared_c)
2107 {end do\}
2108 end if
2109 end if
2110 case default
2111 if(.not.primitive) then
2112 ! change to primitive variables
2113 w(ixi^s,mom(1:ndir))=v(ixi^s,1:ndir)
2114 w(ixi^s,e_)=pressure(ixi^s)
2115 end if
2116 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
2117 end select
2118 end if
2119
2120 end subroutine mhd_handle_small_values_semirelati
2121
2122 subroutine mhd_handle_small_values_origin(primitive, w, x, ixI^L, ixO^L, subname)
2125 logical, intent(in) :: primitive
2126 integer, intent(in) :: ixi^l,ixo^l
2127 double precision, intent(inout) :: w(ixi^s,1:nw)
2128 double precision, intent(in) :: x(ixi^s,1:ndim)
2129 character(len=*), intent(in) :: subname
2130
2131 double precision :: rho
2132 integer :: idir, ix^d
2133 logical :: flag(ixi^s,1:nw)
2134
2135 call phys_check_w(primitive, ixi^l, ixo^l, w, flag)
2136
2137 if(any(flag)) then
2138 select case (small_values_method)
2139 case ("replace")
2140 {do ix^db=ixomin^db,ixomax^db\}
2141 if(has_equi_rho0) then
2142 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
2143 if(flag(ix^d,rho_)) w(ix^d,rho_)=small_density-block%equi_vars(ix^d,equi_rho0_,0)
2144 else
2145 rho=w(ix^d,rho_)
2146 if(flag(ix^d,rho_)) w(ix^d,rho_)=small_density
2147 end if
2148 {
2149 if(small_values_fix_iw(m^c_)) then
2150 if(flag({ix^d},rho_)) w({ix^d},m^c_)=0.0d0
2151 end if
2152 \}
2153 if(primitive) then
2154 if(has_equi_pe0) then
2155 if(flag(ix^d,e_)) w(ix^d,p_)=small_pressure-block%equi_vars(ix^d,equi_pe0_,0)
2156 else
2157 if(flag(ix^d,e_)) w(ix^d,p_)=small_pressure
2158 end if
2159 else
2160 if(has_equi_pe0) then
2161 if(flag(ix^d,e_)) &
2162 w(ix^d,e_)=small_e+half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))&
2163 -block%equi_vars(ix^d,equi_pe0_,0)*inv_gamma_1
2164 else
2165 if(flag(ix^d,e_)) &
2166 w(ix^d,e_)=small_e+half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))
2167 end if
2168 end if
2169 {end do\}
2170 case ("average")
2171 ! do averaging of density
2172 call small_values_average(ixi^l, ixo^l, w, x, flag, rho_)
2173 if(primitive)then
2174 call small_values_average(ixi^l, ixo^l, w, x, flag, p_)
2175 else
2176 ! do averaging of internal energy
2177 {do ix^db=iximin^db,iximax^db\}
2178 if(has_equi_rho0) then
2179 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
2180 else
2181 rho=w(ix^d,rho_)
2182 end if
2183 w(ix^d,e_)=w(ix^d,e_)&
2184 -half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))
2185 {end do\}
2186 call small_values_average(ixi^l, ixo^l, w, x, flag, e_)
2187 ! convert back
2188 {do ix^db=iximin^db,iximax^db\}
2189 if(has_equi_rho0) then
2190 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
2191 else
2192 rho=w(ix^d,rho_)
2193 end if
2194 w(ix^d,e_)=w(ix^d,e_)&
2195 +half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))
2196 {end do\}
2197 end if
2198 case default
2199 if(.not.primitive) then
2200 !convert w to primitive
2201 {do ix^db=iximin^db,iximax^db\}
2202 if(has_equi_rho0) then
2203 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
2204 else
2205 rho=w(ix^d,rho_)
2206 end if
2207 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)/rho\
2208 w(ix^d,p_)=gamma_1*(w(ix^d,e_)&
2209 -half*((^c&w(ix^d,m^c_)**2+)*rho+(^c&w(ix^d,b^c_)**2+)))
2210 {end do\}
2211 end if
2212 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
2213 end select
2214 end if
2215
2216 end subroutine mhd_handle_small_values_origin
2217
2218 subroutine mhd_handle_small_values_inte(primitive, w, x, ixI^L, ixO^L, subname)
2221 logical, intent(in) :: primitive
2222 integer, intent(in) :: ixi^l,ixo^l
2223 double precision, intent(inout) :: w(ixi^s,1:nw)
2224 double precision, intent(in) :: x(ixi^s,1:ndim)
2225 character(len=*), intent(in) :: subname
2226
2227 double precision :: rho
2228 integer :: ix^d
2229 logical :: flag(ixi^s,1:nw)
2230
2231 call phys_check_w(primitive, ixi^l, ixi^l, w, flag)
2232
2233 if(any(flag)) then
2234 select case (small_values_method)
2235 case ("replace")
2236 {do ix^db=ixomin^db,ixomax^db\}
2237 if(has_equi_rho0) then
2238 if(flag(ix^d,rho_)) w(ix^d,rho_)=small_density-block%equi_vars(ix^d,equi_rho0_,0)
2239 else
2240 if(flag(ix^d,rho_)) w(ix^d,rho_)=small_density
2241 end if
2242 {
2243 if(small_values_fix_iw(m^c_)) then
2244 if(flag({ix^d},rho_)) w({ix^d},m^c_)=0.0d0
2245 end if
2246 \}
2247 if(primitive) then
2248 if(has_equi_pe0) then
2249 if(flag(ix^d,e_)) w(ix^d,p_)=small_pressure-block%equi_vars(ix^d,equi_pe0_,0)
2250 else
2251 if(flag(ix^d,e_)) w(ix^d,p_)=small_pressure
2252 end if
2253 else
2254 if(has_equi_pe0) then
2255 if(flag(ix^d,e_)) &
2256 w(ix^d,e_)=small_e-block%equi_vars(ix^d,equi_pe0_,0)*inv_gamma_1
2257 else
2258 if(flag(ix^d,e_)) &
2259 w(ix^d,e_)=small_e
2260 end if
2261 end if
2262 {end do\}
2263 case ("average")
2264 ! do averaging of density
2265 call small_values_average(ixi^l, ixo^l, w, x, flag, rho_)
2266 ! do averaging of internal energy
2267 call small_values_average(ixi^l, ixo^l, w, x, flag, p_)
2268 case default
2269 if(.not.primitive) then
2270 !convert w to primitive
2271 {do ix^db=iximin^db,iximax^db\}
2272 if(has_equi_rho0) then
2273 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
2274 else
2275 rho=w(ix^d,rho_)
2276 end if
2277 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)/rho\
2278 w(ix^d,p_)=gamma_1*w(ix^d,e_)
2279 {end do\}
2280 end if
2281 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
2282 end select
2283 end if
2284
2285 end subroutine mhd_handle_small_values_inte
2286
2287 subroutine mhd_handle_small_values_noe(primitive, w, x, ixI^L, ixO^L, subname)
2290 logical, intent(in) :: primitive
2291 integer, intent(in) :: ixi^l,ixo^l
2292 double precision, intent(inout) :: w(ixi^s,1:nw)
2293 double precision, intent(in) :: x(ixi^s,1:ndim)
2294 character(len=*), intent(in) :: subname
2295
2296 integer :: idir
2297 logical :: flag(ixi^s,1:nw)
2298
2299 call phys_check_w(primitive, ixi^l, ixo^l, w, flag)
2300
2301 if(any(flag)) then
2302 select case (small_values_method)
2303 case ("replace")
2304 if(has_equi_rho0) then
2305 where(flag(ixo^s,rho_)) w(ixo^s,rho_) = &
2306 small_density-block%equi_vars(ixo^s,equi_rho0_,0)
2307 else
2308 where(flag(ixo^s,rho_)) w(ixo^s,rho_) = small_density
2309 end if
2310 do idir = 1, ndir
2311 if(small_values_fix_iw(mom(idir))) then
2312 where(flag(ixo^s,rho_)) w(ixo^s, mom(idir)) = 0.0d0
2313 end if
2314 end do
2315 case ("average")
2316 ! do averaging of density
2317 call small_values_average(ixi^l, ixo^l, w, x, flag, rho_)
2318 case default
2319 if(.not.primitive) then
2320 ! Convert momentum to velocity
2321 if(has_equi_rho0) then
2322 do idir = 1, ndir
2323 w(ixo^s,mom(idir))=w(ixo^s,mom(idir))/(w(ixo^s,rho_)+&
2324 block%equi_vars(ixo^s,equi_rho0_,0))
2325 end do
2326 else
2327 do idir = 1, ndir
2328 w(ixo^s,mom(idir))=w(ixo^s,mom(idir))/w(ixo^s,rho_)
2329 end do
2330 end if
2331 end if
2332 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
2333 end select
2334 end if
2335
2336 end subroutine mhd_handle_small_values_noe
2337
2338 subroutine mhd_handle_small_values_hde(primitive, w, x, ixI^L, ixO^L, subname)
2341 logical, intent(in) :: primitive
2342 integer, intent(in) :: ixi^l,ixo^l
2343 double precision, intent(inout) :: w(ixi^s,1:nw)
2344 double precision, intent(in) :: x(ixi^s,1:ndim)
2345 character(len=*), intent(in) :: subname
2346
2347 integer :: idir
2348 logical :: flag(ixi^s,1:nw)
2349
2350 call phys_check_w(primitive, ixi^l, ixo^l, w, flag)
2351
2352 if(any(flag)) then
2353 select case (small_values_method)
2354 case ("replace")
2355 where(flag(ixo^s,rho_)) w(ixo^s,rho_) = small_density
2356 do idir = 1, ndir
2357 if(small_values_fix_iw(mom(idir))) then
2358 where(flag(ixo^s,rho_)) w(ixo^s, mom(idir)) = 0.0d0
2359 end if
2360 end do
2361 if(primitive) then
2362 where(flag(ixo^s,e_)) w(ixo^s,p_) = small_pressure
2363 else
2364 where(flag(ixo^s,e_))
2365 w(ixo^s,e_) = small_e+half*sum(w(ixo^s,mom(:))**2,dim=ndim+1)/w(ixo^s,rho_)
2366 end where
2367 end if
2368 case ("average")
2369 ! do averaging of density
2370 call small_values_average(ixi^l, ixo^l, w, x, flag, rho_)
2371 ! do averaging of energy
2372 call small_values_average(ixi^l, ixo^l, w, x, flag, e_)
2373 case default
2374 if(.not.primitive) then
2375 !convert w to primitive
2376 ! Calculate pressure = (gamma-1) * (e-ek)
2377 w(ixo^s,p_)=gamma_1*(w(ixo^s,e_)-half*sum(w(ixo^s,mom(:))**2,dim=ndim+1)/w(ixo^s,rho_))
2378 ! Convert momentum to velocity
2379 do idir = 1, ndir
2380 w(ixo^s, mom(idir))=w(ixo^s,mom(idir))/w(ixo^s,rho_)
2381 end do
2382 end if
2383 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
2384 end select
2385 end if
2386
2387 end subroutine mhd_handle_small_values_hde
2388
2389 !> Calculate v vector
2390 subroutine mhd_get_v(w,x,ixI^L,ixO^L,v)
2392
2393 integer, intent(in) :: ixi^l, ixo^l
2394 double precision, intent(in) :: w(ixi^s,nw), x(ixi^s,1:ndim)
2395 double precision, intent(out) :: v(ixi^s,ndir)
2396
2397 double precision :: rho(ixi^s)
2398 integer :: idir
2399
2400 call mhd_get_rho(w,x,ixi^l,ixo^l,rho)
2401
2402 rho(ixo^s)=1.d0/rho(ixo^s)
2403 ! Convert momentum to velocity
2404 do idir = 1, ndir
2405 v(ixo^s, idir) = w(ixo^s, mom(idir))*rho(ixo^s)
2406 end do
2407
2408 end subroutine mhd_get_v
2409
2410 !> Calculate cmax_idim=csound+abs(v_idim) within ixO^L
2411 subroutine mhd_get_cmax_origin(w,x,ixI^L,ixO^L,idim,cmax)
2413
2414 integer, intent(in) :: ixi^l, ixo^l, idim
2415 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
2416 double precision, intent(inout) :: cmax(ixi^s)
2417
2418 double precision :: rho, inv_rho, cfast2, avmincs2, b2, kmax
2419 integer :: ix^d
2420
2421 if(mhd_hall) kmax = dpi/min({dxlevel(^d)},bigdouble)*half
2422
2423 if(b0field) then
2424 {do ix^db=ixomin^db,ixomax^db \}
2425 if(has_equi_rho0) then
2426 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
2427 else
2428 rho=w(ix^d,rho_)
2429 end if
2430 inv_rho=1.d0/rho
2431 ! sound speed**2
2432 cmax(ix^d)=mhd_gamma*w(ix^d,p_)*inv_rho
2433 ! store |B|^2 in v
2434 b2=(^c&(w(ix^d,b^c_)+block%B0(ix^d,^c,b0i))**2+)
2435 cfast2=b2*inv_rho+cmax(ix^d)
2436 avmincs2=cfast2**2-4.0d0*cmax(ix^d)*(w(ix^d,mag(idim))+block%B0(ix^d,idim,b0i))**2*inv_rho
2437 if(avmincs2<zero) avmincs2=zero
2438 cmax(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
2439 if(mhd_hall) then
2440 ! take the Hall velocity into account: most simple estimate, high k limit:
2441 ! largest wavenumber supported by grid: Nyquist (in practise can reduce by some factor)
2442 cmax(ix^d)=max(cmax(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
2443 end if
2444 cmax(ix^d)=abs(w(ix^d,mom(idim)))+cmax(ix^d)
2445 {end do\}
2446 else
2447 {do ix^db=ixomin^db,ixomax^db \}
2448 if(has_equi_rho0) then
2449 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
2450 else
2451 rho=w(ix^d,rho_)
2452 end if
2453 inv_rho=1.d0/rho
2454 ! sound speed**2
2455 cmax(ix^d)=mhd_gamma*w(ix^d,p_)*inv_rho
2456 ! store |B|^2 in v
2457 b2=(^c&w(ix^d,b^c_)**2+)
2458 cfast2=b2*inv_rho+cmax(ix^d)
2459 avmincs2=cfast2**2-4.0d0*cmax(ix^d)*w(ix^d,mag(idim))**2*inv_rho
2460 if(avmincs2<zero) avmincs2=zero
2461 cmax(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
2462 if(mhd_hall) then
2463 ! take the Hall velocity into account: most simple estimate, high k limit:
2464 ! largest wavenumber supported by grid: Nyquist (in practise can reduce by some factor)
2465 cmax(ix^d)=max(cmax(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
2466 end if
2467 cmax(ix^d)=abs(w(ix^d,mom(idim)))+cmax(ix^d)
2468 {end do\}
2469 end if
2470
2471 end subroutine mhd_get_cmax_origin
2472
2473 !> Calculate cmax_idim=csound+abs(v_idim) within ixO^L
2474 subroutine mhd_get_cmax_origin_noe(w,x,ixI^L,ixO^L,idim,cmax)
2476
2477 integer, intent(in) :: ixi^l, ixo^l, idim
2478 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
2479 double precision, intent(inout) :: cmax(ixi^s)
2480
2481 double precision :: rho, inv_rho, cfast2, avmincs2, b2, kmax
2482 integer :: ix^d
2483
2484 if(mhd_hall) kmax = dpi/min({dxlevel(^d)},bigdouble)*half
2485
2486 if(b0field) then
2487 {do ix^db=ixomin^db,ixomax^db \}
2488 if(has_equi_rho0) then
2489 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
2490 else
2491 rho=w(ix^d,rho_)
2492 end if
2493 inv_rho=1.d0/rho
2494 ! sound speed**2
2495 cmax(ix^d)=mhd_gamma*mhd_adiab*rho**gamma_1
2496 ! store |B|^2 in v
2497 b2=(^c&(w(ix^d,b^c_)+block%B0(ix^d,^c,b0i))**2+)
2498 cfast2=b2*inv_rho+cmax(ix^d)
2499 avmincs2=cfast2**2-4.0d0*cmax(ix^d)*(w(ix^d,mag(idim))+block%B0(ix^d,idim,b0i))**2*inv_rho
2500 if(avmincs2<zero) avmincs2=zero
2501 cmax(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
2502 if(mhd_hall) then
2503 ! take the Hall velocity into account: most simple estimate, high k limit:
2504 ! largest wavenumber supported by grid: Nyquist (in practise can reduce by some factor)
2505 cmax(ix^d)=max(cmax(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
2506 end if
2507 cmax(ix^d)=abs(w(ix^d,mom(idim)))+cmax(ix^d)
2508 {end do\}
2509 else
2510 {do ix^db=ixomin^db,ixomax^db \}
2511 if(has_equi_rho0) then
2512 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
2513 else
2514 rho=w(ix^d,rho_)
2515 end if
2516 inv_rho=1.d0/rho
2517 ! sound speed**2
2518 cmax(ix^d)=mhd_gamma*mhd_adiab*rho**gamma_1
2519 ! store |B|^2 in v
2520 b2=(^c&w(ix^d,b^c_)**2+)
2521 cfast2=b2*inv_rho+cmax(ix^d)
2522 avmincs2=cfast2**2-4.0d0*cmax(ix^d)*w(ix^d,mag(idim))**2*inv_rho
2523 if(avmincs2<zero) avmincs2=zero
2524 cmax(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
2525 if(mhd_hall) then
2526 ! take the Hall velocity into account: most simple estimate, high k limit:
2527 ! largest wavenumber supported by grid: Nyquist (in practise can reduce by some factor)
2528 cmax(ix^d)=max(cmax(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
2529 end if
2530 cmax(ix^d)=abs(w(ix^d,mom(idim)))+cmax(ix^d)
2531 {end do\}
2532 end if
2533
2534 end subroutine mhd_get_cmax_origin_noe
2535
2536 !> Calculate cmax_idim for semirelativistic MHD
2537 subroutine mhd_get_cmax_semirelati(w,x,ixI^L,ixO^L,idim,cmax)
2539
2540 integer, intent(in) :: ixi^l, ixo^l, idim
2541 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
2542 double precision, intent(inout):: cmax(ixi^s)
2543
2544 double precision :: csound, avmincs2, idim_alfven_speed2
2545 double precision :: inv_rho, alfven_speed2, gamma2
2546 integer :: ix^d
2547
2548 {do ix^db=ixomin^db,ixomax^db \}
2549 inv_rho=1.d0/w(ix^d,rho_)
2550 alfven_speed2=(^c&w(ix^d,b^c_)**2+)*inv_rho
2551 gamma2=1.0d0/(1.d0+alfven_speed2*inv_squared_c)
2552 cmax(ix^d)=1.d0-gamma2*w(ix^d,mom(idim))**2*inv_squared_c
2553 ! squared sound speed
2554 csound=mhd_gamma*w(ix^d,p_)*inv_rho
2555 idim_alfven_speed2=w(ix^d,mag(idim))**2*inv_rho
2556 ! Va_hat^2+a_hat^2 equation (57)
2557 ! equation (69)
2558 alfven_speed2=alfven_speed2*cmax(ix^d)+csound*(1.d0+idim_alfven_speed2*inv_squared_c)
2559 avmincs2=(gamma2*alfven_speed2)**2-4.0d0*gamma2*csound*idim_alfven_speed2*cmax(ix^d)
2560 if(avmincs2<zero) avmincs2=zero
2561 ! equation (68) fast magnetosonic wave speed
2562 csound = sqrt(half*(gamma2*alfven_speed2+sqrt(avmincs2)))
2563 cmax(ix^d)=gamma2*abs(w(ix^d,mom(idim)))+csound
2564 {end do\}
2565
2566 end subroutine mhd_get_cmax_semirelati
2567
2568 !> Calculate cmax_idim for semirelativistic MHD
2569 subroutine mhd_get_cmax_semirelati_noe(w,x,ixI^L,ixO^L,idim,cmax)
2571
2572 integer, intent(in) :: ixi^l, ixo^l, idim
2573 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
2574 double precision, intent(inout):: cmax(ixi^s)
2575
2576 double precision :: csound, avmincs2, idim_alfven_speed2
2577 double precision :: inv_rho, alfven_speed2, gamma2
2578 integer :: ix^d
2579
2580 {do ix^db=ixomin^db,ixomax^db \}
2581 inv_rho=1.d0/w(ix^d,rho_)
2582 alfven_speed2=(^c&w(ix^d,b^c_)**2+)*inv_rho
2583 gamma2=1.0d0/(1.d0+alfven_speed2*inv_squared_c)
2584 cmax(ix^d)=1.d0-gamma2*w(ix^d,mom(idim))**2*inv_squared_c
2585 csound=mhd_gamma*mhd_adiab*w(ix^d,rho_)**gamma_1
2586 idim_alfven_speed2=w(ix^d,mag(idim))**2*inv_rho
2587 ! Va_hat^2+a_hat^2 equation (57)
2588 ! equation (69)
2589 alfven_speed2=alfven_speed2*cmax(ix^d)+csound*(1.d0+idim_alfven_speed2*inv_squared_c)
2590 avmincs2=(gamma2*alfven_speed2)**2-4.0d0*gamma2*csound*idim_alfven_speed2*cmax(ix^d)
2591 if(avmincs2<zero) avmincs2=zero
2592 ! equation (68) fast magnetosonic wave speed
2593 csound = sqrt(half*(gamma2*alfven_speed2+sqrt(avmincs2)))
2594 cmax(ix^d)=gamma2*abs(w(ix^d,mom(idim)))+csound
2595 {end do\}
2596
2597 end subroutine mhd_get_cmax_semirelati_noe
2598
2599 subroutine mhd_get_a2max(w,x,ixI^L,ixO^L,a2max)
2601
2602 integer, intent(in) :: ixi^l, ixo^l
2603 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
2604 double precision, intent(inout) :: a2max(ndim)
2605 double precision :: a2(ixi^s,ndim,nw)
2606 integer :: gxo^l,hxo^l,jxo^l,kxo^l,i,j
2607
2608 a2=zero
2609 do i = 1,ndim
2610 !> 4th order
2611 hxo^l=ixo^l-kr(i,^d);
2612 gxo^l=hxo^l-kr(i,^d);
2613 jxo^l=ixo^l+kr(i,^d);
2614 kxo^l=jxo^l+kr(i,^d);
2615 a2(ixo^s,i,1:nw)=abs(-w(kxo^s,1:nw)+16.d0*w(jxo^s,1:nw)&
2616 -30.d0*w(ixo^s,1:nw)+16.d0*w(hxo^s,1:nw)-w(gxo^s,1:nw))
2617 a2max(i)=maxval(a2(ixo^s,i,1:nw))/12.d0/dxlevel(i)**2
2618 end do
2619 end subroutine mhd_get_a2max
2620
2621 !> get adaptive cutoff temperature for TRAC (Johnston 2019 ApJL, 873, L22)
2622 subroutine mhd_get_tcutoff(ixI^L,ixO^L,w,x,Tco_local,Tmax_local)
2624 use mod_geometry
2625 integer, intent(in) :: ixi^l,ixo^l
2626 double precision, intent(in) :: x(ixi^s,1:ndim)
2627 ! in primitive form
2628 double precision, intent(inout) :: w(ixi^s,1:nw)
2629 double precision, intent(out) :: tco_local,tmax_local
2630
2631 double precision, parameter :: trac_delta=0.25d0
2632 double precision :: tmp1(ixi^s),te(ixi^s),lts(ixi^s)
2633 double precision, dimension(ixI^S,1:ndir) :: bunitvec
2634 double precision, dimension(ixI^S,1:ndim) :: gradt
2635 double precision :: bdir(ndim)
2636 double precision :: ltrc,ltrp,altr(ixi^s)
2637 integer :: idims,jxo^l,hxo^l,ixa^d,ixb^d,ix^d
2638 integer :: jxp^l,hxp^l,ixp^l,ixq^l
2639 logical :: lrlt(ixi^s)
2640
2641 if(mhd_partial_ionization) then
2642 call mhd_get_temperature_from_te(w,x,ixi^l,ixi^l,te)
2643 else
2644 call mhd_get_rfactor(w,x,ixi^l,ixi^l,te)
2645 te(ixi^s)=w(ixi^s,p_)/(te(ixi^s)*w(ixi^s,rho_))
2646 end if
2647 tco_local=zero
2648 tmax_local=maxval(te(ixo^s))
2649
2650 {^ifoned
2651 select case(mhd_trac_type)
2652 case(0)
2653 !> test case, fixed cutoff temperature
2654 block%wextra(ixi^s,tcoff_)=2.5d5/unit_temperature
2655 case(1)
2656 hxo^l=ixo^l-1;
2657 jxo^l=ixo^l+1;
2658 lts(ixo^s)=0.5d0*abs(te(jxo^s)-te(hxo^s))/te(ixo^s)
2659 lrlt=.false.
2660 where(lts(ixo^s) > trac_delta)
2661 lrlt(ixo^s)=.true.
2662 end where
2663 if(any(lrlt(ixo^s))) then
2664 tco_local=maxval(te(ixo^s), mask=lrlt(ixo^s))
2665 end if
2666 case(2)
2667 !> iijima et al. 2021, LTRAC method
2668 ltrc=1.5d0
2669 ltrp=4.d0
2670 ixp^l=ixo^l^ladd1;
2671 hxo^l=ixo^l-1;
2672 jxo^l=ixo^l+1;
2673 hxp^l=ixp^l-1;
2674 jxp^l=ixp^l+1;
2675 lts(ixp^s)=0.5d0*abs(te(jxp^s)-te(hxp^s))/te(ixp^s)
2676 lts(ixp^s)=max(one, (exp(lts(ixp^s))/ltrc)**ltrp)
2677 lts(ixo^s)=0.25d0*(lts(jxo^s)+two*lts(ixo^s)+lts(hxo^s))
2678 block%wextra(ixo^s,tcoff_)=te(ixo^s)*lts(ixo^s)**0.4d0
2679 case default
2680 call mpistop("mhd_trac_type not allowed for 1D simulation")
2681 end select
2682 }
2683 {^nooned
2684 select case(mhd_trac_type)
2685 case(0)
2686 !> test case, fixed cutoff temperature
2687 block%wextra(ixi^s,tcoff_)=2.5d5/unit_temperature
2688 case(1,4,6)
2689 ! temperature gradient at cell centers
2690 do idims=1,ndim
2691 call gradient(te,ixi^l,ixo^l,idims,tmp1)
2692 gradt(ixo^s,idims)=tmp1(ixo^s)
2693 end do
2694 ! B vector
2695 if(b0field) then
2696 bunitvec(ixo^s,:)=w(ixo^s,iw_mag(:))+block%B0(ixo^s,:,0)
2697 else
2698 bunitvec(ixo^s,:)=w(ixo^s,iw_mag(:))
2699 end if
2700 if(mhd_trac_type .gt. 1) then
2701 ! B direction at cell center
2702 bdir=zero
2703 {do ixa^d=0,1\}
2704 ixb^d=(ixomin^d+ixomax^d-1)/2+ixa^d;
2705 bdir(1:ndim)=bdir(1:ndim)+bunitvec(ixb^d,1:ndim)
2706 {end do\}
2707 if(sum(bdir(:)**2) .gt. zero) then
2708 bdir(1:ndim)=bdir(1:ndim)/dsqrt(sum(bdir(:)**2))
2709 end if
2710 block%special_values(3:ndim+2)=bdir(1:ndim)
2711 end if
2712 tmp1(ixo^s)=dsqrt(sum(bunitvec(ixo^s,:)**2,dim=ndim+1))
2713 where(tmp1(ixo^s)/=0.d0)
2714 tmp1(ixo^s)=1.d0/tmp1(ixo^s)
2715 elsewhere
2716 tmp1(ixo^s)=bigdouble
2717 end where
2718 ! b unit vector: magnetic field direction vector
2719 do idims=1,ndim
2720 bunitvec(ixo^s,idims)=bunitvec(ixo^s,idims)*tmp1(ixo^s)
2721 end do
2722 ! temperature length scale inversed
2723 lts(ixo^s)=abs(sum(gradt(ixo^s,1:ndim)*bunitvec(ixo^s,1:ndim),dim=ndim+1))/te(ixo^s)
2724 ! fraction of cells size to temperature length scale
2725 if(slab_uniform) then
2726 lts(ixo^s)=minval(dxlevel)*lts(ixo^s)
2727 else
2728 lts(ixo^s)=minval(block%ds(ixo^s,:),dim=ndim+1)*lts(ixo^s)
2729 end if
2730 lrlt=.false.
2731 where(lts(ixo^s) > trac_delta)
2732 lrlt(ixo^s)=.true.
2733 end where
2734 if(any(lrlt(ixo^s))) then
2735 block%special_values(1)=maxval(te(ixo^s), mask=lrlt(ixo^s))
2736 else
2737 block%special_values(1)=zero
2738 end if
2739 block%special_values(2)=tmax_local
2740 case(2)
2741 !> iijima et al. 2021, LTRAC method
2742 ltrc=1.5d0
2743 ltrp=4.d0
2744 ixp^l=ixo^l^ladd2;
2745 ! temperature gradient at cell centers
2746 do idims=1,ndim
2747 ixq^l=ixp^l;
2748 hxp^l=ixp^l;
2749 jxp^l=ixp^l;
2750 select case(idims)
2751 {case(^d)
2752 ixqmin^d=ixqmin^d+1
2753 ixqmax^d=ixqmax^d-1
2754 hxpmax^d=ixpmin^d
2755 jxpmin^d=ixpmax^d
2756 \}
2757 end select
2758 call gradient(te,ixi^l,ixq^l,idims,gradt(ixi^s,idims))
2759 call gradientf(te,x,ixi^l,hxp^l,idims,gradt(ixi^s,idims),nghostcells,.true.)
2760 call gradientf(te,x,ixi^l,jxp^l,idims,gradt(ixi^s,idims),nghostcells,.false.)
2761 end do
2762 ! B vector
2763 {do ix^db=ixpmin^db,ixpmax^db\}
2764 if(b0field) then
2765 ^c&bunitvec(ix^d,^c)=w(ix^d,iw_mag(^c))+block%B0(ix^d,^c,0)\
2766 else
2767 ^c&bunitvec(ix^d,^c)=w(ix^d,iw_mag(^c))\
2768 end if
2769 tmp1(ix^d)=1.d0/(dsqrt(^c&bunitvec(ix^d,^c)**2+)+smalldouble)
2770 ! b unit vector: magnetic field direction vector
2771 ^d&bunitvec({ix^d},^d)=bunitvec({ix^d},^d)*tmp1({ix^d})\
2772 ! temperature length scale inversed
2773 lts(ix^d)=abs(^d&gradt({ix^d},^d)*bunitvec({ix^d},^d)+)/te(ix^d)
2774 ! fraction of cells size to temperature length scale
2775 if(slab_uniform) then
2776 lts(ix^d)=min(^d&dxlevel(^d))*lts(ix^d)
2777 else
2778 lts(ix^d)=min(^d&block%ds({ix^d},^d))*lts(ix^d)
2779 end if
2780 lts(ix^d)=max(one,(exp(lts(ix^d))/ltrc)**ltrp)
2781 {end do\}
2782
2783 ! need one ghost layer for thermal conductivity
2784 ixp^l=ixo^l^ladd1;
2785 do idims=1,ndim
2786 hxo^l=ixp^l-kr(idims,^d);
2787 jxo^l=ixp^l+kr(idims,^d);
2788 if(idims==1) then
2789 altr(ixp^s)=0.25d0*(lts(hxo^s)+two*lts(ixp^s)+lts(jxo^s))*bunitvec(ixp^s,idims)**2
2790 else
2791 altr(ixp^s)=altr(ixp^s)+0.25d0*(lts(hxo^s)+two*lts(ixp^s)+lts(jxo^s))*bunitvec(ixp^s,idims)**2
2792 end if
2793 end do
2794 block%wextra(ixp^s,tcoff_)=te(ixp^s)*altr(ixp^s)**0.4d0
2795 case(3,5)
2796 !> do nothing here
2797 case default
2798 call mpistop("unknown mhd_trac_type")
2799 end select
2800 }
2801 end subroutine mhd_get_tcutoff
2802
2803 !> get H speed for H-correction to fix the carbuncle problem at grid-aligned shock front
2804 subroutine mhd_get_h_speed(wprim,x,ixI^L,ixO^L,idim,Hspeed)
2806
2807 integer, intent(in) :: ixi^l, ixo^l, idim
2808 double precision, intent(in) :: wprim(ixi^s, nw)
2809 double precision, intent(in) :: x(ixi^s,1:ndim)
2810 double precision, intent(out) :: hspeed(ixi^s,1:number_species)
2811
2812 double precision :: csound(ixi^s,ndim)
2813 double precision, allocatable :: tmp(:^d&)
2814 integer :: jxc^l, ixc^l, ixa^l, id, ix^d
2815
2816 hspeed=0.d0
2817 ixa^l=ixo^l^ladd1;
2818 allocate(tmp(ixa^s))
2819 do id=1,ndim
2820 call mhd_get_csound_prim(wprim,x,ixi^l,ixa^l,id,tmp)
2821 csound(ixa^s,id)=tmp(ixa^s)
2822 end do
2823 ixcmax^d=ixomax^d;
2824 ixcmin^d=ixomin^d+kr(idim,^d)-1;
2825 jxcmax^d=ixcmax^d+kr(idim,^d);
2826 jxcmin^d=ixcmin^d+kr(idim,^d);
2827 hspeed(ixc^s,1)=0.5d0*abs(wprim(jxc^s,mom(idim))+csound(jxc^s,idim)-wprim(ixc^s,mom(idim))+csound(ixc^s,idim))
2828
2829 do id=1,ndim
2830 if(id==idim) cycle
2831 ixamax^d=ixcmax^d+kr(id,^d);
2832 ixamin^d=ixcmin^d+kr(id,^d);
2833 hspeed(ixc^s,1)=max(hspeed(ixc^s,1),0.5d0*abs(wprim(ixa^s,mom(id))+csound(ixa^s,id)-wprim(ixc^s,mom(id))+csound(ixc^s,id)))
2834 ixamax^d=ixcmax^d-kr(id,^d);
2835 ixamin^d=ixcmin^d-kr(id,^d);
2836 hspeed(ixc^s,1)=max(hspeed(ixc^s,1),0.5d0*abs(wprim(ixc^s,mom(id))+csound(ixc^s,id)-wprim(ixa^s,mom(id))+csound(ixa^s,id)))
2837 end do
2838
2839 do id=1,ndim
2840 if(id==idim) cycle
2841 ixamax^d=jxcmax^d+kr(id,^d);
2842 ixamin^d=jxcmin^d+kr(id,^d);
2843 hspeed(ixc^s,1)=max(hspeed(ixc^s,1),0.5d0*abs(wprim(ixa^s,mom(id))+csound(ixa^s,id)-wprim(jxc^s,mom(id))+csound(jxc^s,id)))
2844 ixamax^d=jxcmax^d-kr(id,^d);
2845 ixamin^d=jxcmin^d-kr(id,^d);
2846 hspeed(ixc^s,1)=max(hspeed(ixc^s,1),0.5d0*abs(wprim(jxc^s,mom(id))+csound(jxc^s,id)-wprim(ixa^s,mom(id))+csound(ixa^s,id)))
2847 end do
2848 deallocate(tmp)
2849
2850 end subroutine mhd_get_h_speed
2851
2852 !> Estimating bounds for the minimum and maximum signal velocities without split
2853 subroutine mhd_get_cbounds(wLC,wRC,wLp,wRp,x,ixI^L,ixO^L,idim,Hspeed,cmax,cmin)
2855
2856 integer, intent(in) :: ixi^l, ixo^l, idim
2857 double precision, intent(in) :: wlc(ixi^s, nw), wrc(ixi^s, nw)
2858 double precision, intent(in) :: wlp(ixi^s, nw), wrp(ixi^s, nw)
2859 double precision, intent(in) :: x(ixi^s,1:ndim)
2860 double precision, intent(inout) :: cmax(ixi^s,1:number_species)
2861 double precision, intent(inout), optional :: cmin(ixi^s,1:number_species)
2862 double precision, intent(in) :: hspeed(ixi^s,1:number_species)
2863
2864 double precision :: wmean(ixi^s,nw), csoundl(ixo^s), csoundr(ixo^s)
2865 double precision :: umean, dmean, tmp1, tmp2, tmp3
2866 integer :: ix^d
2867
2868 select case (boundspeed)
2869 case (1)
2870 ! This implements formula (10.52) from "Riemann Solvers and Numerical
2871 ! Methods for Fluid Dynamics" by Toro.
2872 call mhd_get_csound_prim(wlp,x,ixi^l,ixo^l,idim,csoundl)
2873 call mhd_get_csound_prim(wrp,x,ixi^l,ixo^l,idim,csoundr)
2874 if(present(cmin)) then
2875 {do ix^db=ixomin^db,ixomax^db\}
2876 tmp1=sqrt(wlp(ix^d,rho_))
2877 tmp2=sqrt(wrp(ix^d,rho_))
2878 tmp3=1.d0/(tmp1+tmp2)
2879 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
2880 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
2881 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
2882 cmin(ix^d,1)=umean-dmean
2883 cmax(ix^d,1)=umean+dmean
2884 {end do\}
2885 if(h_correction) then
2886 {do ix^db=ixomin^db,ixomax^db\}
2887 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
2888 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
2889 {end do\}
2890 end if
2891 else
2892 {do ix^db=ixomin^db,ixomax^db\}
2893 tmp1=sqrt(wlp(ix^d,rho_))
2894 tmp2=sqrt(wrp(ix^d,rho_))
2895 tmp3=1.d0/(tmp1+tmp2)
2896 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
2897 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
2898 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
2899 cmax(ix^d,1)=abs(umean)+dmean
2900 {end do\}
2901 end if
2902 case (2)
2903 wmean(ixo^s,1:nwflux)=0.5d0*(wlp(ixo^s,1:nwflux)+wrp(ixo^s,1:nwflux))
2904 call mhd_get_csound_prim(wmean,x,ixi^l,ixo^l,idim,csoundr)
2905 if(present(cmin)) then
2906 {do ix^db=ixomin^db,ixomax^db\}
2907 cmax(ix^d,1)=max(wmean(ix^d,mom(idim))+csoundr(ix^d),zero)
2908 cmin(ix^d,1)=min(wmean(ix^d,mom(idim))-csoundr(ix^d),zero)
2909 {end do\}
2910 if(h_correction) then
2911 {do ix^db=ixomin^db,ixomax^db\}
2912 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
2913 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
2914 {end do\}
2915 end if
2916 else
2917 cmax(ixo^s,1)=abs(wmean(ixo^s,mom(idim)))+csoundr(ixo^s)
2918 end if
2919 case (3)
2920 ! Miyoshi 2005 JCP 208, 315 equation (67)
2921 call mhd_get_csound_prim(wlp,x,ixi^l,ixo^l,idim,csoundl)
2922 call mhd_get_csound_prim(wrp,x,ixi^l,ixo^l,idim,csoundr)
2923 if(present(cmin)) then
2924 {do ix^db=ixomin^db,ixomax^db\}
2925 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
2926 cmin(ix^d,1)=min(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))-csoundl(ix^d)
2927 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
2928 {end do\}
2929 if(h_correction) then
2930 {do ix^db=ixomin^db,ixomax^db\}
2931 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
2932 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
2933 {end do\}
2934 end if
2935 else
2936 {do ix^db=ixomin^db,ixomax^db\}
2937 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
2938 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
2939 {end do\}
2940 end if
2941 end select
2942
2943 end subroutine mhd_get_cbounds
2944
2945 !> Estimating bounds for the minimum and maximum signal velocities without split
2946 subroutine mhd_get_cbounds_semirelati(wLC,wRC,wLp,wRp,x,ixI^L,ixO^L,idim,Hspeed,cmax,cmin)
2948
2949 integer, intent(in) :: ixi^l, ixo^l, idim
2950 double precision, intent(in) :: wlc(ixi^s, nw), wrc(ixi^s, nw)
2951 double precision, intent(in) :: wlp(ixi^s, nw), wrp(ixi^s, nw)
2952 double precision, intent(in) :: x(ixi^s,1:ndim)
2953 double precision, intent(inout) :: cmax(ixi^s,1:number_species)
2954 double precision, intent(inout), optional :: cmin(ixi^s,1:number_species)
2955 double precision, intent(in) :: hspeed(ixi^s,1:number_species)
2956
2957 double precision, dimension(ixO^S) :: csoundl, csoundr, gamma2l, gamma2r
2958 integer :: ix^d
2959
2960 ! Miyoshi 2005 JCP 208, 315 equation (67)
2961 if(mhd_energy) then
2962 call mhd_get_csound_semirelati(wlp,x,ixi^l,ixo^l,idim,csoundl,gamma2l)
2963 call mhd_get_csound_semirelati(wrp,x,ixi^l,ixo^l,idim,csoundr,gamma2r)
2964 else
2965 call mhd_get_csound_semirelati_noe(wlp,x,ixi^l,ixo^l,idim,csoundl,gamma2l)
2966 call mhd_get_csound_semirelati_noe(wrp,x,ixi^l,ixo^l,idim,csoundr,gamma2r)
2967 end if
2968 if(present(cmin)) then
2969 {do ix^db=ixomin^db,ixomax^db\}
2970 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
2971 cmin(ix^d,1)=min(gamma2l(ix^d)*wlp(ix^d,mom(idim)),gamma2r(ix^d)*wrp(ix^d,mom(idim)))-csoundl(ix^d)
2972 cmax(ix^d,1)=max(gamma2l(ix^d)*wlp(ix^d,mom(idim)),gamma2r(ix^d)*wrp(ix^d,mom(idim)))+csoundl(ix^d)
2973 {end do\}
2974 else
2975 {do ix^db=ixomin^db,ixomax^db\}
2976 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
2977 cmax(ix^d,1)=max(gamma2l(ix^d)*wlp(ix^d,mom(idim)),gamma2r(ix^d)*wrp(ix^d,mom(idim)))+csoundl(ix^d)
2978 {end do\}
2979 end if
2980
2981 end subroutine mhd_get_cbounds_semirelati
2982
2983 !> Estimating bounds for the minimum and maximum signal velocities with rho split
2984 subroutine mhd_get_cbounds_split_rho(wLC,wRC,wLp,wRp,x,ixI^L,ixO^L,idim,Hspeed,cmax,cmin)
2986
2987 integer, intent(in) :: ixi^l, ixo^l, idim
2988 double precision, intent(in) :: wlc(ixi^s, nw), wrc(ixi^s, nw)
2989 double precision, intent(in) :: wlp(ixi^s, nw), wrp(ixi^s, nw)
2990 double precision, intent(in) :: x(ixi^s,1:ndim)
2991 double precision, intent(inout) :: cmax(ixi^s,1:number_species)
2992 double precision, intent(inout), optional :: cmin(ixi^s,1:number_species)
2993 double precision, intent(in) :: hspeed(ixi^s,1:number_species)
2994
2995 double precision :: wmean(ixi^s,nw), csoundl(ixo^s), csoundr(ixo^s)
2996 double precision :: umean, dmean, tmp1, tmp2, tmp3
2997 integer :: ix^d
2998
2999 select case (boundspeed)
3000 case (1)
3001 ! This implements formula (10.52) from "Riemann Solvers and Numerical
3002 ! Methods for Fluid Dynamics" by Toro.
3003 call mhd_get_csound_prim_split(wlp,x,ixi^l,ixo^l,idim,csoundl)
3004 call mhd_get_csound_prim_split(wrp,x,ixi^l,ixo^l,idim,csoundr)
3005 if(present(cmin)) then
3006 {do ix^db=ixomin^db,ixomax^db\}
3007 tmp1=sqrt(wlp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
3008 tmp2=sqrt(wrp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
3009 tmp3=1.d0/(tmp1+tmp2)
3010 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
3011 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
3012 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
3013 cmin(ix^d,1)=umean-dmean
3014 cmax(ix^d,1)=umean+dmean
3015 {end do\}
3016 if(h_correction) then
3017 {do ix^db=ixomin^db,ixomax^db\}
3018 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
3019 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
3020 {end do\}
3021 end if
3022 else
3023 {do ix^db=ixomin^db,ixomax^db\}
3024 tmp1=sqrt(wlp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
3025 tmp2=sqrt(wrp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
3026 tmp3=1.d0/(tmp1+tmp2)
3027 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
3028 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
3029 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
3030 cmax(ix^d,1)=abs(umean)+dmean
3031 {end do\}
3032 end if
3033 case (2)
3034 wmean(ixo^s,1:nwflux)=0.5d0*(wlp(ixo^s,1:nwflux)+wrp(ixo^s,1:nwflux))
3035 call mhd_get_csound_prim_split(wmean,x,ixi^l,ixo^l,idim,csoundr)
3036 if(present(cmin)) then
3037 {do ix^db=ixomin^db,ixomax^db\}
3038 cmax(ix^d,1)=max(wmean(ix^d,mom(idim))+csoundr(ix^d),zero)
3039 cmin(ix^d,1)=min(wmean(ix^d,mom(idim))-csoundr(ix^d),zero)
3040 {end do\}
3041 if(h_correction) then
3042 {do ix^db=ixomin^db,ixomax^db\}
3043 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
3044 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
3045 {end do\}
3046 end if
3047 else
3048 cmax(ixo^s,1)=abs(wmean(ixo^s,mom(idim)))+csoundr(ixo^s)
3049 end if
3050 case (3)
3051 ! Miyoshi 2005 JCP 208, 315 equation (67)
3052 call mhd_get_csound_prim_split(wlp,x,ixi^l,ixo^l,idim,csoundl)
3053 call mhd_get_csound_prim_split(wrp,x,ixi^l,ixo^l,idim,csoundr)
3054 if(present(cmin)) then
3055 {do ix^db=ixomin^db,ixomax^db\}
3056 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
3057 cmin(ix^d,1)=min(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))-csoundl(ix^d)
3058 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
3059 {end do\}
3060 if(h_correction) then
3061 {do ix^db=ixomin^db,ixomax^db\}
3062 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
3063 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
3064 {end do\}
3065 end if
3066 else
3067 {do ix^db=ixomin^db,ixomax^db\}
3068 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
3069 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
3070 {end do\}
3071 end if
3072 end select
3073
3074 end subroutine mhd_get_cbounds_split_rho
3075
3076 !> prepare velocities for ct methods
3077 subroutine mhd_get_ct_velocity(vcts,wLp,wRp,ixI^L,ixO^L,idim,cmax,cmin)
3079
3080 integer, intent(in) :: ixi^l, ixo^l, idim
3081 double precision, intent(in) :: wlp(ixi^s, nw), wrp(ixi^s, nw)
3082 double precision, intent(in) :: cmax(ixi^s)
3083 double precision, intent(in), optional :: cmin(ixi^s)
3084 type(ct_velocity), intent(inout):: vcts
3085
3086 integer :: idime,idimn
3087
3088 ! calculate velocities related to different UCT schemes
3089 select case(type_ct)
3090 case('average')
3091 case('uct_contact')
3092 if(.not.allocated(vcts%vnorm)) allocate(vcts%vnorm(ixi^s,1:ndim))
3093 ! get average normal velocity at cell faces
3094 vcts%vnorm(ixo^s,idim)=0.5d0*(wlp(ixo^s,mom(idim))+wrp(ixo^s,mom(idim)))
3095 case('uct_hll')
3096 if(.not.allocated(vcts%vbarC)) then
3097 allocate(vcts%vbarC(ixi^s,1:ndir,2),vcts%vbarLC(ixi^s,1:ndir,2),vcts%vbarRC(ixi^s,1:ndir,2))
3098 allocate(vcts%cbarmin(ixi^s,1:ndim),vcts%cbarmax(ixi^s,1:ndim))
3099 end if
3100 ! Store magnitude of characteristics
3101 if(present(cmin)) then
3102 vcts%cbarmin(ixo^s,idim)=max(-cmin(ixo^s),zero)
3103 vcts%cbarmax(ixo^s,idim)=max( cmax(ixo^s),zero)
3104 else
3105 vcts%cbarmax(ixo^s,idim)=max( cmax(ixo^s),zero)
3106 vcts%cbarmin(ixo^s,idim)=vcts%cbarmax(ixo^s,idim)
3107 end if
3108
3109 idimn=mod(idim,ndir)+1 ! 'Next' direction
3110 idime=mod(idim+1,ndir)+1 ! Electric field direction
3111 ! Store velocities
3112 vcts%vbarLC(ixo^s,idim,1)=wlp(ixo^s,mom(idimn))
3113 vcts%vbarRC(ixo^s,idim,1)=wrp(ixo^s,mom(idimn))
3114 vcts%vbarC(ixo^s,idim,1)=(vcts%cbarmax(ixo^s,idim)*vcts%vbarLC(ixo^s,idim,1) &
3115 +vcts%cbarmin(ixo^s,idim)*vcts%vbarRC(ixo^s,idim,1))&
3116 /(vcts%cbarmax(ixo^s,idim)+vcts%cbarmin(ixo^s,idim))
3117
3118 vcts%vbarLC(ixo^s,idim,2)=wlp(ixo^s,mom(idime))
3119 vcts%vbarRC(ixo^s,idim,2)=wrp(ixo^s,mom(idime))
3120 vcts%vbarC(ixo^s,idim,2)=(vcts%cbarmax(ixo^s,idim)*vcts%vbarLC(ixo^s,idim,2) &
3121 +vcts%cbarmin(ixo^s,idim)*vcts%vbarRC(ixo^s,idim,1))&
3122 /(vcts%cbarmax(ixo^s,idim)+vcts%cbarmin(ixo^s,idim))
3123 case default
3124 call mpistop('choose average, uct_contact,or uct_hll for type_ct!')
3125 end select
3126
3127 end subroutine mhd_get_ct_velocity
3128
3129 !> Calculate fast magnetosonic wave speed
3130 subroutine mhd_get_csound_prim(w,x,ixI^L,ixO^L,idim,csound)
3132
3133 integer, intent(in) :: ixi^l, ixo^l, idim
3134 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
3135 double precision, intent(out):: csound(ixo^s)
3136
3137 double precision :: inv_rho, cfast2, avmincs2, b2, kmax
3138 integer :: ix^d
3139
3140 if(mhd_hall) kmax = dpi/min({dxlevel(^d)},bigdouble)*half
3141
3142 ! store |B|^2 in v
3143 if(b0field) then
3144 {do ix^db=ixomin^db,ixomax^db \}
3145 inv_rho=1.d0/w(ix^d,rho_)
3146 if(mhd_energy) then
3147 csound(ix^d)=mhd_gamma*w(ix^d,p_)*inv_rho
3148 else
3149 csound(ix^d)=mhd_gamma*mhd_adiab*w(ix^d,rho_)**gamma_1
3150 end if
3151 b2=(^c&(w(ix^d,b^c_)+block%B0(ix^d,^c,b0i))**2+)
3152 cfast2=b2*inv_rho+csound(ix^d)
3153 avmincs2=cfast2**2-4.0d0*csound(ix^d)*(w(ix^d,mag(idim))+&
3154 block%B0(ix^d,idim,b0i))**2*inv_rho
3155 if(avmincs2<zero) avmincs2=zero
3156 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
3157 if(mhd_hall) then
3158 csound(ix^d)=max(csound(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
3159 end if
3160 {end do\}
3161 else
3162 {do ix^db=ixomin^db,ixomax^db \}
3163 inv_rho=1.d0/w(ix^d,rho_)
3164 if(mhd_energy) then
3165 csound(ix^d)=mhd_gamma*w(ix^d,p_)*inv_rho
3166 else
3167 csound(ix^d)=mhd_gamma*mhd_adiab*w(ix^d,rho_)**gamma_1
3168 end if
3169 b2=(^c&w(ix^d,b^c_)**2+)
3170 cfast2=b2*inv_rho+csound(ix^d)
3171 avmincs2=cfast2**2-4.0d0*csound(ix^d)*w(ix^d,mag(idim))**2*inv_rho
3172 if(avmincs2<zero) avmincs2=zero
3173 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
3174 if(mhd_hall) then
3175 csound(ix^d)=max(csound(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
3176 end if
3177 {end do\}
3178 end if
3179
3180 end subroutine mhd_get_csound_prim
3181
3182 !> Calculate fast magnetosonic wave speed
3183 subroutine mhd_get_csound_prim_split(w,x,ixI^L,ixO^L,idim,csound)
3185
3186 integer, intent(in) :: ixi^l, ixo^l, idim
3187 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
3188 double precision, intent(out):: csound(ixo^s)
3189
3190 double precision :: rho, inv_rho, cfast2, avmincs2, b2, kmax
3191 integer :: ix^d
3192
3193 if(mhd_hall) kmax = dpi/min({dxlevel(^d)},bigdouble)*half
3194
3195 ! store |B|^2 in v
3196 if(b0field) then
3197 {do ix^db=ixomin^db,ixomax^db \}
3198 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
3199 inv_rho=1.d0/rho
3200 if(has_equi_pe0) then
3201 csound(ix^d)=mhd_gamma*(w(ix^d,p_)+block%equi_vars(ix^d,equi_pe0_,b0i))*inv_rho
3202 end if
3203 b2=(^c&(w(ix^d,b^c_)+block%B0(ix^d,^c,b0i))**2+)
3204 cfast2=b2*inv_rho+csound(ix^d)
3205 avmincs2=cfast2**2-4.0d0*csound(ix^d)*(w(ix^d,mag(idim))+&
3206 block%B0(ix^d,idim,b0i))**2*inv_rho
3207 if(avmincs2<zero) avmincs2=zero
3208 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
3209 if(mhd_hall) then
3210 csound(ix^d)=max(csound(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
3211 end if
3212 {end do\}
3213 else
3214 {do ix^db=ixomin^db,ixomax^db \}
3215 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
3216 inv_rho=1.d0/rho
3217 if(has_equi_pe0) then
3218 csound(ix^d)=mhd_gamma*(w(ix^d,p_)+block%equi_vars(ix^d,equi_pe0_,b0i))*inv_rho
3219 end if
3220 b2=(^c&w(ix^d,b^c_)**2+)
3221 cfast2=b2*inv_rho+csound(ix^d)
3222 avmincs2=cfast2**2-4.0d0*csound(ix^d)*w(ix^d,mag(idim))**2*inv_rho
3223 if(avmincs2<zero) avmincs2=zero
3224 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
3225 if(mhd_hall) then
3226 csound(ix^d)=max(csound(ix^d),mhd_etah*sqrt(b2)*inv_rho*kmax)
3227 end if
3228 {end do\}
3229 end if
3230
3231 end subroutine mhd_get_csound_prim_split
3232
3233 !> Calculate cmax_idim for semirelativistic MHD
3234 subroutine mhd_get_csound_semirelati(w,x,ixI^L,ixO^L,idim,csound,gamma2)
3236
3237 integer, intent(in) :: ixi^l, ixo^l, idim
3238 ! here w is primitive variables
3239 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
3240 double precision, intent(out):: csound(ixo^s), gamma2(ixo^s)
3241
3242 double precision :: avmincs2, inv_rho, alfven_speed2, idim_alfven_speed2
3243 integer :: ix^d
3244
3245 {do ix^db=ixomin^db,ixomax^db\}
3246 inv_rho = 1.d0/w(ix^d,rho_)
3247 ! squared sound speed
3248 csound(ix^d)=mhd_gamma*w(ix^d,p_)*inv_rho
3249 alfven_speed2=(^c&w(ix^d,b^c_)**2+)*inv_rho
3250 gamma2(ix^d) = 1.0d0/(1.d0+alfven_speed2*inv_squared_c)
3251 avmincs2=1.d0-gamma2(ix^d)*w(ix^d,mom(idim))**2*inv_squared_c
3252 idim_alfven_speed2=w(ix^d,mag(idim))**2*inv_rho
3253 ! Va_hat^2+a_hat^2 equation (57)
3254 ! equation (69)
3255 alfven_speed2=alfven_speed2*avmincs2+csound(ix^d)*(1.d0+idim_alfven_speed2*inv_squared_c)
3256 avmincs2=(gamma2(ix^d)*alfven_speed2)**2-4.0d0*gamma2(ix^d)*csound(ix^d)*idim_alfven_speed2*avmincs2
3257 if(avmincs2<zero) avmincs2=zero
3258 ! equation (68) fast magnetosonic speed
3259 csound(ix^d) = sqrt(half*(gamma2(ix^d)*alfven_speed2+sqrt(avmincs2)))
3260 {end do\}
3261
3262 end subroutine mhd_get_csound_semirelati
3263
3264 !> Calculate cmax_idim for semirelativistic MHD
3265 subroutine mhd_get_csound_semirelati_noe(w,x,ixI^L,ixO^L,idim,csound,gamma2)
3267
3268 integer, intent(in) :: ixi^l, ixo^l, idim
3269 ! here w is primitive variables
3270 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
3271 double precision, intent(out):: csound(ixo^s), gamma2(ixo^s)
3272
3273 double precision :: avmincs2, inv_rho, alfven_speed2, idim_alfven_speed2
3274 integer :: ix^d
3275
3276 {do ix^db=ixomin^db,ixomax^db\}
3277 inv_rho = 1.d0/w(ix^d,rho_)
3278 ! squared sound speed
3279 csound(ix^d)=mhd_gamma*mhd_adiab*w(ix^d,rho_)**gamma_1
3280 alfven_speed2=(^c&w(ix^d,b^c_)**2+)*inv_rho
3281 gamma2(ix^d) = 1.0d0/(1.d0+alfven_speed2*inv_squared_c)
3282 avmincs2=1.d0-gamma2(ix^d)*w(ix^d,mom(idim))**2*inv_squared_c
3283 idim_alfven_speed2=w(ix^d,mag(idim))**2*inv_rho
3284 ! Va_hat^2+a_hat^2 equation (57)
3285 ! equation (69)
3286 alfven_speed2=alfven_speed2*avmincs2+csound(ix^d)*(1.d0+idim_alfven_speed2*inv_squared_c)
3287 avmincs2=(gamma2(ix^d)*alfven_speed2)**2-4.0d0*gamma2(ix^d)*csound(ix^d)*idim_alfven_speed2*avmincs2
3288 if(avmincs2<zero) avmincs2=zero
3289 ! equation (68) fast magnetosonic speed
3290 csound(ix^d) = sqrt(half*(gamma2(ix^d)*alfven_speed2+sqrt(avmincs2)))
3291 {end do\}
3292
3293 end subroutine mhd_get_csound_semirelati_noe
3294
3295 !> Calculate isothermal thermal pressure
3296 subroutine mhd_get_pthermal_noe(w,x,ixI^L,ixO^L,pth)
3298
3299 integer, intent(in) :: ixi^l, ixo^l
3300 double precision, intent(in) :: w(ixi^s,nw)
3301 double precision, intent(in) :: x(ixi^s,1:ndim)
3302 double precision, intent(out):: pth(ixi^s)
3303
3304 if(has_equi_rho0) then
3305 pth(ixo^s)=mhd_adiab*(w(ixo^s,rho_)+block%equi_vars(ixo^s,equi_rho0_,0))**mhd_gamma
3306 else
3307 pth(ixo^s)=mhd_adiab*w(ixo^s,rho_)**mhd_gamma
3308 end if
3309
3310 end subroutine mhd_get_pthermal_noe
3311
3312 !> Calculate thermal pressure from internal energy
3313 subroutine mhd_get_pthermal_inte(w,x,ixI^L,ixO^L,pth)
3316
3317 integer, intent(in) :: ixi^l, ixo^l
3318 double precision, intent(in) :: w(ixi^s,nw)
3319 double precision, intent(in) :: x(ixi^s,1:ndim)
3320 double precision, intent(out):: pth(ixi^s)
3321
3322 integer :: iw, ix^d
3323
3324 {do ix^db= ixomin^db,ixomax^db\}
3325 if(has_equi_pe0) then
3326 pth(ix^d)=gamma_1*w(ix^d,e_)+block%equi_vars(ix^d,equi_pe0_,0)
3327 else
3328 pth(ix^d)=gamma_1*w(ix^d,e_)
3329 end if
3330 if(fix_small_values.and.pth(ix^d)<small_pressure) pth(ix^d)=small_pressure
3331 {end do\}
3332
3333 if(check_small_values.and..not.fix_small_values) then
3334 {do ix^db= ixomin^db,ixomax^db\}
3335 if(pth(ix^d)<small_pressure) then
3336 write(*,*) "Error: small value of gas pressure",pth(ix^d),&
3337 " encountered when call mhd_get_pthermal_inte"
3338 write(*,*) "Iteration: ", it, " Time: ", global_time
3339 write(*,*) "Location: ", x(ix^d,:)
3340 write(*,*) "Cell number: ", ix^d
3341 do iw=1,nw
3342 write(*,*) trim(cons_wnames(iw)),": ",w(ix^d,iw)
3343 end do
3344 ! use erroneous arithmetic operation to crash the run
3345 if(trace_small_values) write(*,*) sqrt(pth(ix^d)-bigdouble)
3346 write(*,*) "Saving status at the previous time step"
3347 crash=.true.
3348 end if
3349 {end do\}
3350 end if
3351
3352 end subroutine mhd_get_pthermal_inte
3353
3354 !> Calculate thermal pressure=(gamma-1)*(e-0.5*m**2/rho-b**2/2) within ixO^L
3355 subroutine mhd_get_pthermal_origin(w,x,ixI^L,ixO^L,pth)
3358
3359 integer, intent(in) :: ixi^l, ixo^l
3360 double precision, intent(in) :: w(ixi^s,nw)
3361 double precision, intent(in) :: x(ixi^s,1:ndim)
3362 double precision, intent(out):: pth(ixi^s)
3363
3364 integer :: iw, ix^d
3365
3366 {do ix^db=ixomin^db,ixomax^db\}
3367 if(has_equi_rho0) then
3368 pth(ix^d)=gamma_1*(w(ix^d,e_)-half*((^c&w(ix^d,m^c_)**2+)/(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0))&
3369 +(^c&w(ix^d,b^c_)**2+)))+block%equi_vars(ix^d,equi_pe0_,0)
3370 else
3371 pth(ix^d)=gamma_1*(w(ix^d,e_)-half*((^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)&
3372 +(^c&w(ix^d,b^c_)**2+)))
3373 end if
3374 if(fix_small_values.and.pth(ix^d)<small_pressure) pth(ix^d)=small_pressure
3375 {end do\}
3376
3377 if(check_small_values.and..not.fix_small_values) then
3378 {do ix^db=ixomin^db,ixomax^db\}
3379 if(pth(ix^d)<small_pressure) then
3380 write(*,*) "Error: small value of gas pressure",pth(ix^d),&
3381 " encountered when call mhd_get_pthermal"
3382 write(*,*) "Iteration: ", it, " Time: ", global_time
3383 write(*,*) "Location: ", x(ix^d,:)
3384 write(*,*) "Cell number: ", ix^d
3385 do iw=1,nw
3386 write(*,*) trim(cons_wnames(iw)),": ",w(ix^d,iw)
3387 end do
3388 ! use erroneous arithmetic operation to crash the run
3389 if(trace_small_values) write(*,*) sqrt(pth(ix^d)-bigdouble)
3390 write(*,*) "Saving status at the previous time step"
3391 crash=.true.
3392 end if
3393 {end do\}
3394 end if
3395
3396 end subroutine mhd_get_pthermal_origin
3397
3398 !> Calculate thermal pressure
3399 subroutine mhd_get_pthermal_semirelati(w,x,ixI^L,ixO^L,pth)
3402
3403 integer, intent(in) :: ixi^l, ixo^l
3404 double precision, intent(in) :: w(ixi^s,nw)
3405 double precision, intent(in) :: x(ixi^s,1:ndim)
3406 double precision, intent(out):: pth(ixi^s)
3407
3408 double precision :: b(ixo^s,1:ndir), v(ixo^s,1:ndir), tmp, b2, gamma2, inv_rho
3409 integer :: iw, ix^d
3410
3411 {do ix^db=ixomin^db,ixomax^db\}
3412 b2=(^c&w(ix^d,b^c_)**2+)
3413 if(b2>smalldouble) then
3414 tmp=1.d0/sqrt(b2)
3415 else
3416 tmp=0.d0
3417 end if
3418 ^c&b(ix^d,^c)=w(ix^d,b^c_)*tmp\
3419 tmp=(^c&b(ix^d,^c)*w(ix^d,m^c_)+)
3420
3421 inv_rho=1.d0/w(ix^d,rho_)
3422 ! Va^2/c^2
3423 b2=b2*inv_rho*inv_squared_c
3424 ! equation (15)
3425 gamma2=1.d0/(1.d0+b2)
3426 ! Convert momentum to velocity
3427 ^c&v(ix^d,^c)=gamma2*(w(ix^d,m^c_)+b2*b(ix^d,^c)*tmp)*inv_rho\
3428
3429 ! E=Bxv
3430 {^ifthreec
3431 b(ix^d,1)=w(ix^d,b2_)*v(ix^d,3)-w(ix^d,b3_)*v(ix^d,2)
3432 b(ix^d,2)=w(ix^d,b3_)*v(ix^d,1)-w(ix^d,b1_)*v(ix^d,3)
3433 b(ix^d,3)=w(ix^d,b1_)*v(ix^d,2)-w(ix^d,b2_)*v(ix^d,1)
3434 }
3435 {^iftwoc
3436 b(ix^d,1)=zero
3437 b(ix^d,2)=w(ix^d,b1_)*v(ix^d,2)-w(ix^d,b2_)*v(ix^d,1)
3438 }
3439 {^ifonec
3440 b(ix^d,1)=zero
3441 }
3442 ! Calculate pressure = (gamma-1) * (e-eK-eB-eE)
3443 pth(ix^d)=gamma_1*(w(ix^d,e_)&
3444 -half*((^c&v(ix^d,^c)**2+)*w(ix^d,rho_)&
3445 +(^c&w(ix^d,b^c_)**2+)&
3446 +(^c&b(ix^d,^c)**2+)*inv_squared_c))
3447 if(fix_small_values.and.pth(ix^d)<small_pressure) pth(ix^d)=small_pressure
3448 {end do\}
3449
3450 if(check_small_values.and..not.fix_small_values) then
3451 {do ix^db=ixomin^db,ixomax^db\}
3452 if(pth(ix^d)<small_pressure) then
3453 write(*,*) "Error: small value of gas pressure",pth(ix^d),&
3454 " encountered when call mhd_get_pthermal_semirelati"
3455 write(*,*) "Iteration: ", it, " Time: ", global_time
3456 write(*,*) "Location: ", x(ix^d,:)
3457 write(*,*) "Cell number: ", ix^d
3458 do iw=1,nw
3459 write(*,*) trim(cons_wnames(iw)),": ",w(ix^d,iw)
3460 end do
3461 ! use erroneous arithmetic operation to crash the run
3462 if(trace_small_values) write(*,*) sqrt(pth(ix^d)-bigdouble)
3463 write(*,*) "Saving status at the previous time step"
3464 crash=.true.
3465 end if
3466 {end do\}
3467 end if
3468
3469 end subroutine mhd_get_pthermal_semirelati
3470
3471 !> Calculate thermal pressure=(gamma-1)*(e-0.5*m**2/rho) within ixO^L
3472 subroutine mhd_get_pthermal_hde(w,x,ixI^L,ixO^L,pth)
3475
3476 integer, intent(in) :: ixi^l, ixo^l
3477 double precision, intent(in) :: w(ixi^s,nw)
3478 double precision, intent(in) :: x(ixi^s,1:ndim)
3479 double precision, intent(out):: pth(ixi^s)
3480
3481 integer :: iw, ix^d
3482
3483 {do ix^db= ixomin^db,ixomax^db\}
3484 pth(ix^d)=gamma_1*(w(ix^d,e_)-half*((^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)))
3485 if(fix_small_values.and.pth(ix^d)<small_pressure) pth(ix^d)=small_pressure
3486 {end do\}
3487 if(check_small_values.and..not.fix_small_values) then
3488 {do ix^db= ixomin^db,ixomax^db\}
3489 if(pth(ix^d)<small_pressure) then
3490 write(*,*) "Error: small value of gas pressure",pth(ix^d),&
3491 " encountered when call mhd_get_pthermal_hde"
3492 write(*,*) "Iteration: ", it, " Time: ", global_time
3493 write(*,*) "Location: ", x(ix^d,:)
3494 write(*,*) "Cell number: ", ix^d
3495 do iw=1,nw
3496 write(*,*) trim(cons_wnames(iw)),": ",w(ix^d,iw)
3497 end do
3498 ! use erroneous arithmetic operation to crash the run
3499 if(trace_small_values) write(*,*) sqrt(pth(ix^d)-bigdouble)
3500 write(*,*) "Saving status at the previous time step"
3501 crash=.true.
3502 end if
3503 {end do\}
3504 end if
3505
3506 end subroutine mhd_get_pthermal_hde
3507
3508 !> copy temperature from stored Te variable
3509 subroutine mhd_get_temperature_from_te(w, x, ixI^L, ixO^L, res)
3511 integer, intent(in) :: ixi^l, ixo^l
3512 double precision, intent(in) :: w(ixi^s, 1:nw)
3513 double precision, intent(in) :: x(ixi^s, 1:ndim)
3514 double precision, intent(out):: res(ixi^s)
3515 res(ixo^s) = w(ixo^s, te_)
3516 end subroutine mhd_get_temperature_from_te
3517
3518 !> Calculate temperature=p/rho when in e_ the internal energy is stored
3519 subroutine mhd_get_temperature_from_eint(w, x, ixI^L, ixO^L, res)
3521 integer, intent(in) :: ixi^l, ixo^l
3522 double precision, intent(in) :: w(ixi^s, 1:nw)
3523 double precision, intent(in) :: x(ixi^s, 1:ndim)
3524 double precision, intent(out):: res(ixi^s)
3525
3526 double precision :: r(ixi^s)
3527
3528 call mhd_get_rfactor(w,x,ixi^l,ixo^l,r)
3529 res(ixo^s) = gamma_1 * w(ixo^s, e_)/(w(ixo^s,rho_)*r(ixo^s))
3530 end subroutine mhd_get_temperature_from_eint
3531
3532 !> Calculate temperature=p/rho when in e_ the total energy is stored
3533 subroutine mhd_get_temperature_from_etot(w, x, ixI^L, ixO^L, res)
3535 integer, intent(in) :: ixi^l, ixo^l
3536 double precision, intent(in) :: w(ixi^s, 1:nw)
3537 double precision, intent(in) :: x(ixi^s, 1:ndim)
3538 double precision, intent(out):: res(ixi^s)
3539
3540 double precision :: r(ixi^s)
3541
3542 call mhd_get_rfactor(w,x,ixi^l,ixo^l,r)
3543 call mhd_get_pthermal(w,x,ixi^l,ixo^l,res)
3544 res(ixo^s)=res(ixo^s)/(r(ixo^s)*w(ixo^s,rho_))
3545
3546 end subroutine mhd_get_temperature_from_etot
3547
3548 subroutine mhd_get_temperature_from_etot_with_equi(w, x, ixI^L, ixO^L, res)
3550 integer, intent(in) :: ixi^l, ixo^l
3551 double precision, intent(in) :: w(ixi^s, 1:nw)
3552 double precision, intent(in) :: x(ixi^s, 1:ndim)
3553 double precision, intent(out):: res(ixi^s)
3554
3555 double precision :: r(ixi^s)
3556
3557 call mhd_get_rfactor(w,x,ixi^l,ixo^l,r)
3558 call mhd_get_pthermal(w,x,ixi^l,ixo^l,res)
3559 res(ixo^s)=res(ixo^s)/(r(ixo^s)*(w(ixo^s,rho_)+block%equi_vars(ixo^s,equi_rho0_,b0i)))
3560
3561 end subroutine mhd_get_temperature_from_etot_with_equi
3562
3563 subroutine mhd_get_temperature_from_eint_with_equi(w, x, ixI^L, ixO^L, res)
3565 integer, intent(in) :: ixi^l, ixo^l
3566 double precision, intent(in) :: w(ixi^s, 1:nw)
3567 double precision, intent(in) :: x(ixi^s, 1:ndim)
3568 double precision, intent(out):: res(ixi^s)
3569
3570 double precision :: r(ixi^s)
3571
3572 call mhd_get_rfactor(w,x,ixi^l,ixo^l,r)
3573 res(ixo^s) = (gamma_1 * w(ixo^s, e_) + block%equi_vars(ixo^s,equi_pe0_,b0i)) /&
3574 ((w(ixo^s,rho_) +block%equi_vars(ixo^s,equi_rho0_,b0i))*r(ixo^s))
3575
3576 end subroutine mhd_get_temperature_from_eint_with_equi
3577
3578 subroutine mhd_get_temperature_equi(w,x, ixI^L, ixO^L, res)
3580 integer, intent(in) :: ixi^l, ixo^l
3581 double precision, intent(in) :: w(ixi^s, 1:nw)
3582 double precision, intent(in) :: x(ixi^s, 1:ndim)
3583 double precision, intent(out):: res(ixi^s)
3584
3585 double precision :: r(ixi^s)
3586
3587 call mhd_get_rfactor(w,x,ixi^l,ixo^l,r)
3588 res(ixo^s)= block%equi_vars(ixo^s,equi_pe0_,b0i)/(block%equi_vars(ixo^s,equi_rho0_,b0i)*r(ixo^s))
3589
3590 end subroutine mhd_get_temperature_equi
3591
3592 subroutine mhd_get_rho_equi(w, x, ixI^L, ixO^L, res)
3594 integer, intent(in) :: ixi^l, ixo^l
3595 double precision, intent(in) :: w(ixi^s, 1:nw)
3596 double precision, intent(in) :: x(ixi^s, 1:ndim)
3597 double precision, intent(out):: res(ixi^s)
3598 res(ixo^s) = block%equi_vars(ixo^s,equi_rho0_,b0i)
3599 end subroutine mhd_get_rho_equi
3600
3601 subroutine mhd_get_pe_equi(w,x, ixI^L, ixO^L, res)
3603 integer, intent(in) :: ixi^l, ixo^l
3604 double precision, intent(in) :: w(ixi^s, 1:nw)
3605 double precision, intent(in) :: x(ixi^s, 1:ndim)
3606 double precision, intent(out):: res(ixi^s)
3607 res(ixo^s) = block%equi_vars(ixo^s,equi_pe0_,b0i)
3608 end subroutine mhd_get_pe_equi
3609
3610 !> Calculate fluxes within ixO^L without any splitting
3611 subroutine mhd_get_flux(wC,w,x,ixI^L,ixO^L,idim,f)
3613 use mod_geometry
3614
3615 integer, intent(in) :: ixi^l, ixo^l, idim
3616 ! conservative w
3617 double precision, intent(in) :: wc(ixi^s,nw)
3618 ! primitive w
3619 double precision, intent(in) :: w(ixi^s,nw)
3620 double precision, intent(in) :: x(ixi^s,1:ndim)
3621 double precision,intent(out) :: f(ixi^s,nwflux)
3622
3623 double precision :: vhall(ixi^s,1:ndir)
3624 double precision :: ptotal
3625 integer :: iw, ix^d
3626
3627 if(mhd_internal_e) then
3628 {do ix^db=ixomin^db,ixomax^db\}
3629 ! Get flux of density
3630 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
3631 ! f_i[m_k]=v_i*m_k-b_k*b_i
3632 ^c&f(ix^d,m^c_)=wc(ix^d,mom(idim))*w(ix^d,m^c_)-w(ix^d,mag(idim))*w(ix^d,b^c_)\
3633 ! normal one includes total pressure
3634 f(ix^d,mom(idim))=f(ix^d,mom(idim))+w(ix^d,p_)+half*(^c&w(ix^d,b^c_)**2+)
3635 ! Get flux of internal energy
3636 f(ix^d,e_)=w(ix^d,mom(idim))*wc(ix^d,e_)
3637 ! f_i[b_k]=v_i*b_k-v_k*b_i
3638 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*w(ix^d,b^c_)-w(ix^d,mag(idim))*w(ix^d,m^c_)\
3639 {end do\}
3640 else
3641 {do ix^db=ixomin^db,ixomax^db\}
3642 ! Get flux of density
3643 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
3644 ! f_i[m_k]=v_i*m_k-b_k*b_i
3645 ^c&f(ix^d,m^c_)=wc(ix^d,mom(idim))*w(ix^d,m^c_)-w(ix^d,mag(idim))*w(ix^d,b^c_)\
3646 ptotal=w(ix^d,p_)+half*(^c&w(ix^d,b^c_)**2+)
3647 ! normal one includes total pressure
3648 f(ix^d,mom(idim))=f(ix^d,mom(idim))+ptotal
3649 ! Get flux of total energy
3650 ! f_i[e]=v_i*e+v_i*ptotal-b_i*(b_k*v_k)
3651 f(ix^d,e_)=w(ix^d,mom(idim))*(wc(ix^d,e_)+ptotal)&
3652 -w(ix^d,mag(idim))*(^c&w(ix^d,b^c_)*w(ix^d,m^c_)+)
3653 ! f_i[b_k]=v_i*b_k-v_k*b_i
3654 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*w(ix^d,b^c_)-w(ix^d,mag(idim))*w(ix^d,m^c_)\
3655 {end do\}
3656 end if
3657 if(mhd_hall) then
3658 call mhd_getv_hall(w,x,ixi^l,ixo^l,vhall)
3659 {do ix^db=ixomin^db,ixomax^db\}
3660 if(total_energy) then
3661 ! f_i[e]= f_i[e] + vHall_i*(b_k*b_k) - b_i*(vHall_k*b_k)
3662 f(ix^d,e_)=f(ix^d,e_)+vhall(ix^d,idim)*(^c&w(ix^d,b^c_)**2+)&
3663 -w(ix^d,mag(idim))*(^c&vhall(ix^d,^c)*w(ix^d,b^c_)+)
3664 end if
3665 ! f_i[b_k] = f_i[b_k] + vHall_i*b_k - vHall_k*b_i
3666 ^c&f(ix^d,b^c_)=f(ix^d,b^c_)+vhall(ix^d,idim)*w(ix^d,b^c_)-vhall(ix^d,^c)*w(ix^d,mag(idim))\
3667 {end do\}
3668 end if
3669 if(mhd_glm) then
3670 {do ix^db=ixomin^db,ixomax^db\}
3671 f(ix^d,mag(idim))=w(ix^d,psi_)
3672 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
3673 f(ix^d,psi_) = cmax_global**2*w(ix^d,mag(idim))
3674 {end do\}
3675 end if
3676 ! Get flux of tracer
3677 do iw=1,mhd_n_tracer
3678 {do ix^db=ixomin^db,ixomax^db\}
3679 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
3680 {end do\}
3681 end do
3682
3684 {do ix^db=ixomin^db,ixomax^db\}
3685 f(ix^d,e_)=f(ix^d,e_)+w(ix^d,q_)*w(ix^d,mag(idim))/(dsqrt(^d&w({ix^d},b^d_)**2+)+smalldouble)
3686 f(ix^d,q_)=zero
3687 {end do\}
3688 end if
3689
3690 end subroutine mhd_get_flux
3691
3692 !> Calculate fluxes within ixO^L without any splitting
3693 subroutine mhd_get_flux_noe(wC,w,x,ixI^L,ixO^L,idim,f)
3695 use mod_geometry
3696
3697 integer, intent(in) :: ixi^l, ixo^l, idim
3698 ! conservative w
3699 double precision, intent(in) :: wc(ixi^s,nw)
3700 ! primitive w
3701 double precision, intent(in) :: w(ixi^s,nw)
3702 double precision, intent(in) :: x(ixi^s,1:ndim)
3703 double precision,intent(out) :: f(ixi^s,nwflux)
3704
3705 double precision :: vhall(ixi^s,1:ndir)
3706 integer :: iw, ix^d
3707
3708 {do ix^db=ixomin^db,ixomax^db\}
3709 ! Get flux of density
3710 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
3711 ! f_i[m_k]=v_i*m_k-b_k*b_i
3712 ^c&f(ix^d,m^c_)=wc(ix^d,mom(idim))*w(ix^d,m^c_)-w(ix^d,mag(idim))*w(ix^d,b^c_)\
3713 ! normal one includes total pressure
3714 f(ix^d,mom(idim))=f(ix^d,mom(idim))+mhd_adiab*w(ix^d,rho_)**mhd_gamma+half*(^c&w(ix^d,b^c_)**2+)
3715 ! f_i[b_k]=v_i*b_k-v_k*b_i
3716 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*w(ix^d,b^c_)-w(ix^d,mag(idim))*w(ix^d,m^c_)\
3717 {end do\}
3718 if(mhd_hall) then
3719 call mhd_getv_hall(w,x,ixi^l,ixo^l,vhall)
3720 {do ix^db=ixomin^db,ixomax^db\}
3721 ! f_i[b_k] = f_i[b_k] + vHall_i*b_k - vHall_k*b_i
3722 ^c&f(ix^d,b^c_)=f(ix^d,b^c_)+vhall(ix^d,idim)*w(ix^d,b^c_)-vhall(ix^d,^c)*w(ix^d,mag(idim))\
3723 {end do\}
3724 end if
3725 if(mhd_glm) then
3726 {do ix^db=ixomin^db,ixomax^db\}
3727 f(ix^d,mag(idim))=w(ix^d,psi_)
3728 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
3729 f(ix^d,psi_) = cmax_global**2*w(ix^d,mag(idim))
3730 {end do\}
3731 end if
3732 ! Get flux of tracer
3733 do iw=1,mhd_n_tracer
3734 {do ix^db=ixomin^db,ixomax^db\}
3735 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
3736 {end do\}
3737 end do
3738
3739 end subroutine mhd_get_flux_noe
3740
3741 !> Calculate fluxes with hydrodynamic energy equation
3742 subroutine mhd_get_flux_hde(wC,w,x,ixI^L,ixO^L,idim,f)
3744 use mod_geometry
3745
3746 integer, intent(in) :: ixi^l, ixo^l, idim
3747 ! conservative w
3748 double precision, intent(in) :: wc(ixi^s,nw)
3749 ! primitive w
3750 double precision, intent(in) :: w(ixi^s,nw)
3751 double precision, intent(in) :: x(ixi^s,1:ndim)
3752 double precision,intent(out) :: f(ixi^s,nwflux)
3753
3754 double precision :: vhall(ixi^s,1:ndir)
3755 integer :: iw, ix^d
3756
3757 {do ix^db=ixomin^db,ixomax^db\}
3758 ! Get flux of density
3759 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
3760 ! f_i[m_k]=v_i*m_k-b_k*b_i
3761 ^c&f(ix^d,m^c_)=wc(ix^d,mom(idim))*w(ix^d,m^c_)-w(ix^d,mag(idim))*w(ix^d,b^c_)\
3762 ! normal one includes total pressure
3763 f(ix^d,mom(idim))=f(ix^d,mom(idim))+w(ix^d,p_)+half*(^c&w(ix^d,b^c_)**2+)
3764 ! Get flux of energy
3765 f(ix^d,e_)=w(ix^d,mom(idim))*(wc(ix^d,e_)+w(ix^d,p_))
3766 ! f_i[b_k]=v_i*b_k-v_k*b_i
3767 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*w(ix^d,b^c_)-w(ix^d,mag(idim))*w(ix^d,m^c_)\
3768 {end do\}
3769 if(mhd_hall) then
3770 call mhd_getv_hall(w,x,ixi^l,ixo^l,vhall)
3771 {do ix^db=ixomin^db,ixomax^db\}
3772 ! f_i[b_k] = f_i[b_k] + vHall_i*b_k - vHall_k*b_i
3773 ^c&f(ix^d,b^c_)=f(ix^d,b^c_)+vhall(ix^d,idim)*w(ix^d,b^c_)-vhall(ix^d,^c)*w(ix^d,mag(idim))\
3774 {end do\}
3775 end if
3776 if(mhd_glm) then
3777 {do ix^db=ixomin^db,ixomax^db\}
3778 f(ix^d,mag(idim))=w(ix^d,psi_)
3779 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
3780 f(ix^d,psi_) = cmax_global**2*w(ix^d,mag(idim))
3781 {end do\}
3782 end if
3783 ! Get flux of tracer
3784 do iw=1,mhd_n_tracer
3785 {do ix^db=ixomin^db,ixomax^db\}
3786 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
3787 {end do\}
3788 end do
3789
3791 {do ix^db=ixomin^db,ixomax^db\}
3792 f(ix^d,e_)=f(ix^d,e_)+w(ix^d,q_)*w(ix^d,mag(idim))/(dsqrt(^d&w({ix^d},b^d_)**2+)+smalldouble)
3793 f(ix^d,q_)=zero
3794 {end do\}
3795 end if
3796
3797 end subroutine mhd_get_flux_hde
3798
3799 !> Calculate fluxes within ixO^L with possible splitting
3800 subroutine mhd_get_flux_split(wC,w,x,ixI^L,ixO^L,idim,f)
3802 use mod_geometry
3803
3804 integer, intent(in) :: ixi^l, ixo^l, idim
3805 ! conservative w
3806 double precision, intent(in) :: wc(ixi^s,nw)
3807 ! primitive w
3808 double precision, intent(in) :: w(ixi^s,nw)
3809 double precision, intent(in) :: x(ixi^s,1:ndim)
3810 double precision,intent(out) :: f(ixi^s,nwflux)
3811
3812 double precision :: vhall(ixi^s,1:ndir)
3813 double precision :: ptotal, btotal(ixo^s,1:ndir)
3814 integer :: iw, ix^d
3815
3816 {do ix^db=ixomin^db,ixomax^db\}
3817 ! Get flux of density
3818 if(has_equi_rho0) then
3819 f(ix^d,rho_)=w(ix^d,mom(idim))*(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
3820 else
3821 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
3822 end if
3823
3824 ptotal=w(ix^d,p_)+half*(^c&w(ix^d,b^c_)**2+)
3825
3826 if(b0field) then
3827 ^c&btotal(ix^d,^c)=w(ix^d,b^c_)+block%B0(ix^d,^c,idim)\
3828 ptotal=ptotal+(^c&w(ix^d,b^c_)*block%B0(ix^d,^c,idim)+)
3829 ! Get flux of momentum and magnetic field
3830 ! f_i[m_k]=v_i*m_k-b_k*b_i
3831 ^c&f(ix^d,m^c_)=wc(ix^d,mom(idim))*w(ix^d,m^c_)-&
3832 btotal(ix^d,idim)*w(ix^d,b^c_)-w(ix^d,mag(idim))*block%B0(ix^d,^c,idim)\
3833 f(ix^d,mom(idim))=f(ix^d,mom(idim))+ptotal
3834 else
3835 ^c&btotal(ix^d,^c)=w(ix^d,b^c_)\
3836 ! Get flux of momentum and magnetic field
3837 ! f_i[m_k]=v_i*m_k-b_k*b_i
3838 ^c&f(ix^d,m^c_)=wc(ix^d,mom(idim))*w(ix^d,m^c_)-w(ix^d,mag(idim))*w(ix^d,b^c_)\
3839 f(ix^d,mom(idim))=f(ix^d,mom(idim))+ptotal
3840 end if
3841 ! f_i[b_k]=v_i*b_k-v_k*b_i
3842 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*btotal(ix^d,^c)-btotal(ix^d,idim)*w(ix^d,m^c_)\
3843
3844 ! Get flux of energy
3845 ! f_i[e]=v_i*e+v_i*ptotal-b_i*(b_k*v_k)
3846 if(mhd_internal_e) then
3847 f(ix^d,e_)=w(ix^d,mom(idim))*wc(ix^d,e_)
3848 else
3849 f(ix^d,e_)=w(ix^d,mom(idim))*(wc(ix^d,e_)+ptotal)&
3850 -btotal(ix^d,idim)*(^c&w(ix^d,b^c_)*w(ix^d,m^c_)+)
3851 end if
3852 {end do\}
3853
3854 if(mhd_glm) then
3855 {do ix^db=ixomin^db,ixomax^db\}
3856 f(ix^d,mag(idim))=w(ix^d,psi_)
3857 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
3858 f(ix^d,psi_) = cmax_global**2*w(ix^d,mag(idim))
3859 {end do\}
3860 end if
3861
3862 if(mhd_hall) then
3863 call mhd_getv_hall(w,x,ixi^l,ixo^l,vhall)
3864 {do ix^db=ixomin^db,ixomax^db\}
3865 ! f_i[b_k] = f_i[b_k] + vHall_i*b_k - vHall_k*b_i
3866 ^c&f(ix^d,b^c_)=f(ix^d,b^c_)+vhall(ix^d,idim)*w(ix^d,b^c_)-vhall(ix^d,^c)*w(ix^d,mag(idim))\
3867 if(total_energy) then
3868 ! f_i[e]= f_i[e] + vHall_i*(b_k*b_k) - b_i*(vHall_k*b_k)
3869 f(ix^d,e_)=f(ix^d,e_)+vhall(ix^d,idim)*(^c&w(ix^d,b^c_)*btotal(ix^d,^c)+)&
3870 -btotal(ix^d,idim)*(^c&vhall(ix^d,^c)*w(ix^d,b^c_)+)
3871 end if
3872 {end do\}
3873 end if
3874 ! Get flux of tracer
3875 do iw=1,mhd_n_tracer
3876 {do ix^db=ixomin^db,ixomax^db\}
3877 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
3878 {end do\}
3879 end do
3881 {do ix^db=ixomin^db,ixomax^db\}
3882 f(ix^d,e_)=f(ix^d,e_)+w(ix^d,q_)*btotal(ix^d,idim)/(dsqrt(^c&btotal(ix^d,^c)**2+)+smalldouble)
3883 f(ix^d,q_)=zero
3884 {end do\}
3885 end if
3886
3887 end subroutine mhd_get_flux_split
3888
3889 !> Calculate semirelativistic fluxes within ixO^L without any splitting
3890 subroutine mhd_get_flux_semirelati(wC,w,x,ixI^L,ixO^L,idim,f)
3892 use mod_geometry
3893
3894 integer, intent(in) :: ixi^l, ixo^l, idim
3895 ! conservative w
3896 double precision, intent(in) :: wc(ixi^s,nw)
3897 ! primitive w
3898 double precision, intent(in) :: w(ixi^s,nw)
3899 double precision, intent(in) :: x(ixi^s,1:ndim)
3900 double precision,intent(out) :: f(ixi^s,nwflux)
3901
3902 double precision :: sa(ixo^s,1:ndir),e(ixo^s,1:ndir),e2
3903 integer :: iw, ix^d
3904
3905 {do ix^db=ixomin^db,ixomax^db\}
3906 ! Get flux of density
3907 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
3908 ! E=Bxv
3909 {^ifthreec
3910 e(ix^d,1)=w(ix^d,b2_)*w(ix^d,m3_)-w(ix^d,b3_)*w(ix^d,m2_)
3911 e(ix^d,2)=w(ix^d,b3_)*w(ix^d,m1_)-w(ix^d,b1_)*w(ix^d,m3_)
3912 e(ix^d,3)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
3913 }
3914 {^iftwoc
3915 e(ix^d,1)=zero
3916 ! switch 2 and 3 to add 3 when ^C is from 1 to 2
3917 e(ix^d,2)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
3918 }
3919 {^ifonec
3920 e(ix^d,1)=zero
3921 }
3922 e2=(^c&e(ix^d,^c)**2+)
3923 if(mhd_internal_e) then
3924 ! Get flux of internal energy
3925 f(ix^d,e_)=w(ix^d,mom(idim))*wc(ix^d,e_)
3926 else
3927 ! S=ExB
3928 {^ifthreec
3929 sa(ix^d,1)=e(ix^d,2)*w(ix^d,b3_)-e(ix^d,3)*w(ix^d,b2_)
3930 sa(ix^d,2)=e(ix^d,3)*w(ix^d,b1_)-e(ix^d,1)*w(ix^d,b3_)
3931 sa(ix^d,3)=e(ix^d,1)*w(ix^d,b2_)-e(ix^d,2)*w(ix^d,b1_)
3932 }
3933 {^iftwoc
3934 sa(ix^d,1)=-e(ix^d,2)*w(ix^d,b2_)
3935 sa(ix^d,2)=e(ix^d,2)*w(ix^d,b1_)
3936 ! set E2 back to 0, after e^2 is stored
3937 e(ix^d,2)=zero
3938 }
3939 {^ifonec
3940 sa(ix^d,1)=zero
3941 }
3942 ! Get flux of total energy
3943 f(ix^d,e_)=w(ix^d,mom(idim))*(half*w(ix^d,rho_)*(^c&w(ix^d,m^c_)**2+)+&
3944 mhd_gamma*w(ix^d,p_)*inv_gamma_1)+sa(ix^d,idim)
3945 end if
3946 ! Get flux of momentum
3947 ^c&f(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,mom(idim))*w(ix^d,m^c_)&
3948 -w(ix^d,mag(idim))*w(ix^d,b^c_)-e(ix^d,idim)*e(ix^d,^c)*inv_squared_c\
3949 ! gas pressure + magnetic pressure + electric pressure
3950 f(ix^d,mom(idim))=f(ix^d,mom(idim))+w(ix^d,p_)+half*((^c&w(ix^d,b^c_)**2+)+e2*inv_squared_c)
3951 ! compute flux of magnetic field
3952 ! f_i[b_k]=v_i*b_k-v_k*b_i
3953 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*w(ix^d,b^c_)-w(ix^d,mag(idim))*w(ix^d,m^c_)\
3954 {end do\}
3955
3956 if(mhd_glm) then
3957 {do ix^db=ixomin^db,ixomax^db\}
3958 f(ix^d,mag(idim))=w(ix^d,psi_)
3959 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
3960 f(ix^d,psi_)=cmax_global**2*w(ix^d,mag(idim))
3961 {end do\}
3962 end if
3963 ! Get flux of tracer
3964 do iw=1,mhd_n_tracer
3965 {do ix^db=ixomin^db,ixomax^db\}
3966 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
3967 {end do\}
3968 end do
3969
3970 end subroutine mhd_get_flux_semirelati
3971
3972 subroutine mhd_get_flux_semirelati_noe(wC,w,x,ixI^L,ixO^L,idim,f)
3974 use mod_geometry
3975
3976 integer, intent(in) :: ixi^l, ixo^l, idim
3977 ! conservative w
3978 double precision, intent(in) :: wc(ixi^s,nw)
3979 ! primitive w
3980 double precision, intent(in) :: w(ixi^s,nw)
3981 double precision, intent(in) :: x(ixi^s,1:ndim)
3982 double precision,intent(out) :: f(ixi^s,nwflux)
3983
3984 double precision :: e(ixo^s,1:ndir),e2
3985 integer :: iw, ix^d
3986
3987 {do ix^db=ixomin^db,ixomax^db\}
3988 ! Get flux of density
3989 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
3990 ! E=Bxv
3991 {^ifthreec
3992 e(ix^d,1)=w(ix^d,b2_)*w(ix^d,m3_)-w(ix^d,b3_)*w(ix^d,m2_)
3993 e(ix^d,2)=w(ix^d,b3_)*w(ix^d,m1_)-w(ix^d,b1_)*w(ix^d,m3_)
3994 e(ix^d,3)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
3995 e2=(^c&e(ix^d,^c)**2+)
3996 }
3997 {^iftwoc
3998 e(ix^d,1)=zero
3999 ! switch 2 and 3 to add 3 when ^C is from 1 to 2
4000 e(ix^d,2)=w(ix^d,b1_)*w(ix^d,m2_)-w(ix^d,b2_)*w(ix^d,m1_)
4001 e2=e(ix^d,2)**2
4002 e(ix^d,2)=zero
4003 }
4004 {^ifonec
4005 e(ix^d,1)=zero
4006 }
4007 ! Get flux of momentum
4008 ^c&f(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,mom(idim))*w(ix^d,m^c_)&
4009 -w(ix^d,mag(idim))*w(ix^d,b^c_)-e(ix^d,idim)*e(ix^d,^c)*inv_squared_c\
4010 ! gas pressure + magnetic pressure + electric pressure
4011 f(ix^d,mom(idim))=f(ix^d,mom(idim))+w(ix^d,p_)+half*((^c&w(ix^d,b^c_)**2+)+e2*inv_squared_c)
4012 ! compute flux of magnetic field
4013 ! f_i[b_k]=v_i*b_k-v_k*b_i
4014 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*w(ix^d,b^c_)-w(ix^d,mag(idim))*w(ix^d,m^c_)\
4015 {end do\}
4016
4017 if(mhd_glm) then
4018 {do ix^db=ixomin^db,ixomax^db\}
4019 f(ix^d,mag(idim))=w(ix^d,psi_)
4020 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
4021 f(ix^d,psi_)=cmax_global**2*w(ix^d,mag(idim))
4022 {end do\}
4023 end if
4024 ! Get flux of tracer
4025 do iw=1,mhd_n_tracer
4026 {do ix^db=ixomin^db,ixomax^db\}
4027 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
4028 {end do\}
4029 end do
4030
4031 end subroutine mhd_get_flux_semirelati_noe
4032
4033 !> Source terms J.E in internal energy.
4034 !> For the ambipolar term E = ambiCoef * JxBxB=ambiCoef * B^2(-J_perpB)
4035 !=> the source term J.E = ambiCoef * B^2 * J_perpB^2 = ambiCoef * JxBxB^2/B^2
4036 !> ambiCoef is calculated as mhd_ambi_coef/rho^2, see also the subroutine mhd_get_Jambi
4037 subroutine add_source_ambipolar_internal_energy(qdt,ixI^L,ixO^L,wCT,w,x,ie)
4039 integer, intent(in) :: ixi^l, ixo^l,ie
4040 double precision, intent(in) :: qdt
4041 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
4042 double precision, intent(inout) :: w(ixi^s,1:nw)
4043 double precision :: tmp(ixi^s)
4044 double precision :: jxbxb(ixi^s,1:3)
4045
4046 call mhd_get_jxbxb(wct,x,ixi^l,ixo^l,jxbxb)
4047 tmp(ixo^s) = sum(jxbxb(ixo^s,1:3)**2,dim=ndim+1) / mhd_mag_en_all(wct, ixi^l, ixo^l)
4048 call multiplyambicoef(ixi^l,ixo^l,tmp,wct,x)
4049 w(ixo^s,ie)=w(ixo^s,ie)+qdt * tmp
4050
4051 end subroutine add_source_ambipolar_internal_energy
4052
4053 subroutine mhd_get_jxbxb(w,x,ixI^L,ixO^L,res)
4055
4056 integer, intent(in) :: ixi^l, ixo^l
4057 double precision, intent(in) :: w(ixi^s,nw)
4058 double precision, intent(in) :: x(ixi^s,1:ndim)
4059 double precision, intent(out) :: res(:^d&,:)
4060
4061 double precision :: btot(ixi^s,1:3)
4062 double precision :: current(ixi^s,7-2*ndir:3)
4063 double precision :: tmp(ixi^s),b2(ixi^s)
4064 integer :: idir, idirmin
4065
4066 res=0.d0
4067 ! Calculate current density and idirmin
4068 call get_current(w,ixi^l,ixo^l,idirmin,current)
4069 !!!here we know that current has nonzero values only for components in the range idirmin, 3
4070
4071 if(b0field) then
4072 do idir=1,3
4073 btot(ixo^s, idir) = w(ixo^s,mag(idir)) + block%B0(ixo^s,idir,b0i)
4074 enddo
4075 else
4076 btot(ixo^s,1:3) = w(ixo^s,mag(1:3))
4077 endif
4078
4079 tmp(ixo^s) = sum(current(ixo^s,idirmin:3)*btot(ixo^s,idirmin:3),dim=ndim+1) !J.B
4080 b2(ixo^s) = sum(btot(ixo^s,1:3)**2,dim=ndim+1) !B^2
4081 do idir=1,idirmin-1
4082 res(ixo^s,idir) = btot(ixo^s,idir) * tmp(ixo^s)
4083 enddo
4084 do idir=idirmin,3
4085 res(ixo^s,idir) = btot(ixo^s,idir) * tmp(ixo^s) - current(ixo^s,idir) * b2(ixo^s)
4086 enddo
4087 end subroutine mhd_get_jxbxb
4088
4089 !> Sets the sources for the ambipolar
4090 !> this is used for the STS method
4091 ! The sources are added directly (instead of fluxes as in the explicit)
4092 !> at the corresponding indices
4093 !> store_flux_var is explicitly called for each of the fluxes one by one
4094 subroutine sts_set_source_ambipolar(ixI^L,ixO^L,w,x,wres,fix_conserve_at_step,my_dt,igrid,nflux)
4097
4098 integer, intent(in) :: ixi^l, ixo^l,igrid,nflux
4099 double precision, intent(in) :: x(ixi^s,1:ndim)
4100 double precision, intent(inout) :: wres(ixi^s,1:nw), w(ixi^s,1:nw)
4101 double precision, intent(in) :: my_dt
4102 logical, intent(in) :: fix_conserve_at_step
4103
4104 double precision, dimension(ixI^S,1:3) :: tmp,ff
4105 double precision :: fluxall(ixi^s,1:nflux,1:ndim)
4106 double precision :: fe(ixi^s,sdim:3)
4107 double precision :: btot(ixi^s,1:3),tmp2(ixi^s)
4108 integer :: i, ixa^l, ie_
4109
4110 ixa^l=ixo^l^ladd1;
4111
4112 fluxall=zero
4113
4114 call mhd_get_jxbxb(w,x,ixi^l,ixa^l,tmp)
4115
4116 !set electric field in tmp: E=nuA * jxbxb, where nuA=-etaA/rho^2
4117 do i=1,3
4118 !tmp(ixA^S,i) = -(mhd_eta_ambi/w(ixA^S, rho_)**2) * tmp(ixA^S,i)
4119 call multiplyambicoef(ixi^l,ixa^l,tmp(ixi^s,i),w,x)
4120 enddo
4121
4122 if(mhd_energy .and. .not.mhd_internal_e) then
4123 !btot should be only mag. pert.
4124 btot(ixa^s,1:3)=0.d0
4125 !if(B0field) then
4126 ! do i=1,ndir
4127 ! btot(ixA^S, i) = w(ixA^S,mag(i)) + block%B0(ixA^S,i,0)
4128 ! enddo
4129 !else
4130 btot(ixa^s,1:ndir) = w(ixa^s,mag(1:ndir))
4131 !endif
4132 call cross_product(ixi^l,ixa^l,tmp,btot,ff)
4133 call get_flux_on_cell_face(ixi^l,ixo^l,ff,tmp2)
4134 if(fix_conserve_at_step) fluxall(ixi^s,1,1:ndim)=ff(ixi^s,1:ndim)
4135 !- sign comes from the fact that the flux divergence is a source now
4136 wres(ixo^s,e_)=-tmp2(ixo^s)
4137 endif
4138
4139 if(stagger_grid) then
4140 if(ndir>ndim) then
4141 !!!Bz
4142 ff(ixa^s,1) = tmp(ixa^s,2)
4143 ff(ixa^s,2) = -tmp(ixa^s,1)
4144 ff(ixa^s,3) = 0.d0
4145 call get_flux_on_cell_face(ixi^l,ixo^l,ff,tmp2)
4146 if(fix_conserve_at_step) fluxall(ixi^s,1+ndir,1:ndim)=ff(ixi^s,1:ndim)
4147 wres(ixo^s,mag(ndir))=-tmp2(ixo^s)
4148 end if
4149 fe=0.d0
4150 call update_faces_ambipolar(ixi^l,ixo^l,w,x,tmp,fe,btot)
4151 ixamax^d=ixomax^d;
4152 ixamin^d=ixomin^d-1;
4153 wres(ixa^s,mag(1:ndim))=-btot(ixa^s,1:ndim)
4154 else
4155 !write curl(ele) as the divergence
4156 !m1={0,ele[[3]],-ele[[2]]}
4157 !m2={-ele[[3]],0,ele[[1]]}
4158 !m3={ele[[2]],-ele[[1]],0}
4159
4160 !!!Bx
4161 ff(ixa^s,1) = 0.d0
4162 ff(ixa^s,2) = tmp(ixa^s,3)
4163 ff(ixa^s,3) = -tmp(ixa^s,2)
4164 call get_flux_on_cell_face(ixi^l,ixo^l,ff,tmp2)
4165 if(fix_conserve_at_step) fluxall(ixi^s,2,1:ndim)=ff(ixi^s,1:ndim)
4166 !flux divergence is a source now
4167 wres(ixo^s,mag(1))=-tmp2(ixo^s)
4168 !!!By
4169 ff(ixa^s,1) = -tmp(ixa^s,3)
4170 ff(ixa^s,2) = 0.d0
4171 ff(ixa^s,3) = tmp(ixa^s,1)
4172 call get_flux_on_cell_face(ixi^l,ixo^l,ff,tmp2)
4173 if(fix_conserve_at_step) fluxall(ixi^s,3,1:ndim)=ff(ixi^s,1:ndim)
4174 wres(ixo^s,mag(2))=-tmp2(ixo^s)
4175
4176 if(ndir==3) then
4177 !!!Bz
4178 ff(ixa^s,1) = tmp(ixa^s,2)
4179 ff(ixa^s,2) = -tmp(ixa^s,1)
4180 ff(ixa^s,3) = 0.d0
4181 call get_flux_on_cell_face(ixi^l,ixo^l,ff,tmp2)
4182 if(fix_conserve_at_step) fluxall(ixi^s,1+ndir,1:ndim)=ff(ixi^s,1:ndim)
4183 wres(ixo^s,mag(ndir))=-tmp2(ixo^s)
4184 end if
4185
4186 end if
4187
4188 if(fix_conserve_at_step) then
4189 fluxall=my_dt*fluxall
4190 call store_flux(igrid,fluxall,1,ndim,nflux)
4191 if(stagger_grid) then
4192 call store_edge(igrid,ixi^l,my_dt*fe,1,ndim)
4193 end if
4194 end if
4195
4196 end subroutine sts_set_source_ambipolar
4197
4198 !> get ambipolar electric field and the integrals around cell faces
4199 subroutine update_faces_ambipolar(ixI^L,ixO^L,w,x,ECC,fE,circ)
4201
4202 integer, intent(in) :: ixi^l, ixo^l
4203 double precision, intent(in) :: w(ixi^s,1:nw)
4204 double precision, intent(in) :: x(ixi^s,1:ndim)
4205 ! amibipolar electric field at cell centers
4206 double precision, intent(in) :: ecc(ixi^s,1:3)
4207 double precision, intent(out) :: fe(ixi^s,sdim:3)
4208 double precision, intent(out) :: circ(ixi^s,1:ndim)
4209
4210 integer :: hxc^l,ixc^l,ixa^l
4211 integer :: idim1,idim2,idir,ix^d
4212
4213 fe=zero
4214 ! calcuate ambipolar electric field on cell edges from cell centers
4215 do idir=sdim,3
4216 ixcmax^d=ixomax^d;
4217 ixcmin^d=ixomin^d+kr(idir,^d)-1;
4218 {do ix^db=0,1\}
4219 if({ ix^d==1 .and. ^d==idir | .or.}) cycle
4220 ixamin^d=ixcmin^d+ix^d;
4221 ixamax^d=ixcmax^d+ix^d;
4222 fe(ixc^s,idir)=fe(ixc^s,idir)+ecc(ixa^s,idir)
4223 {end do\}
4224 fe(ixc^s,idir)=fe(ixc^s,idir)*0.25d0*block%dsC(ixc^s,idir)
4225 end do
4226
4227 ! Calculate circulation on each face to get value of line integral of
4228 ! electric field in the positive idir direction.
4229 ixcmax^d=ixomax^d;
4230 ixcmin^d=ixomin^d-1;
4231
4232 circ=zero
4233
4234 do idim1=1,ndim ! Coordinate perpendicular to face
4235 do idim2=1,ndim
4236 do idir=sdim,3 ! Direction of line integral
4237 ! Assemble indices
4238 hxc^l=ixc^l-kr(idim2,^d);
4239 ! Add line integrals in direction idir
4240 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
4241 +lvc(idim1,idim2,idir)&
4242 *(fe(ixc^s,idir)&
4243 -fe(hxc^s,idir))
4244 end do
4245 end do
4246 circ(ixc^s,idim1)=circ(ixc^s,idim1)/block%surfaceC(ixc^s,idim1)
4247 end do
4248
4249 end subroutine update_faces_ambipolar
4250
4251 !> use cell-center flux to get cell-face flux
4252 !> and get the source term as the divergence of the flux
4253 subroutine get_flux_on_cell_face(ixI^L,ixO^L,ff,src)
4255
4256 integer, intent(in) :: ixi^l, ixo^l
4257 double precision, dimension(:^D&,:), intent(inout) :: ff
4258 double precision, intent(out) :: src(ixi^s)
4259
4260 double precision :: ffc(ixi^s,1:ndim)
4261 double precision :: dxinv(ndim)
4262 integer :: idims, ix^d, ixa^l, ixb^l, ixc^l
4263
4264 ixa^l=ixo^l^ladd1;
4265 dxinv=1.d0/dxlevel
4266 ! cell corner flux in ffc
4267 ffc=0.d0
4268 ixcmax^d=ixomax^d; ixcmin^d=ixomin^d-1;
4269 {do ix^db=0,1\}
4270 ixbmin^d=ixcmin^d+ix^d;
4271 ixbmax^d=ixcmax^d+ix^d;
4272 ffc(ixc^s,1:ndim)=ffc(ixc^s,1:ndim)+ff(ixb^s,1:ndim)
4273 {end do\}
4274 ffc(ixc^s,1:ndim)=0.5d0**ndim*ffc(ixc^s,1:ndim)
4275 ! flux at cell face
4276 ff(ixi^s,1:ndim)=0.d0
4277 do idims=1,ndim
4278 ixb^l=ixo^l-kr(idims,^d);
4279 ixcmax^d=ixomax^d; ixcmin^d=ixbmin^d;
4280 {do ix^db=0,1 \}
4281 if({ ix^d==0 .and. ^d==idims | .or.}) then
4282 ixbmin^d=ixcmin^d-ix^d;
4283 ixbmax^d=ixcmax^d-ix^d;
4284 ff(ixc^s,idims)=ff(ixc^s,idims)+ffc(ixb^s,idims)
4285 end if
4286 {end do\}
4287 ff(ixc^s,idims)=ff(ixc^s,idims)*0.5d0**(ndim-1)
4288 end do
4289 src=0.d0
4290 if(slab_uniform) then
4291 do idims=1,ndim
4292 ff(ixa^s,idims)=dxinv(idims)*ff(ixa^s,idims)
4293 ixb^l=ixo^l-kr(idims,^d);
4294 src(ixo^s)=src(ixo^s)+ff(ixo^s,idims)-ff(ixb^s,idims)
4295 end do
4296 else
4297 do idims=1,ndim
4298 ff(ixa^s,idims)=ff(ixa^s,idims)*block%surfaceC(ixa^s,idims)
4299 ixb^l=ixo^l-kr(idims,^d);
4300 src(ixo^s)=src(ixo^s)+ff(ixo^s,idims)-ff(ixb^s,idims)
4301 end do
4302 src(ixo^s)=src(ixo^s)/block%dvolume(ixo^s)
4303 end if
4304 end subroutine get_flux_on_cell_face
4305
4306 !> Calculates the explicit dt for the ambipokar term
4307 !> This function is used by both explicit scheme and STS method
4308 function get_ambipolar_dt(w,ixI^L,ixO^L,dx^D,x) result(dtnew)
4310
4311 integer, intent(in) :: ixi^l, ixo^l
4312 double precision, intent(in) :: dx^d, x(ixi^s,1:ndim)
4313 double precision, intent(in) :: w(ixi^s,1:nw)
4314 double precision :: dtnew
4315
4316 double precision :: coef
4317 double precision :: dxarr(ndim)
4318 double precision :: tmp(ixi^s)
4319
4320 ^d&dxarr(^d)=dx^d;
4321 tmp(ixo^s) = mhd_mag_en_all(w, ixi^l, ixo^l)
4322 call multiplyambicoef(ixi^l,ixo^l,tmp,w,x)
4323 coef = maxval(abs(tmp(ixo^s)))
4324 if(coef/=0.d0) then
4325 coef=1.d0/coef
4326 else
4327 coef=bigdouble
4328 end if
4329 if(slab_uniform) then
4330 dtnew=minval(dxarr(1:ndim))**2.0d0*coef
4331 else
4332 dtnew=minval(block%ds(ixo^s,1:ndim))**2.0d0*coef
4333 end if
4334
4335 end function get_ambipolar_dt
4336
4337 !> multiply res by the ambipolar coefficient
4338 !> The ambipolar coefficient is calculated as -mhd_eta_ambi/rho^2
4339 !> The user may mask its value in the user file
4340 !> by implemneting usr_mask_ambipolar subroutine
4341 subroutine multiplyambicoef(ixI^L,ixO^L,res,w,x)
4343 integer, intent(in) :: ixi^l, ixo^l
4344 double precision, intent(in) :: w(ixi^s,1:nw), x(ixi^s,1:ndim)
4345 double precision, intent(inout) :: res(ixi^s)
4346 double precision :: tmp(ixi^s)
4347 double precision :: rho(ixi^s)
4348
4349 call mhd_get_rho(w,x,ixi^l,ixo^l,rho)
4350 tmp=0.d0
4351 tmp(ixo^s)=-mhd_eta_ambi/rho(ixo^s)**2
4352 if (associated(usr_mask_ambipolar)) then
4353 call usr_mask_ambipolar(ixi^l,ixo^l,w,x,tmp)
4354 end if
4355
4356 res(ixo^s) = tmp(ixo^s) * res(ixo^s)
4357 end subroutine multiplyambicoef
4358
4359 !> w[iws]=w[iws]+qdt*S[iws,wCT] where S is the source based on wCT within ixO
4360 subroutine mhd_add_source(qdt,dtfactor,ixI^L,ixO^L,wCT,wCTprim,w,x,qsourcesplit,active)
4365 use mod_cak_force, only: cak_add_source
4366
4367 integer, intent(in) :: ixi^l, ixo^l
4368 double precision, intent(in) :: qdt,dtfactor
4369 double precision, intent(in) :: wct(ixi^s,1:nw),wctprim(ixi^s,1:nw), x(ixi^s,1:ndim)
4370 double precision, intent(inout) :: w(ixi^s,1:nw)
4371 logical, intent(in) :: qsourcesplit
4372 logical, intent(inout) :: active
4373
4374 !TODO local_timestep support is only added for splitting
4375 ! but not for other nonideal terms such gravity, RC, viscosity,..
4376 ! it will also only work for divbfix 'linde', which does not require
4377 ! modification as it does not use dt in the update
4378
4379 if (.not. qsourcesplit) then
4380 if(mhd_internal_e) then
4381 ! Source for solving internal energy
4382 active = .true.
4383 call add_source_internal_e(qdt,ixi^l,ixo^l,wct,w,x,wctprim)
4384 else
4385 if(has_equi_pe0) then
4386 active = .true.
4387 call add_pe0_divv(qdt,dtfactor,ixi^l,ixo^l,wctprim,w,x)
4388 end if
4389 end if
4390
4392 call add_hypertc_source(qdt,ixi^l,ixo^l,wct,w,x,wctprim)
4393 end if
4394
4395 ! Source for B0 splitting
4396 if (b0field) then
4397 active = .true.
4398 call add_source_b0split(qdt,dtfactor,ixi^l,ixo^l,wctprim,w,x)
4399 end if
4400
4401 ! Sources for resistivity in eqs. for e, B1, B2 and B3
4402 if (abs(mhd_eta)>smalldouble)then
4403 active = .true.
4404 call add_source_res2(qdt,ixi^l,ixo^l,wct,w,x)
4405 end if
4406
4407 if (mhd_eta_hyper>0.d0)then
4408 active = .true.
4409 call add_source_hyperres(qdt,ixi^l,ixo^l,wct,w,x)
4410 end if
4411
4412 if(mhd_hydrodynamic_e) then
4413 ! Source for solving hydrodynamic energy
4414 active = .true.
4415 call add_source_hydrodynamic_e(qdt,ixi^l,ixo^l,wct,w,x,wctprim)
4416 else if (mhd_semirelativistic) then
4417 ! add sources for semirelativistic MHD
4418 active = .true.
4419 call add_source_semirelativistic(qdt,ixi^l,ixo^l,wct,w,x,wctprim)
4420 end if
4421 end if
4422
4423 {^nooned
4424 if(source_split_divb .eqv. qsourcesplit) then
4425 ! Sources related to div B
4426 select case (type_divb)
4427 case (divb_ct)
4428 continue ! Do nothing
4429 case (divb_linde)
4430 active = .true.
4431 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
4432 case (divb_glm)
4433 active = .true.
4434 call add_source_glm(qdt,ixi^l,ixo^l,wct,w,x)
4435 case (divb_powel)
4436 active = .true.
4437 call add_source_powel(qdt,ixi^l,ixo^l,wctprim,w,x)
4438 case (divb_janhunen)
4439 active = .true.
4440 call add_source_janhunen(qdt,ixi^l,ixo^l,wctprim,w,x)
4441 case (divb_lindejanhunen)
4442 active = .true.
4443 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
4444 call add_source_janhunen(qdt,ixi^l,ixo^l,wctprim,w,x)
4445 case (divb_lindepowel)
4446 active = .true.
4447 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
4448 call add_source_powel(qdt,ixi^l,ixo^l,wctprim,w,x)
4449 case (divb_lindeglm)
4450 active = .true.
4451 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
4452 call add_source_glm(qdt,ixi^l,ixo^l,wct,w,x)
4453 case (divb_multigrid)
4454 continue ! Do nothing
4455 case (divb_none)
4456 ! Do nothing
4457 case default
4458 call mpistop('Unknown divB fix')
4459 end select
4460 end if
4461 }
4462
4463 if(mhd_radiative_cooling) then
4464 call radiative_cooling_add_source(qdt,ixi^l,ixo^l,wct,wctprim,&
4465 w,x,qsourcesplit,active, rc_fl)
4466 end if
4467
4468 if(mhd_viscosity) then
4469 call viscosity_add_source(qdt,ixi^l,ixo^l,wct,&
4470 w,x,mhd_energy,qsourcesplit,active)
4471 end if
4472
4473 if(mhd_gravity) then
4474 call gravity_add_source(qdt,ixi^l,ixo^l,wct,wctprim,&
4475 w,x,gravity_energy,gravity_rhov,qsourcesplit,active)
4476 end if
4477
4478 if (mhd_cak_force) then
4479 call cak_add_source(qdt,ixi^l,ixo^l,wct,w,x,mhd_energy,qsourcesplit,active)
4480 end if
4481
4482 ! update temperature from new pressure, density, and old ionization degree
4483 if(mhd_partial_ionization) then
4484 if(.not.qsourcesplit) then
4485 active = .true.
4486 call mhd_update_temperature(ixi^l,ixo^l,wct,w,x)
4487 end if
4488 end if
4489
4490 end subroutine mhd_add_source
4491
4492 subroutine add_pe0_divv(qdt,dtfactor,ixI^L,ixO^L,wCT,w,x)
4494 use mod_geometry
4495
4496 integer, intent(in) :: ixi^l, ixo^l
4497 double precision, intent(in) :: qdt,dtfactor
4498 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
4499 double precision, intent(inout) :: w(ixi^s,1:nw)
4500 double precision :: divv(ixi^s)
4501
4502 if(slab_uniform) then
4503 if(nghostcells .gt. 2) then
4504 call divvector(wct(ixi^s,mom(1:ndir)),ixi^l,ixo^l,divv,3)
4505 else
4506 call divvector(wct(ixi^s,mom(1:ndir)),ixi^l,ixo^l,divv,2)
4507 end if
4508 else
4509 call divvector(wct(ixi^s,mom(1:ndir)),ixi^l,ixo^l,divv)
4510 end if
4511 if(local_timestep) then
4512 w(ixo^s,e_)=w(ixo^s,e_)-dtfactor*block%dt(ixo^s)*block%equi_vars(ixo^s,equi_pe0_,0)*divv(ixo^s)
4513 else
4514 w(ixo^s,e_)=w(ixo^s,e_)-qdt*block%equi_vars(ixo^s,equi_pe0_,0)*divv(ixo^s)
4515 end if
4516 end subroutine add_pe0_divv
4517
4518 subroutine get_tau(ixI^L,ixO^L,w,Te,tau,sigT5)
4520 integer, intent(in) :: ixi^l, ixo^l
4521 double precision, dimension(ixI^S,1:nw), intent(in) :: w
4522 double precision, dimension(ixI^S), intent(in) :: te
4523 double precision, dimension(ixI^S), intent(out) :: tau,sigt5
4524
4525 double precision :: dxmin,taumin
4526 double precision, dimension(ixI^S) :: sigt7,eint
4527 integer :: ix^d
4528
4529 taumin=4.d0
4530 !> w supposed to be wCTprim here
4531 if(mhd_trac) then
4532 where(te(ixo^s) .lt. block%wextra(ixo^s,tcoff_))
4533 sigt5(ixo^s)=hypertc_kappa*sqrt(block%wextra(ixo^s,tcoff_)**5)
4534 sigt7(ixo^s)=sigt5(ixo^s)*block%wextra(ixo^s,tcoff_)
4535 else where
4536 sigt5(ixo^s)=hypertc_kappa*sqrt(te(ixo^s)**5)
4537 sigt7(ixo^s)=sigt5(ixo^s)*te(ixo^s)
4538 end where
4539 else
4540 sigt5(ixo^s)=hypertc_kappa*sqrt(te(ixo^s)**5)
4541 sigt7(ixo^s)=sigt5(ixo^s)*te(ixo^s)
4542 end if
4543 eint(ixo^s)=w(ixo^s,p_)/(mhd_gamma-one)
4544 tau(ixo^s)=max(taumin*dt,sigt7(ixo^s)/eint(ixo^s)/cmax_global**2)
4545 end subroutine get_tau
4546
4547 subroutine add_hypertc_source(qdt,ixI^L,ixO^L,wCT,w,x,wCTprim)
4549 integer, intent(in) :: ixi^l,ixo^l
4550 double precision, intent(in) :: qdt
4551 double precision, dimension(ixI^S,1:ndim), intent(in) :: x
4552 double precision, dimension(ixI^S,1:nw), intent(in) :: wct,wctprim
4553 double precision, dimension(ixI^S,1:nw), intent(inout) :: w
4554
4555 double precision :: invdx
4556 double precision, dimension(ixI^S) :: te,tau,sigt,htc_qsrc,tface,r
4557 double precision, dimension(ixI^S) :: htc_esrc,bsum,bunit
4558 double precision, dimension(ixI^S,1:ndim) :: btot
4559 integer :: idims
4560 integer :: hxc^l,hxo^l,ixc^l,jxc^l,jxo^l,kxc^l
4561
4562 call mhd_get_rfactor(wctprim,x,ixi^l,ixi^l,r)
4563 !Te(ixI^S)=wCTprim(ixI^S,p_)/wCT(ixI^S,rho_)
4564 te(ixi^s)=wctprim(ixi^s,p_)/(r(ixi^s)*w(ixi^s,rho_))
4565 call get_tau(ixi^l,ixo^l,wctprim,te,tau,sigt)
4566 htc_qsrc=zero
4567 do idims=1,ndim
4568 if(b0field) then
4569 btot(ixo^s,idims)=wct(ixo^s,mag(idims))+block%B0(ixo^s,idims,0)
4570 else
4571 btot(ixo^s,idims)=wct(ixo^s,mag(idims))
4572 endif
4573 enddo
4574 bsum(ixo^s)=sqrt(sum(btot(ixo^s,:)**2,dim=ndim+1))+smalldouble
4575 do idims=1,ndim
4576 invdx=1.d0/dxlevel(idims)
4577 ixc^l=ixo^l;
4578 ixcmin^d=ixomin^d-kr(idims,^d);ixcmax^d=ixomax^d;
4579 jxc^l=ixc^l+kr(idims,^d);
4580 kxc^l=jxc^l+kr(idims,^d);
4581 hxc^l=ixc^l-kr(idims,^d);
4582 hxo^l=ixo^l-kr(idims,^d);
4583 tface(ixc^s)=(7.d0*(te(ixc^s)+te(jxc^s))-(te(hxc^s)+te(kxc^s)))/12.d0
4584 bunit(ixo^s)=btot(ixo^s,idims)/bsum(ixo^s)
4585 htc_qsrc(ixo^s)=htc_qsrc(ixo^s)+sigt(ixo^s)*bunit(ixo^s)*(tface(ixo^s)-tface(hxo^s))*invdx
4586 end do
4587 htc_qsrc(ixo^s)=(htc_qsrc(ixo^s)+wct(ixo^s,q_))/tau(ixo^s)
4588 w(ixo^s,q_)=w(ixo^s,q_)-qdt*htc_qsrc(ixo^s)
4589 end subroutine add_hypertc_source
4590
4591 !> Compute the Lorentz force (JxB)
4592 subroutine get_lorentz_force(ixI^L,ixO^L,w,JxB)
4594 integer, intent(in) :: ixi^l, ixo^l
4595 double precision, intent(in) :: w(ixi^s,1:nw)
4596 double precision, intent(inout) :: jxb(ixi^s,3)
4597 double precision :: a(ixi^s,3), b(ixi^s,3)
4598 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
4599 double precision :: current(ixi^s,7-2*ndir:3)
4600 integer :: idir, idirmin
4601
4602 b=0.0d0
4603 if(b0field) then
4604 do idir = 1, ndir
4605 b(ixo^s, idir) = w(ixo^s,mag(idir))+block%B0(ixo^s,idir,0)
4606 end do
4607 else
4608 do idir = 1, ndir
4609 b(ixo^s, idir) = w(ixo^s,mag(idir))
4610 end do
4611 end if
4612
4613 ! store J current in a
4614 call get_current(w,ixi^l,ixo^l,idirmin,current)
4615
4616 a=0.0d0
4617 do idir=7-2*ndir,3
4618 a(ixo^s,idir)=current(ixo^s,idir)
4619 end do
4620
4621 call cross_product(ixi^l,ixo^l,a,b,jxb)
4622 end subroutine get_lorentz_force
4623
4624 !> Compute 1/(1+v_A^2/c^2) for semirelativistic MHD, where v_A is the Alfven
4625 !> velocity
4626 subroutine mhd_gamma2_alfven(ixI^L, ixO^L, w, gamma_A2)
4628 integer, intent(in) :: ixi^l, ixo^l
4629 double precision, intent(in) :: w(ixi^s, nw)
4630 double precision, intent(out) :: gamma_a2(ixo^s)
4631 double precision :: rho(ixi^s)
4632
4633 ! mhd_get_rho cannot be used as x is not a param
4634 if(has_equi_rho0) then
4635 rho(ixo^s) = w(ixo^s,rho_) + block%equi_vars(ixo^s,equi_rho0_,b0i)
4636 else
4637 rho(ixo^s) = w(ixo^s,rho_)
4638 endif
4639 ! Compute the inverse of 1 + B^2/(rho * c^2)
4640 gamma_a2(ixo^s) = 1.0d0/(1.0d0+mhd_mag_en_all(w, ixi^l, ixo^l)/rho(ixo^s)*inv_squared_c)
4641 end subroutine mhd_gamma2_alfven
4642
4643 !> Compute 1/sqrt(1+v_A^2/c^2) for semirelativisitic MHD, where v_A is the
4644 !> Alfven velocity
4645 function mhd_gamma_alfven(w, ixI^L, ixO^L) result(gamma_A)
4647 integer, intent(in) :: ixi^l, ixo^l
4648 double precision, intent(in) :: w(ixi^s, nw)
4649 double precision :: gamma_a(ixo^s)
4650
4651 call mhd_gamma2_alfven(ixi^l, ixo^l, w, gamma_a)
4652 gamma_a = sqrt(gamma_a)
4653 end function mhd_gamma_alfven
4654
4655 subroutine mhd_get_rho(w,x,ixI^L,ixO^L,rho)
4657 integer, intent(in) :: ixi^l, ixo^l
4658 double precision, intent(in) :: w(ixi^s,1:nw),x(ixi^s,1:ndim)
4659 double precision, intent(out) :: rho(ixi^s)
4660
4661 if(has_equi_rho0) then
4662 rho(ixo^s) = w(ixo^s,rho_) + block%equi_vars(ixo^s,equi_rho0_,b0i)
4663 else
4664 rho(ixo^s) = w(ixo^s,rho_)
4665 endif
4666
4667 end subroutine mhd_get_rho
4668
4669 !> handle small or negative internal energy
4670 subroutine mhd_handle_small_ei(w, x, ixI^L, ixO^L, ie, subname)
4673 integer, intent(in) :: ixi^l,ixo^l, ie
4674 double precision, intent(inout) :: w(ixi^s,1:nw)
4675 double precision, intent(in) :: x(ixi^s,1:ndim)
4676 character(len=*), intent(in) :: subname
4677
4678 double precision :: rho(ixi^s)
4679 integer :: idir
4680 logical :: flag(ixi^s,1:nw)
4681
4682 flag=.false.
4683 if(has_equi_pe0) then
4684 where(w(ixo^s,ie)+block%equi_vars(ixo^s,equi_pe0_,0)*inv_gamma_1<small_e)&
4685 flag(ixo^s,ie)=.true.
4686 else
4687 where(w(ixo^s,ie)<small_e) flag(ixo^s,ie)=.true.
4688 endif
4689 if(any(flag(ixo^s,ie))) then
4690 select case (small_values_method)
4691 case ("replace")
4692 if(has_equi_pe0) then
4693 where(flag(ixo^s,ie)) w(ixo^s,ie)=small_e - &
4694 block%equi_vars(ixo^s,equi_pe0_,0)*inv_gamma_1
4695 else
4696 where(flag(ixo^s,ie)) w(ixo^s,ie)=small_e
4697 endif
4698 case ("average")
4699 call small_values_average(ixi^l, ixo^l, w, x, flag, ie)
4700 case default
4701 ! small values error shows primitive variables
4702 w(ixo^s,e_)=w(ixo^s,e_)*gamma_1
4703 call mhd_get_rho(w,x,ixi^l,ixo^l,rho)
4704 do idir = 1, ndir
4705 w(ixo^s, mom(idir)) = w(ixo^s, mom(idir))/rho(ixo^s)
4706 end do
4707 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
4708 end select
4709 end if
4710
4711 end subroutine mhd_handle_small_ei
4712
4713 subroutine mhd_update_temperature(ixI^L,ixO^L,wCT,w,x)
4716
4717 integer, intent(in) :: ixi^l, ixo^l
4718 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
4719 double precision, intent(inout) :: w(ixi^s,1:nw)
4720
4721 double precision :: iz_h(ixo^s),iz_he(ixo^s), pth(ixi^s)
4722
4723 call ionization_degree_from_temperature(ixi^l,ixo^l,wct(ixi^s,te_),iz_h,iz_he)
4724
4725 call mhd_get_pthermal(w,x,ixi^l,ixo^l,pth)
4726
4727 w(ixo^s,te_)=(2.d0+3.d0*he_abundance)*pth(ixo^s)/(w(ixo^s,rho_)*(1.d0+iz_h(ixo^s)+&
4728 he_abundance*(iz_he(ixo^s)*(iz_he(ixo^s)+1.d0)+1.d0)))
4729
4730 end subroutine mhd_update_temperature
4731
4732 !> Source terms after split off time-independent magnetic field
4733 subroutine add_source_b0split(qdt,dtfactor,ixI^L,ixO^L,wCT,w,x)
4735
4736 integer, intent(in) :: ixi^l, ixo^l
4737 double precision, intent(in) :: qdt, dtfactor,wct(ixi^s,1:nw), x(ixi^s,1:ndim)
4738 double precision, intent(inout) :: w(ixi^s,1:nw)
4739
4740 double precision :: a(ixi^s,3), b(ixi^s,3), axb(ixi^s,3)
4741 integer :: idir
4742
4743 a=0.d0
4744 b=0.d0
4745 ! for force-free field J0xB0 =0
4746 if(.not.b0field_forcefree) then
4747 ! store B0 magnetic field in b
4748 b(ixo^s,1:ndir)=block%B0(ixo^s,1:ndir,0)
4749
4750 ! store J0 current in a
4751 do idir=7-2*ndir,3
4752 a(ixo^s,idir)=block%J0(ixo^s,idir)
4753 end do
4754 call cross_product(ixi^l,ixo^l,a,b,axb)
4755 if(local_timestep) then
4756 do idir=1,3
4757 axb(ixo^s,idir)=axb(ixo^s,idir)*block%dt(ixo^s)*dtfactor
4758 enddo
4759 else
4760 axb(ixo^s,:)=axb(ixo^s,:)*qdt
4761 endif
4762 ! add J0xB0 source term in momentum equations
4763 w(ixo^s,mom(1:ndir))=w(ixo^s,mom(1:ndir))+axb(ixo^s,1:ndir)
4764 end if
4765
4766 if(total_energy) then
4767 a=0.d0
4768 ! for free-free field -(vxB0) dot J0 =0
4769 b(ixo^s,:)=wct(ixo^s,mag(:))
4770 ! store full magnetic field B0+B1 in b
4771 if(.not.b0field_forcefree) b(ixo^s,:)=b(ixo^s,:)+block%B0(ixo^s,:,0)
4772 ! store velocity in a
4773 a(ixi^s,1:ndir)=wct(ixi^s,mom(1:ndir))
4774 ! -E = a x b
4775 call cross_product(ixi^l,ixo^l,a,b,axb)
4776 if(local_timestep) then
4777 do idir=1,3
4778 axb(ixo^s,idir)=axb(ixo^s,idir)*block%dt(ixo^s)*dtfactor
4779 enddo
4780 else
4781 axb(ixo^s,:)=axb(ixo^s,:)*qdt
4782 endif
4783 ! add -(vxB) dot J0 source term in energy equation
4784 do idir=7-2*ndir,3
4785 w(ixo^s,e_)=w(ixo^s,e_)-axb(ixo^s,idir)*block%J0(ixo^s,idir)
4786 end do
4787 if(mhd_ambipolar) then
4788 !reuse axb
4789 call mhd_get_jxbxb(wct,x,ixi^l,ixo^l,axb)
4790 ! source J0 * E
4791 do idir=sdim,3
4792 !set electric field in jxbxb: E=nuA * jxbxb, where nuA=-etaA/rho^2
4793 call multiplyambicoef(ixi^l,ixo^l,axb(ixi^s,idir),wct,x)
4794 w(ixo^s,e_)=w(ixo^s,e_)+axb(ixo^s,idir)*block%J0(ixo^s,idir)
4795 enddo
4796 endif
4797 end if
4798
4799 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_B0')
4800
4801 end subroutine add_source_b0split
4802
4803 !> Source terms for semirelativistic MHD Gombosi 2002 JCP 177, 176
4804 subroutine add_source_semirelativistic(qdt,ixI^L,ixO^L,wCT,w,x,wCTprim)
4806 use mod_geometry
4807
4808 integer, intent(in) :: ixi^l, ixo^l
4809 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
4810 double precision, intent(inout) :: w(ixi^s,1:nw)
4811 double precision, intent(in), optional :: wctprim(ixi^s,1:nw)
4812
4813 double precision :: v(ixi^s,1:3),e(ixi^s,1:3),curle(ixi^s,1:3),dive(ixi^s)
4814 integer :: idir, idirmin, ix^d
4815
4816 {do ix^db=iximin^db,iximax^db\}
4817 ! E=Bxv
4818 {^ifthreec
4819 e(ix^d,1)=w(ix^d,b2_)*wctprim(ix^d,m3_)-w(ix^d,b3_)*wctprim(ix^d,m2_)
4820 e(ix^d,2)=w(ix^d,b3_)*wctprim(ix^d,m1_)-w(ix^d,b1_)*wctprim(ix^d,m3_)
4821 e(ix^d,3)=w(ix^d,b1_)*wctprim(ix^d,m2_)-w(ix^d,b2_)*wctprim(ix^d,m1_)
4822 }
4823 {^iftwoc
4824 e(ix^d,1)=zero
4825 e(ix^d,2)=zero
4826 e(ix^d,3)=w(ix^d,b1_)*wctprim(ix^d,m2_)-w(ix^d,b2_)*wctprim(ix^d,m1_)
4827 }
4828 {^ifonec
4829 e(ix^d,1)=zero
4830 e(ix^d,2)=zero
4831 e(ix^d,3)=zero
4832 }
4833 {end do\}
4834 call divvector(e,ixi^l,ixo^l,dive)
4835 ! curl E
4836 call curlvector(e,ixi^l,ixo^l,curle,idirmin,1,3)
4837 ! E x (curl E) => v
4838 call cross_product(ixi^l,ixo^l,e,curle,v)
4839 ! add source term in momentum equations (1/c0^2-1/c^2)(E dot divE - E x curlE)
4840 ! equation (26) and (27)
4841 {do ix^db=ixomin^db,ixomax^db\}
4842 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)+qdt*(inv_squared_c0-inv_squared_c)*&
4843 (e(ix^d,^c)*dive(ix^d)-v(ix^d,^c))\
4844 {end do\}
4845
4846 end subroutine add_source_semirelativistic
4847
4848 !> Source terms for internal energy version of MHD
4849 subroutine add_source_internal_e(qdt,ixI^L,ixO^L,wCT,w,x,wCTprim)
4851 use mod_geometry
4852
4853 integer, intent(in) :: ixi^l, ixo^l
4854 double precision, intent(in) :: qdt
4855 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
4856 double precision, intent(inout) :: w(ixi^s,1:nw)
4857 double precision, intent(in) :: wctprim(ixi^s,1:nw)
4858
4859 double precision :: divv(ixi^s), tmp
4860 integer :: ix^d
4861
4862 if(slab_uniform) then
4863 if(nghostcells .gt. 2) then
4864 call divvector(wctprim(ixi^s,mom(:)),ixi^l,ixo^l,divv,3)
4865 else
4866 call divvector(wctprim(ixi^s,mom(:)),ixi^l,ixo^l,divv,2)
4867 end if
4868 else
4869 call divvector(wctprim(ixi^s,mom(:)),ixi^l,ixo^l,divv)
4870 end if
4871 {do ix^db=ixomin^db,ixomax^db\}
4872 tmp=w(ix^d,e_)
4873 w(ix^d,e_)=w(ix^d,e_)-qdt*wctprim(ix^d,p_)*divv(ix^d)
4874 if(w(ix^d,e_)<small_e) then
4875 w(ix^d,e_)=tmp
4876 end if
4877 {end do\}
4878 if(mhd_ambipolar)then
4879 call add_source_ambipolar_internal_energy(qdt,ixi^l,ixo^l,wct,w,x,e_)
4880 end if
4881
4882 if(fix_small_values) then
4883 call mhd_handle_small_ei(w,x,ixi^l,ixo^l,e_,'add_source_internal_e')
4884 end if
4885 end subroutine add_source_internal_e
4886
4887 !> Source terms for hydrodynamic energy version of MHD
4888 subroutine add_source_hydrodynamic_e(qdt,ixI^L,ixO^L,wCT,w,x,wCTprim)
4890 use mod_geometry
4891 use mod_usr_methods, only: usr_gravity
4892
4893 integer, intent(in) :: ixi^l, ixo^l
4894 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
4895 double precision, intent(inout) :: w(ixi^s,1:nw)
4896 double precision, intent(in), optional :: wctprim(ixi^s,1:nw)
4897
4898 double precision :: b(ixi^s,3), j(ixi^s,3), jxb(ixi^s,3)
4899 double precision :: current(ixi^s,7-2*ndir:3)
4900 double precision :: bu(ixo^s,1:ndir), tmp(ixo^s), b2(ixo^s)
4901 double precision :: gravity_field(ixi^s,1:ndir), vaoc
4902 integer :: idir, idirmin, idims, ix^d
4903
4904 {^nothreed
4905 b=0.0d0
4906 do idir = 1, ndir
4907 b(ixo^s, idir) = wct(ixo^s,mag(idir))
4908 end do
4909
4910 !call get_current(wCT,ixI^L,ixO^L,idirmin,current)
4911 call curlvector(wct(ixi^s,mag(1:ndir)),ixi^l,ixo^l,current,idirmin,7-2*ndir,ndir,.true.)
4912
4913 j=0.0d0
4914 do idir=7-2*ndir,3
4915 j(ixo^s,idir)=current(ixo^s,idir)
4916 end do
4917
4918 ! get Lorentz force JxB
4919 call cross_product(ixi^l,ixo^l,j,b,jxb)
4920 }
4921 {^ifthreed
4922 !call get_current(wCT,ixI^L,ixO^L,idirmin,current)
4923 ! get current in fourth order accuracy in Cartesian
4924 call curlvector(wct(ixi^s,mag(1:ndir)),ixi^l,ixo^l,current,idirmin,1,ndir,.true.)
4925 ! get Lorentz force JxB
4926 call cross_product(ixi^l,ixo^l,current,wct(ixi^s,mag(1:ndir)),jxb)
4927 }
4928
4929 if(mhd_semirelativistic) then
4930 ! (v . nabla) v
4931 do idir=1,ndir
4932 do idims=1,ndim
4933 call gradient(wctprim(ixi^s,mom(idir)),ixi^l,ixo^l,idims,j(ixi^s,idims))
4934 end do
4935 b(ixo^s,idir)=sum(wctprim(ixo^s,mom(1:ndir))*j(ixo^s,1:ndir),dim=ndim+1)
4936 end do
4937 ! nabla p
4938 do idir=1,ndir
4939 call gradient(wctprim(ixi^s,p_),ixi^l,ixo^l,idir,j(ixi^s,idir))
4940 end do
4941
4942 if(mhd_gravity) then
4943 gravity_field=0.d0
4944 call usr_gravity(ixi^l,ixo^l,wct,x,gravity_field(ixi^s,1:ndim))
4945 do idir=1,ndir
4946 b(ixo^s,idir)=wct(ixo^s,rho_)*(b(ixo^s,idir)-gravity_field(ixo^s,idir))+j(ixo^s,idir)-jxb(ixo^s,idir)
4947 end do
4948 else
4949 do idir=1,ndir
4950 b(ixo^s,idir)=wct(ixo^s,rho_)*b(ixo^s,idir)+j(ixo^s,idir)-jxb(ixo^s,idir)
4951 end do
4952 end if
4953
4954 b2(ixo^s)=sum(wct(ixo^s,mag(:))**2,dim=ndim+1)
4955 tmp(ixo^s)=sqrt(b2(ixo^s))
4956 where(tmp(ixo^s)>smalldouble)
4957 tmp(ixo^s)=1.d0/tmp(ixo^s)
4958 else where
4959 tmp(ixo^s)=0.d0
4960 end where
4961 ! unit vector of magnetic field
4962 do idir=1,ndir
4963 bu(ixo^s,idir)=wct(ixo^s,mag(idir))*tmp(ixo^s)
4964 end do
4965
4966 !b2(ixO^S)=b2(ixO^S)/w(ixO^S,rho_)*inv_squared_c
4967 !b2(ixO^S)=b2(ixO^S)/(1.d0+b2(ixO^S))
4968 {do ix^db=ixomin^db,ixomax^db\}
4969 ! Va^2/c^2
4970 vaoc=b2(ix^d)/w(ix^d,rho_)*inv_squared_c
4971 ! Va^2/c^2 / (1+Va^2/c^2)
4972 b2(ix^d)=vaoc/(1.d0+vaoc)
4973 {end do\}
4974 ! bu . F
4975 tmp(ixo^s)=sum(bu(ixo^s,1:ndir)*b(ixo^s,1:ndir),dim=ndim+1)
4976 ! Rempel 2017 ApJ 834, 10 equation (54)
4977 do idir=1,ndir
4978 j(ixo^s,idir)=b2(ixo^s)*(b(ixo^s,idir)-bu(ixo^s,idir)*tmp(ixo^s))
4979 end do
4980 !! Rempel 2017 ApJ 834, 10 equation (29) add SR force at momentum equation
4981 do idir=1,ndir
4982 w(ixo^s,mom(idir))=w(ixo^s,mom(idir))+qdt*j(ixo^s,idir)
4983 end do
4984 ! Rempel 2017 ApJ 834, 10 equation (30) add work of Lorentz force and SR force
4985 w(ixo^s,e_)=w(ixo^s,e_)+qdt*sum(wctprim(ixo^s,mom(1:ndir))*&
4986 (jxb(ixo^s,1:ndir)+j(ixo^s,1:ndir)),dim=ndim+1)
4987 else
4988 ! add work of Lorentz force
4989 w(ixo^s,e_)=w(ixo^s,e_)+qdt*sum(wctprim(ixo^s,mom(1:ndir))*jxb(ixo^s,1:ndir),dim=ndim+1)
4990 end if
4991
4992 end subroutine add_source_hydrodynamic_e
4993
4994 !> Add resistive source to w within ixO Uses 3 point stencil (1 neighbour) in
4995 !> each direction, non-conservative. If the fourthorder precompiler flag is
4996 !> set, uses fourth order central difference for the laplacian. Then the
4997 !> stencil is 5 (2 neighbours).
4998 subroutine add_source_res1(qdt,ixI^L,ixO^L,wCT,w,x)
5000 use mod_usr_methods
5001 use mod_geometry
5002
5003 integer, intent(in) :: ixi^l, ixo^l
5004 double precision, intent(in) :: qdt
5005 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
5006 double precision, intent(inout) :: w(ixi^s,1:nw)
5007 integer :: ixa^l,idir,jdir,kdir,idirmin,idim,jxo^l,hxo^l,ix
5008 integer :: lxo^l, kxo^l
5009
5010 double precision :: tmp(ixi^s),tmp2(ixi^s)
5011
5012 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
5013 double precision :: current(ixi^s,7-2*ndir:3),eta(ixi^s)
5014 double precision :: gradeta(ixi^s,1:ndim), bf(ixi^s,1:ndir)
5015
5016 ! Calculating resistive sources involve one extra layer
5017 if (mhd_4th_order) then
5018 ixa^l=ixo^l^ladd2;
5019 else
5020 ixa^l=ixo^l^ladd1;
5021 end if
5022
5023 if (iximin^d>ixamin^d.or.iximax^d<ixamax^d|.or.) &
5024 call mpistop("Error in add_source_res1: Non-conforming input limits")
5025
5026 ! Calculate current density and idirmin
5027 call get_current(wct,ixi^l,ixo^l,idirmin,current)
5028
5029 if (mhd_eta>zero)then
5030 eta(ixa^s)=mhd_eta
5031 gradeta(ixo^s,1:ndim)=zero
5032 else
5033 call usr_special_resistivity(wct,ixi^l,ixa^l,idirmin,x,current,eta)
5034 ! assumes that eta is not function of current?
5035 do idim=1,ndim
5036 call gradient(eta,ixi^l,ixo^l,idim,tmp)
5037 gradeta(ixo^s,idim)=tmp(ixo^s)
5038 end do
5039 end if
5040
5041 if(b0field) then
5042 bf(ixi^s,1:ndir)=wct(ixi^s,mag(1:ndir))+block%B0(ixi^s,1:ndir,0)
5043 else
5044 bf(ixi^s,1:ndir)=wct(ixi^s,mag(1:ndir))
5045 end if
5046
5047 do idir=1,ndir
5048 ! Put B_idir into tmp2 and eta*Laplace B_idir into tmp
5049 if (mhd_4th_order) then
5050 tmp(ixo^s)=zero
5051 tmp2(ixi^s)=bf(ixi^s,idir)
5052 do idim=1,ndim
5053 lxo^l=ixo^l+2*kr(idim,^d);
5054 jxo^l=ixo^l+kr(idim,^d);
5055 hxo^l=ixo^l-kr(idim,^d);
5056 kxo^l=ixo^l-2*kr(idim,^d);
5057 tmp(ixo^s)=tmp(ixo^s)+&
5058 (-tmp2(lxo^s)+16.0d0*tmp2(jxo^s)-30.0d0*tmp2(ixo^s)+16.0d0*tmp2(hxo^s)-tmp2(kxo^s)) &
5059 /(12.0d0 * dxlevel(idim)**2)
5060 end do
5061 else
5062 tmp(ixo^s)=zero
5063 tmp2(ixi^s)=bf(ixi^s,idir)
5064 do idim=1,ndim
5065 jxo^l=ixo^l+kr(idim,^d);
5066 hxo^l=ixo^l-kr(idim,^d);
5067 tmp(ixo^s)=tmp(ixo^s)+&
5068 (tmp2(jxo^s)-2.0d0*tmp2(ixo^s)+tmp2(hxo^s))/dxlevel(idim)**2
5069 end do
5070 end if
5071
5072 ! Multiply by eta
5073 tmp(ixo^s)=tmp(ixo^s)*eta(ixo^s)
5074
5075 ! Subtract grad(eta) x J = eps_ijk d_j eta J_k if eta is non-constant
5076 if (mhd_eta<zero)then
5077 do jdir=1,ndim; do kdir=idirmin,3
5078 if (lvc(idir,jdir,kdir)/=0)then
5079 if (lvc(idir,jdir,kdir)==1)then
5080 tmp(ixo^s)=tmp(ixo^s)-gradeta(ixo^s,jdir)*current(ixo^s,kdir)
5081 else
5082 tmp(ixo^s)=tmp(ixo^s)+gradeta(ixo^s,jdir)*current(ixo^s,kdir)
5083 end if
5084 end if
5085 end do; end do
5086 end if
5087
5088 ! Add sources related to eta*laplB-grad(eta) x J to B and e
5089 w(ixo^s,mag(idir))=w(ixo^s,mag(idir))+qdt*tmp(ixo^s)
5090 if(total_energy) then
5091 w(ixo^s,e_)=w(ixo^s,e_)+qdt*tmp(ixo^s)*bf(ixo^s,idir)
5092 end if
5093 end do ! idir
5094
5095 if(mhd_energy) then
5096 ! de/dt+=eta*J**2
5097 w(ixo^s,e_)=w(ixo^s,e_)+qdt*eta(ixo^s)*sum(current(ixo^s,:)**2,dim=ndim+1)
5098 end if
5099
5100 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_res1')
5101
5102 end subroutine add_source_res1
5103
5104 !> Add resistive source to w within ixO
5105 !> Uses 5 point stencil (2 neighbours) in each direction, conservative
5106 subroutine add_source_res2(qdt,ixI^L,ixO^L,wCT,w,x)
5108 use mod_usr_methods
5109 use mod_geometry
5110
5111 integer, intent(in) :: ixi^l, ixo^l
5112 double precision, intent(in) :: qdt
5113 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
5114 double precision, intent(inout) :: w(ixi^s,1:nw)
5115
5116 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
5117 double precision :: current(ixi^s,7-2*ndir:3),eta(ixi^s),curlj(ixi^s,1:3)
5118 double precision :: tmpvec(ixi^s,1:3),tmp(ixo^s)
5119 integer :: ixa^l,idir,idirmin,idirmin1
5120
5121 ixa^l=ixo^l^ladd2;
5122
5123 if (iximin^d>ixamin^d.or.iximax^d<ixamax^d|.or.) &
5124 call mpistop("Error in add_source_res2: Non-conforming input limits")
5125
5126 ixa^l=ixo^l^ladd1;
5127 ! Calculate current density within ixL: J=curl B, thus J_i=eps_ijk*d_j B_k
5128 ! Determine exact value of idirmin while doing the loop.
5129 call get_current(wct,ixi^l,ixa^l,idirmin,current)
5130
5131 tmpvec=zero
5132 if(mhd_eta>zero)then
5133 do idir=idirmin,3
5134 tmpvec(ixa^s,idir)=current(ixa^s,idir)*mhd_eta
5135 end do
5136 else
5137 call usr_special_resistivity(wct,ixi^l,ixa^l,idirmin,x,current,eta)
5138 do idir=idirmin,3
5139 tmpvec(ixa^s,idir)=current(ixa^s,idir)*eta(ixa^s)
5140 end do
5141 end if
5142
5143 ! dB/dt= -curl(J*eta), thus B_i=B_i-eps_ijk d_j Jeta_k
5144 call curlvector(tmpvec,ixi^l,ixo^l,curlj,idirmin1,1,3)
5145 if(stagger_grid) then
5146 if(ndim==2.and.ndir==3) then
5147 ! if 2.5D
5148 w(ixo^s,mag(ndir)) = w(ixo^s,mag(ndir))-qdt*curlj(ixo^s,ndir)
5149 end if
5150 else
5151 w(ixo^s,mag(1:ndir)) = w(ixo^s,mag(1:ndir))-qdt*curlj(ixo^s,1:ndir)
5152 end if
5153
5154 if(mhd_energy) then
5155 if(mhd_eta>zero)then
5156 tmp(ixo^s)=qdt*mhd_eta*sum(current(ixo^s,:)**2,dim=ndim+1)
5157 else
5158 tmp(ixo^s)=qdt*eta(ixo^s)*sum(current(ixo^s,:)**2,dim=ndim+1)
5159 end if
5160 if(total_energy) then
5161 ! de/dt= +div(B x Jeta) = eta J^2 - B dot curl(eta J)
5162 ! de1/dt= eta J^2 - B1 dot curl(eta J)
5163 w(ixo^s,e_)=w(ixo^s,e_)+tmp(ixo^s)-&
5164 qdt*sum(wct(ixo^s,mag(1:ndir))*curlj(ixo^s,1:ndir),dim=ndim+1)
5165 else
5166 ! add eta*J**2 source term in the internal energy equation
5167 w(ixo^s,e_)=w(ixo^s,e_)+tmp(ixo^s)
5168 end if
5169 end if
5170
5171 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_res2')
5172 end subroutine add_source_res2
5173
5174 !> Add Hyper-resistive source to w within ixO
5175 !> Uses 9 point stencil (4 neighbours) in each direction.
5176 subroutine add_source_hyperres(qdt,ixI^L,ixO^L,wCT,w,x)
5178 use mod_geometry
5179
5180 integer, intent(in) :: ixi^l, ixo^l
5181 double precision, intent(in) :: qdt
5182 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
5183 double precision, intent(inout) :: w(ixi^s,1:nw)
5184 !.. local ..
5185 double precision :: current(ixi^s,7-2*ndir:3)
5186 double precision :: tmpvec(ixi^s,1:3),tmpvec2(ixi^s,1:3),tmp(ixi^s),ehyper(ixi^s,1:3)
5187 integer :: ixa^l,idir,jdir,kdir,idirmin,idirmin1
5188
5189 ixa^l=ixo^l^ladd3;
5190 if (iximin^d>ixamin^d.or.iximax^d<ixamax^d|.or.) &
5191 call mpistop("Error in add_source_hyperres: Non-conforming input limits")
5192
5193 call get_current(wct,ixi^l,ixa^l,idirmin,current)
5194 tmpvec(ixa^s,1:ndir)=zero
5195 do jdir=idirmin,3
5196 tmpvec(ixa^s,jdir)=current(ixa^s,jdir)
5197 end do
5198
5199 ixa^l=ixo^l^ladd2;
5200 call curlvector(tmpvec,ixi^l,ixa^l,tmpvec2,idirmin1,1,3)
5201
5202 ixa^l=ixo^l^ladd1;
5203 tmpvec(ixa^s,1:ndir)=zero
5204 call curlvector(tmpvec2,ixi^l,ixa^l,tmpvec,idirmin1,1,3)
5205 ehyper(ixa^s,1:ndir) = - tmpvec(ixa^s,1:ndir)*mhd_eta_hyper
5206
5207 ixa^l=ixo^l;
5208 tmpvec2(ixa^s,1:ndir)=zero
5209 call curlvector(ehyper,ixi^l,ixa^l,tmpvec2,idirmin1,1,3)
5210
5211 do idir=1,ndir
5212 w(ixo^s,mag(idir)) = w(ixo^s,mag(idir))-tmpvec2(ixo^s,idir)*qdt
5213 end do
5214
5215 if(total_energy) then
5216 ! de/dt= +div(B x Ehyper)
5217 ixa^l=ixo^l^ladd1;
5218 tmpvec2(ixa^s,1:ndir)=zero
5219 do idir=1,ndir; do jdir=1,ndir; do kdir=idirmin,3
5220 tmpvec2(ixa^s,idir) = tmpvec(ixa^s,idir)&
5221 + lvc(idir,jdir,kdir)*wct(ixa^s,mag(jdir))*ehyper(ixa^s,kdir)
5222 end do; end do; end do
5223 tmp(ixo^s)=zero
5224 call divvector(tmpvec2,ixi^l,ixo^l,tmp)
5225 w(ixo^s,e_)=w(ixo^s,e_)+tmp(ixo^s)*qdt
5226 end if
5227
5228 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_hyperres')
5229
5230 end subroutine add_source_hyperres
5231
5232 subroutine add_source_glm(qdt,ixI^L,ixO^L,wCT,w,x)
5233 ! Add divB related sources to w within ixO
5234 ! corresponding to Dedner JCP 2002, 175, 645 _equation 24_
5235 ! giving the EGLM-MHD scheme or GLM-MHD scheme
5237 use mod_geometry
5238
5239 integer, intent(in) :: ixi^l, ixo^l
5240 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
5241 double precision, intent(inout) :: w(ixi^s,1:nw)
5242
5243 double precision:: divb(ixi^s), gradpsi(ixi^s), ba(ixo^s,1:ndir)
5244 integer :: idir
5245
5246
5247 ! dPsi/dt = - Ch^2/Cp^2 Psi
5248 if (mhd_glm_alpha < zero) then
5249 w(ixo^s,psi_) = abs(mhd_glm_alpha)*wct(ixo^s,psi_)
5250 else
5251 ! implicit update of Psi variable
5252 ! equation (27) in Mignone 2010 J. Com. Phys. 229, 2117
5253 if(slab_uniform) then
5254 w(ixo^s,psi_) = dexp(-qdt*cmax_global*mhd_glm_alpha/minval(dxlevel(:)))*w(ixo^s,psi_)
5255 else
5256 w(ixo^s,psi_) = dexp(-qdt*cmax_global*mhd_glm_alpha/minval(block%ds(ixo^s,:),dim=ndim+1))*w(ixo^s,psi_)
5257 end if
5258 end if
5259
5260 if(mhd_glm_extended) then
5261 if(b0field) then
5262 ba(ixo^s,1:ndir)=wct(ixo^s,mag(1:ndir))+block%B0(ixo^s,1:ndir,0)
5263 else
5264 ba(ixo^s,1:ndir)=wct(ixo^s,mag(1:ndir))
5265 end if
5266 ! gradient of Psi
5267 if(total_energy) then
5268 do idir=1,ndim
5269 select case(typegrad)
5270 case("central")
5271 call gradient(wct(ixi^s,psi_),ixi^l,ixo^l,idir,gradpsi)
5272 case("limited")
5273 call gradientl(wct(ixi^s,psi_),ixi^l,ixo^l,idir,gradpsi)
5274 end select
5275 ! e = e -qdt (b . grad(Psi))
5276 w(ixo^s,e_) = w(ixo^s,e_)-qdt*ba(ixo^s,idir)*gradpsi(ixo^s)
5277 end do
5278 end if
5279
5280 ! We calculate now div B
5281 call get_divb(wct,ixi^l,ixo^l,divb, mhd_divb_nth)
5282
5283 ! m = m - qdt b div b
5284 do idir=1,ndir
5285 w(ixo^s,mom(idir))=w(ixo^s,mom(idir))-qdt*ba(ixo^s,idir)*divb(ixo^s)
5286 end do
5287 end if
5288
5289 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_glm')
5290
5291 end subroutine add_source_glm
5292
5293 !> Add divB related sources to w within ixO corresponding to Powel
5294 subroutine add_source_powel(qdt,ixI^L,ixO^L,wCT,w,x)
5296
5297 integer, intent(in) :: ixi^l, ixo^l
5298 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
5299 double precision, intent(inout) :: w(ixi^s,1:nw)
5300
5301 double precision :: divb(ixi^s), ba(1:ndir)
5302 integer :: idir, ix^d
5303
5304 ! calculate div B
5305 call get_divb(wct,ixi^l,ixo^l,divb, mhd_divb_nth)
5306
5307 if(b0field) then
5308 {do ix^db=ixomin^db,ixomax^db\}
5309 ! b = b - qdt v * div b
5310 ^c&w(ix^d,b^c_)=w(ix^d,b^c_)-qdt*wct(ix^d,m^c_)*divb(ix^d)\
5311 ! m = m - qdt b div b
5312 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)-qdt*(wct(ix^d,b^c_)+block%B0(ix^d,^c,0))*divb(ix^d)\
5313 if (total_energy) then
5314 ! e = e - qdt (v . b) * div b
5315 w(ix^d,e_)=w(ix^d,e_)-qdt*(^c&wct(ix^d,m^c_)*(wct(ix^d,b^c_)+block%B0(ix^d,^c,0))+)*divb(ix^d)
5316 end if
5317 {end do\}
5318 else
5319 {do ix^db=ixomin^db,ixomax^db\}
5320 ! b = b - qdt v * div b
5321 ^c&w(ix^d,b^c_)=w(ix^d,b^c_)-qdt*wct(ix^d,m^c_)*divb(ix^d)\
5322 ! m = m - qdt b div b
5323 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)-qdt*wct(ix^d,b^c_)*divb(ix^d)\
5324 if (total_energy) then
5325 ! e = e - qdt (v . b) * div b
5326 w(ix^d,e_)=w(ix^d,e_)-qdt*(^c&wct(ix^d,m^c_)*wct(ix^d,b^c_)+)*divb(ix^d)
5327 end if
5328 {end do\}
5329 end if
5330
5331 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_powel')
5332
5333 end subroutine add_source_powel
5334
5335 subroutine add_source_janhunen(qdt,ixI^L,ixO^L,wCT,w,x)
5336 ! Add divB related sources to w within ixO
5337 ! corresponding to Janhunen, just the term in the induction equation.
5339
5340 integer, intent(in) :: ixi^l, ixo^l
5341 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
5342 double precision, intent(inout) :: w(ixi^s,1:nw)
5343
5344 double precision :: divb(ixi^s)
5345 integer :: idir, ix^d
5346
5347 ! calculate div B
5348 call get_divb(wct,ixi^l,ixo^l,divb, mhd_divb_nth)
5349
5350 {do ix^db=ixomin^db,ixomax^db\}
5351 ! b = b - qdt v * div b
5352 ^c&w(ix^d,b^c_)=w(ix^d,b^c_)-qdt*wct(ix^d,m^c_)*divb(ix^d)\
5353 {end do\}
5354
5355 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_janhunen')
5356
5357 end subroutine add_source_janhunen
5358
5359 subroutine add_source_linde(qdt,ixI^L,ixO^L,wCT,w,x)
5360 ! Add Linde's divB related sources to wnew within ixO
5362 use mod_geometry
5363
5364 integer, intent(in) :: ixi^l, ixo^l
5365 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
5366 double precision, intent(inout) :: w(ixi^s,1:nw)
5367
5368 double precision :: divb(ixi^s),graddivb(ixi^s)
5369 integer :: idim, idir, ixp^l, i^d, iside
5370 logical, dimension(-1:1^D&) :: leveljump
5371
5372 ! Calculate div B
5373 ixp^l=ixo^l^ladd1;
5374 call get_divb(wct,ixi^l,ixp^l,divb, mhd_divb_nth)
5375
5376 ! for AMR stability, retreat one cell layer from the boarders of level jump
5377 {do i^db=-1,1\}
5378 if(i^d==0|.and.) cycle
5379 if(neighbor_type(i^d,block%igrid)==2 .or. neighbor_type(i^d,block%igrid)==4) then
5380 leveljump(i^d)=.true.
5381 else
5382 leveljump(i^d)=.false.
5383 end if
5384 {end do\}
5385
5386 ixp^l=ixo^l;
5387 do idim=1,ndim
5388 select case(idim)
5389 {case(^d)
5390 do iside=1,2
5391 i^dd=kr(^dd,^d)*(2*iside-3);
5392 if (leveljump(i^dd)) then
5393 if (iside==1) then
5394 ixpmin^d=ixomin^d-i^d
5395 else
5396 ixpmax^d=ixomax^d-i^d
5397 end if
5398 end if
5399 end do
5400 \}
5401 end select
5402 end do
5403
5404 ! Add Linde's diffusive terms
5405 do idim=1,ndim
5406 ! Calculate grad_idim(divb)
5407 select case(typegrad)
5408 case("central")
5409 call gradient(divb,ixi^l,ixp^l,idim,graddivb)
5410 case("limited")
5411 call gradientl(divb,ixi^l,ixp^l,idim,graddivb)
5412 end select
5413
5414 ! Multiply by Linde's eta*dt = divbdiff*(c_max*dx)*dt = divbdiff*dx**2
5415 if (slab_uniform) then
5416 graddivb(ixp^s)=graddivb(ixp^s)*divbdiff/(^d&1.0d0/dxlevel(^d)**2+)
5417 else
5418 graddivb(ixp^s)=graddivb(ixp^s)*divbdiff &
5419 /(^d&1.0d0/block%ds(ixp^s,^d)**2+)
5420 end if
5421
5422 w(ixp^s,mag(idim))=w(ixp^s,mag(idim))+graddivb(ixp^s)
5423
5424 if (typedivbdiff=='all' .and. total_energy) then
5425 ! e += B_idim*eta*grad_idim(divb)
5426 w(ixp^s,e_)=w(ixp^s,e_)+wct(ixp^s,mag(idim))*graddivb(ixp^s)
5427 end if
5428 end do
5429
5430 if (fix_small_values) call mhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_linde')
5431
5432 end subroutine add_source_linde
5433
5434 !> get dimensionless div B = |divB| * volume / area / |B|
5435 subroutine get_normalized_divb(w,ixI^L,ixO^L,divb)
5436
5438
5439 integer, intent(in) :: ixi^l, ixo^l
5440 double precision, intent(in) :: w(ixi^s,1:nw)
5441 double precision :: divb(ixi^s), dsurface(ixi^s)
5442
5443 double precision :: invb(ixo^s)
5444 integer :: ixa^l,idims
5445
5446 call get_divb(w,ixi^l,ixo^l,divb)
5447 invb(ixo^s)=sqrt(mhd_mag_en_all(w,ixi^l,ixo^l))
5448 where(invb(ixo^s)/=0.d0)
5449 invb(ixo^s)=1.d0/invb(ixo^s)
5450 end where
5451 if(slab_uniform) then
5452 divb(ixo^s)=0.5d0*abs(divb(ixo^s))*invb(ixo^s)/sum(1.d0/dxlevel(:))
5453 else
5454 ixamin^d=ixomin^d-1;
5455 ixamax^d=ixomax^d-1;
5456 dsurface(ixo^s)= sum(block%surfaceC(ixo^s,:),dim=ndim+1)
5457 do idims=1,ndim
5458 ixa^l=ixo^l-kr(idims,^d);
5459 dsurface(ixo^s)=dsurface(ixo^s)+block%surfaceC(ixa^s,idims)
5460 end do
5461 divb(ixo^s)=abs(divb(ixo^s))*invb(ixo^s)*&
5462 block%dvolume(ixo^s)/dsurface(ixo^s)
5463 end if
5464
5465 end subroutine get_normalized_divb
5466
5467 !> Calculate idirmin and the idirmin:3 components of the common current array
5468 !> make sure that dxlevel(^D) is set correctly.
5469 subroutine get_current(w,ixI^L,ixO^L,idirmin,current)
5471 use mod_geometry
5472
5473 integer, intent(in) :: ixo^l, ixi^l
5474 double precision, intent(in) :: w(ixi^s,1:nw)
5475 integer, intent(out) :: idirmin
5476
5477 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
5478 double precision :: current(ixi^s,7-2*ndir:3)
5479 integer :: idir, idirmin0
5480
5481 idirmin0 = 7-2*ndir
5482
5483 call curlvector(w(ixi^s,mag(1:ndir)),ixi^l,ixo^l,current,idirmin,idirmin0,ndir)
5484
5485 if(b0field) current(ixo^s,idirmin0:3)=current(ixo^s,idirmin0:3)+&
5486 block%J0(ixo^s,idirmin0:3)
5487 end subroutine get_current
5488
5489 !> If resistivity is not zero, check diffusion time limit for dt
5490 subroutine mhd_get_dt(w,ixI^L,ixO^L,dtnew,dx^D,x)
5492 use mod_usr_methods
5495 use mod_gravity, only: gravity_get_dt
5496 use mod_cak_force, only: cak_get_dt
5497
5498 integer, intent(in) :: ixi^l, ixo^l
5499 double precision, intent(inout) :: dtnew
5500 double precision, intent(in) :: dx^d
5501 double precision, intent(in) :: w(ixi^s,1:nw)
5502 double precision, intent(in) :: x(ixi^s,1:ndim)
5503
5504 double precision :: dxarr(ndim)
5505 double precision :: current(ixi^s,7-2*ndir:3),eta(ixi^s)
5506 integer :: idirmin,idim
5507
5508 dtnew = bigdouble
5509
5510 ^d&dxarr(^d)=dx^d;
5511 if (mhd_eta>zero)then
5512 dtnew=dtdiffpar*minval(dxarr(1:ndim))**2/mhd_eta
5513 else if (mhd_eta<zero)then
5514 call get_current(w,ixi^l,ixo^l,idirmin,current)
5515 call usr_special_resistivity(w,ixi^l,ixo^l,idirmin,x,current,eta)
5516 dtnew=bigdouble
5517 do idim=1,ndim
5518 if(slab_uniform) then
5519 dtnew=min(dtnew,&
5520 dtdiffpar/(smalldouble+maxval(eta(ixo^s)/dxarr(idim)**2)))
5521 else
5522 dtnew=min(dtnew,&
5523 dtdiffpar/(smalldouble+maxval(eta(ixo^s)/block%ds(ixo^s,idim)**2)))
5524 end if
5525 end do
5526 end if
5527
5528 if(mhd_eta_hyper>zero) then
5529 if(slab_uniform) then
5530 dtnew=min(dtdiffpar*minval(dxarr(1:ndim))**4/mhd_eta_hyper,dtnew)
5531 else
5532 dtnew=min(dtdiffpar*minval(block%ds(ixo^s,1:ndim))**4/mhd_eta_hyper,dtnew)
5533 end if
5534 end if
5535
5536 if(mhd_radiative_cooling) then
5537 call cooling_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x,rc_fl)
5538 end if
5539
5540 if(mhd_viscosity) then
5541 call viscosity_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
5542 end if
5543
5544 if(mhd_gravity) then
5545 call gravity_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
5546 end if
5547
5548 if(mhd_ambipolar_exp) then
5549 dtnew=min(dtdiffpar*get_ambipolar_dt(w,ixi^l,ixo^l,dx^d,x),dtnew)
5550 endif
5551
5552 if (mhd_cak_force) then
5553 call cak_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
5554 end if
5555
5556 end subroutine mhd_get_dt
5557
5558 ! Add geometrical source terms to w
5559 subroutine mhd_add_source_geom(qdt,dtfactor,ixI^L,ixO^L,wCT,wprim,w,x)
5561 use mod_geometry
5563
5564 integer, intent(in) :: ixi^l, ixo^l
5565 double precision, intent(in) :: qdt, dtfactor,x(ixi^s,1:ndim)
5566 double precision, intent(inout) :: wct(ixi^s,1:nw),wprim(ixi^s,1:nw),w(ixi^s,1:nw)
5567
5568 double precision :: tmp,tmp1,invr,cot
5569 integer :: ix^d
5570 integer :: mr_,mphi_ ! Polar var. names
5571 integer :: br_,bphi_
5572
5573 mr_=mom(1); mphi_=mom(1)-1+phi_ ! Polar var. names
5574 br_=mag(1); bphi_=mag(1)-1+phi_
5575
5576
5577 select case (coordinate)
5578 case (cylindrical)
5579 {do ix^db=ixomin^db,ixomax^db\}
5580 ! include dt in invr, invr is always used with qdt
5581 if(local_timestep) then
5582 invr=block%dt(ix^d) * dtfactor/x(ix^d,1)
5583 else
5584 invr=qdt/x(ix^d,1)
5585 end if
5586 if(mhd_energy) then
5587 tmp=wprim(ix^d,p_)+half*(^c&wprim(ix^d,b^c_)**2+)
5588 else
5589 tmp=mhd_adiab*wprim(ix^d,rho_)**mhd_gamma+half*(^c&wprim(ix^d,b^c_)**2+)
5590 end if
5591 if(phi_>0) then
5592 w(ix^d,mr_)=w(ix^d,mr_)+invr*(tmp-&
5593 wprim(ix^d,bphi_)**2+wprim(ix^d,mphi_)*wct(ix^d,mphi_))
5594 w(ix^d,mphi_)=w(ix^d,mphi_)+invr*(&
5595 -wct(ix^d,mphi_)*wprim(ix^d,mr_) &
5596 +wprim(ix^d,bphi_)*wprim(ix^d,br_))
5597 if(.not.stagger_grid) then
5598 w(ix^d,bphi_)=w(ix^d,bphi_)+invr*&
5599 (wprim(ix^d,bphi_)*wprim(ix^d,mr_) &
5600 -wprim(ix^d,br_)*wprim(ix^d,mphi_))
5601 end if
5602 else
5603 w(ix^d,mr_)=w(ix^d,mr_)+invr*tmp
5604 end if
5605 if(mhd_glm) w(ix^d,br_)=w(ix^d,br_)+wprim(ix^d,psi_)*invr
5606 {end do\}
5607 case (spherical)
5608 {do ix^db=ixomin^db,ixomax^db\}
5609 ! include dt in invr, invr is always used with qdt
5610 if(local_timestep) then
5611 invr=block%dt(ix^d) * dtfactor/x(ix^d,1)
5612 else
5613 invr=qdt/x(ix^d,1)
5614 end if
5615 if(mhd_energy) then
5616 tmp1=wprim(ix^d,p_)+half*(^c&wprim(ix^d,b^c_)**2+)
5617 else
5618 tmp1=mhd_adiab*wprim(ix^d,rho_)**mhd_gamma+half*(^c&wprim(ix^d,b^c_)**2+)
5619 end if
5620 ! m1
5621 {^ifonec
5622 w(ix^d,mom(1))=w(ix^d,mom(1))+two*tmp1*invr
5623 }
5624 {^noonec
5625 w(ix^d,mom(1))=w(ix^d,mom(1))+invr*&
5626 (two*tmp1+(^ce&wprim(ix^d,m^ce_)*wct(ix^d,m^ce_)-wprim(ix^d,b^ce_)**2+))
5627 }
5628 ! b1
5629 if(mhd_glm) then
5630 w(ix^d,mag(1))=w(ix^d,mag(1))+invr*2.0d0*wprim(ix^d,psi_)
5631 end if
5632 {^ifoned
5633 cot=0.d0
5634 }
5635 {^nooned
5636 cot=1.d0/tan(x(ix^d,2))
5637 }
5638 {^iftwoc
5639 ! m2
5640 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*(tmp1*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
5641 +wprim(ix^d,b1_)*wprim(ix^d,b2_))
5642 ! b2
5643 if(.not.stagger_grid) then
5644 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
5645 if(mhd_glm) then
5646 tmp=tmp+wprim(ix^d,psi_)*cot
5647 end if
5648 w(ix^d,mag(2))=w(ix^d,mag(2))+tmp*invr
5649 end if
5650 }
5651 {^ifthreec
5652 ! m2
5653 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*(tmp1*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
5654 +wprim(ix^d,b1_)*wprim(ix^d,b2_)&
5655 +(wprim(ix^d,m3_)*wct(ix^d,m3_)-wprim(ix^d,b3_)**2)*cot)
5656 ! b2
5657 if(.not.stagger_grid) then
5658 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
5659 if(mhd_glm) then
5660 tmp=tmp+wprim(ix^d,psi_)*cot
5661 end if
5662 w(ix^d,mag(2))=w(ix^d,mag(2))+tmp*invr
5663 end if
5664 ! m3
5665 w(ix^d,mom(3))=w(ix^d,mom(3))-invr*&
5666 (wprim(ix^d,m3_)*wct(ix^d,m1_) &
5667 -wprim(ix^d,b3_)*wprim(ix^d,b1_) &
5668 +(wprim(ix^d,m2_)*wct(ix^d,m3_) &
5669 -wprim(ix^d,b2_)*wprim(ix^d,b3_))*cot)
5670 ! b3
5671 if(.not.stagger_grid) then
5672 w(ix^d,mag(3))=w(ix^d,mag(3))+invr*&
5673 (wprim(ix^d,m1_)*wprim(ix^d,b3_) &
5674 -wprim(ix^d,m3_)*wprim(ix^d,b1_) &
5675 -(wprim(ix^d,m3_)*wprim(ix^d,b2_) &
5676 -wprim(ix^d,m2_)*wprim(ix^d,b3_))*cot)
5677 end if
5678 }
5679 {end do\}
5680 end select
5681
5682 if (mhd_rotating_frame) then
5683 call rotating_frame_add_source(qdt,dtfactor,ixi^l,ixo^l,wprim,w,x)
5684 end if
5685
5686 end subroutine mhd_add_source_geom
5687
5688 ! Add geometrical source terms to w
5689 subroutine mhd_add_source_geom_semirelati(qdt,dtfactor,ixI^L,ixO^L,wCT,wprim,w,x)
5691 use mod_geometry
5693
5694 integer, intent(in) :: ixi^l, ixo^l
5695 double precision, intent(in) :: qdt, dtfactor,x(ixi^s,1:ndim)
5696 double precision, intent(inout) :: wct(ixi^s,1:nw),wprim(ixi^s,1:nw),w(ixi^s,1:nw)
5697
5698 double precision :: tmp,tmp1,tmp2,invr,cot,e(ixo^s,1:ndir)
5699 integer :: ix^d
5700 integer :: mr_,mphi_ ! Polar var. names
5701 integer :: br_,bphi_
5702
5703 mr_=mom(1); mphi_=mom(1)-1+phi_ ! Polar var. names
5704 br_=mag(1); bphi_=mag(1)-1+phi_
5705
5706
5707 select case (coordinate)
5708 case (cylindrical)
5709 {do ix^db=ixomin^db,ixomax^db\}
5710 ! include dt in invr, invr is always used with qdt
5711 if(local_timestep) then
5712 invr=block%dt(ix^d) * dtfactor/x(ix^d,1)
5713 else
5714 invr=qdt/x(ix^d,1)
5715 end if
5716 if(mhd_energy) then
5717 tmp=wprim(ix^d,p_)
5718 else
5719 tmp=mhd_adiab*wprim(ix^d,rho_)**mhd_gamma
5720 end if
5721 ! E=Bxv
5722 {^ifthreec
5723 e(ix^d,1)=wprim(ix^d,b2_)*wprim(ix^d,m3_)-wprim(ix^d,b3_)*wprim(ix^d,m2_)
5724 e(ix^d,2)=wprim(ix^d,b3_)*wprim(ix^d,m1_)-wprim(ix^d,b1_)*wprim(ix^d,m3_)
5725 e(ix^d,3)=wprim(ix^d,b1_)*wprim(ix^d,m2_)-wprim(ix^d,b2_)*wprim(ix^d,m1_)
5726 }
5727 {^iftwoc
5728 e(ix^d,1)=zero
5729 ! store e3 in e2 to count e3 when ^C is from 1 to 2
5730 e(ix^d,2)=wprim(ix^d,b1_)*wprim(ix^d,m2_)-wprim(ix^d,b2_)*wprim(ix^d,m1_)
5731 }
5732 {^ifonec
5733 e(ix^d,1)=zero
5734 }
5735 if(phi_>0) then
5736 w(ix^d,mr_)=w(ix^d,mr_)+invr*(tmp+&
5737 half*((^c&wprim(ix^d,b^c_)**2+)+(^c&e(ix^d,^c)**2+)*inv_squared_c) -&
5738 wprim(ix^d,bphi_)**2+wprim(ix^d,rho_)*wprim(ix^d,mphi_)**2)
5739 w(ix^d,mphi_)=w(ix^d,mphi_)+invr*(&
5740 -wprim(ix^d,rho_)*wprim(ix^d,mphi_)*wprim(ix^d,mr_) &
5741 +wprim(ix^d,bphi_)*wprim(ix^d,br_)+e(ix^d,phi_)*e(ix^d,1)*inv_squared_c)
5742 if(.not.stagger_grid) then
5743 w(ix^d,bphi_)=w(ix^d,bphi_)+invr*&
5744 (wprim(ix^d,bphi_)*wprim(ix^d,mr_) &
5745 -wprim(ix^d,br_)*wprim(ix^d,mphi_))
5746 end if
5747 else
5748 w(ix^d,mr_)=w(ix^d,mr_)+invr*(tmp+half*((^c&wprim(ix^d,b^c_)**2+)+&
5749 (^c&e(ix^d,^c)**2+)*inv_squared_c))
5750 end if
5751 if(mhd_glm) w(ix^d,br_)=w(ix^d,br_)+wprim(ix^d,psi_)*invr
5752 {end do\}
5753 case (spherical)
5754 {do ix^db=ixomin^db,ixomax^db\}
5755 ! include dt in invr, invr is always used with qdt
5756 if(local_timestep) then
5757 invr=block%dt(ix^d)*dtfactor/x(ix^d,1)
5758 else
5759 invr=qdt/x(ix^d,1)
5760 end if
5761 ! E=Bxv
5762 {^ifthreec
5763 e(ix^d,1)=wprim(ix^d,b2_)*wprim(ix^d,m3_)-wprim(ix^d,b3_)*wprim(ix^d,m2_)
5764 e(ix^d,2)=wprim(ix^d,b3_)*wprim(ix^d,m1_)-wprim(ix^d,b1_)*wprim(ix^d,m3_)
5765 e(ix^d,3)=wprim(ix^d,b1_)*wprim(ix^d,m2_)-wprim(ix^d,b2_)*wprim(ix^d,m1_)
5766 }
5767 {^iftwoc
5768 ! store e3 in e1 to count e3 when ^C is from 1 to 2
5769 e(ix^d,1)=wprim(ix^d,b1_)*wprim(ix^d,m2_)-wprim(ix^d,b2_)*wprim(ix^d,m1_)
5770 e(ix^d,2)=zero
5771 }
5772 {^ifonec
5773 e(ix^d,1)=zero
5774 }
5775 if(mhd_energy) then
5776 tmp1=wprim(ix^d,p_)+half*((^c&wprim(ix^d,b^c_)**2+)+(^c&e(ix^d,^c)**2+)*inv_squared_c)
5777 else
5778 tmp1=mhd_adiab*wprim(ix^d,rho_)**mhd_gamma+half*((^c&wprim(ix^d,b^c_)**2+)+(^c&e(ix^d,^c)**2+)*inv_squared_c)
5779 end if
5780 ! m1
5781 {^ifonec
5782 w(ix^d,m1_)=w(ix^d,m1_)+two*tmp1*invr
5783 }
5784 {^noonec
5785 w(ix^d,m1_)=w(ix^d,m1_)+invr*&
5786 (two*tmp1+(^ce&wprim(ix^d,rho_)*wprim(ix^d,m^ce_)**2-&
5787 wprim(ix^d,b^ce_)**2-e(ix^d,^ce)**2*inv_squared_c+))
5788 }
5789 ! b1
5790 if(mhd_glm) then
5791 w(ix^d,b1_)=w(ix^d,b1_)+invr*2.0d0*wprim(ix^d,psi_)
5792 end if
5793 {^ifoned
5794 cot=0.d0
5795 }
5796 {^nooned
5797 cot=1.d0/tan(x(ix^d,2))
5798 }
5799 {^iftwoc
5800 ! m2
5801 w(ix^d,m2_)=w(ix^d,m2_)+invr*(tmp1*cot-wprim(ix^d,rho_)*wprim(ix^d,m1_)*wprim(ix^d,m2_)&
5802 +wprim(ix^d,b1_)*wprim(ix^d,b2_)+e(ix^d,1)*e(ix^d,2)*inv_squared_c)
5803 ! b2
5804 if(.not.stagger_grid) then
5805 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
5806 if(mhd_glm) then
5807 tmp=tmp+wprim(ix^d,psi_)*cot
5808 end if
5809 w(ix^d,b2_)=w(ix^d,b2_)+tmp*invr
5810 end if
5811 }
5812
5813 {^ifthreec
5814 ! m2
5815 w(ix^d,m2_)=w(ix^d,m2_)+invr*(tmp1*cot-wprim(ix^d,rho_)*wprim(ix^d,m1_)*wprim(ix^d,m2_) &
5816 +wprim(ix^d,b1_)*wprim(ix^d,b2_)+e(ix^d,1)*e(ix^d,2)*inv_squared_c&
5817 +(wprim(ix^d,rho_)*wprim(ix^d,m3_)**2&
5818 -wprim(ix^d,b3_)**2-e(ix^d,3)**2*inv_squared_c)*cot)
5819 ! b2
5820 if(.not.stagger_grid) then
5821 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
5822 if(mhd_glm) then
5823 tmp=tmp+wprim(ix^d,psi_)*cot
5824 end if
5825 w(ix^d,b2_)=w(ix^d,b2_)+tmp*invr
5826 end if
5827 ! m3
5828 w(ix^d,m3_)=w(ix^d,m3_)+invr*&
5829 (-wprim(ix^d,m3_)*wprim(ix^d,m1_)*wprim(ix^d,rho_) &
5830 +wprim(ix^d,b3_)*wprim(ix^d,b1_) &
5831 +e(ix^d,3)*e(ix^d,1)*inv_squared_c&
5832 +(-wprim(ix^d,m2_)*wprim(ix^d,m3_)*wprim(ix^d,rho_) &
5833 +wprim(ix^d,b2_)*wprim(ix^d,b3_)&
5834 +e(ix^d,2)*e(ix^d,3)*inv_squared_c)*cot)
5835 ! b3
5836 if(.not.stagger_grid) then
5837 w(ix^d,b3_)=w(ix^d,b3_)+invr*&
5838 (wprim(ix^d,m1_)*wprim(ix^d,b3_) &
5839 -wprim(ix^d,m3_)*wprim(ix^d,b1_) &
5840 -(wprim(ix^d,m3_)*wprim(ix^d,b2_) &
5841 -wprim(ix^d,m2_)*wprim(ix^d,b3_))*cot)
5842 end if
5843 }
5844 {end do\}
5845 end select
5846
5847 if (mhd_rotating_frame) then
5848 call rotating_frame_add_source(qdt,dtfactor,ixi^l,ixo^l,wprim,w,x)
5849 end if
5850
5851 end subroutine mhd_add_source_geom_semirelati
5852
5853 ! Add geometrical source terms to w
5854 subroutine mhd_add_source_geom_split(qdt,dtfactor,ixI^L,ixO^L,wCT,wprim,w,x)
5856 use mod_geometry
5858
5859 integer, intent(in) :: ixi^l, ixo^l
5860 double precision, intent(in) :: qdt, dtfactor,x(ixi^s,1:ndim)
5861 double precision, intent(inout) :: wct(ixi^s,1:nw),wprim(ixi^s,1:nw),w(ixi^s,1:nw)
5862
5863 double precision :: tmp,tmp1,tmp2,invr,cot
5864 integer :: ix^d
5865 integer :: mr_,mphi_ ! Polar var. names
5866 integer :: br_,bphi_
5867
5868 mr_=mom(1); mphi_=mom(1)-1+phi_ ! Polar var. names
5869 br_=mag(1); bphi_=mag(1)-1+phi_
5870
5871
5872 select case (coordinate)
5873 case (cylindrical)
5874 {do ix^db=ixomin^db,ixomax^db\}
5875 ! include dt in invr, invr is always used with qdt
5876 if(local_timestep) then
5877 invr=block%dt(ix^d) * dtfactor/x(ix^d,1)
5878 else
5879 invr=qdt/x(ix^d,1)
5880 end if
5881 if(mhd_energy) then
5882 tmp=wprim(ix^d,p_)+half*(^c&wprim(ix^d,b^c_)**2+)
5883 else
5884 tmp=mhd_adiab*wprim(ix^d,rho_)**mhd_gamma+half*(^c&wprim(ix^d,b^c_)**2+)
5885 end if
5886 if(phi_>0) then
5887 w(ix^d,mr_)=w(ix^d,mr_)+invr*(tmp-&
5888 wprim(ix^d,bphi_)**2+wprim(ix^d,mphi_)*wct(ix^d,mphi_))
5889 w(ix^d,mphi_)=w(ix^d,mphi_)+invr*(&
5890 -wct(ix^d,mphi_)*wprim(ix^d,mr_) &
5891 +wprim(ix^d,bphi_)*wprim(ix^d,br_))
5892 if(.not.stagger_grid) then
5893 w(ix^d,bphi_)=w(ix^d,bphi_)+invr*&
5894 (wprim(ix^d,bphi_)*wprim(ix^d,mr_) &
5895 -wprim(ix^d,br_)*wprim(ix^d,mphi_))
5896 end if
5897 else
5898 w(ix^d,mr_)=w(ix^d,mr_)+invr*tmp
5899 end if
5900 if(mhd_glm) w(ix^d,br_)=w(ix^d,br_)+wprim(ix^d,psi_)*invr
5901 {end do\}
5902 case (spherical)
5903 {do ix^db=ixomin^db,ixomax^db\}
5904 ! include dt in invr, invr is always used with qdt
5905 if(local_timestep) then
5906 invr=block%dt(ix^d) * dtfactor/x(ix^d,1)
5907 else
5908 invr=qdt/x(ix^d,1)
5909 end if
5910 tmp1=wprim(ix^d,p_)+half*(^c&wprim(ix^d,b^c_)**2+)
5911 if(b0field) tmp2=(^c&block%B0(ix^d,^c,0)*wprim(ix^d,b^c_)+)
5912 ! m1
5913 {^ifonec
5914 w(ix^d,mom(1))=w(ix^d,mom(1))+two*tmp1*invr
5915 }
5916 {^noonec
5917 if(b0field) then
5918 w(ix^d,mom(1))=w(ix^d,mom(1))+invr*&
5919 (two*(tmp1+tmp2)+(^ce&wprim(ix^d,m^ce_)*wct(ix^d,m^ce_)-wprim(ix^d,b^ce_)**2+)- &
5920 (^ce&two*block%B0(ix^d,^ce,0)*wprim(ix^d,b^ce_)+))
5921 else
5922 w(ix^d,mom(1))=w(ix^d,mom(1))+invr*&
5923 (two*tmp1+(^ce&wprim(ix^d,m^ce_)*wct(ix^d,m^ce_)-wprim(ix^d,b^ce_)**2+))
5924 end if
5925 }
5926 ! b1
5927 if(mhd_glm) then
5928 w(ix^d,mag(1))=w(ix^d,mag(1))+invr*2.0d0*wprim(ix^d,psi_)
5929 end if
5930 {^ifoned
5931 cot=0.d0
5932 }
5933 {^nooned
5934 cot=1.d0/tan(x(ix^d,2))
5935 }
5936 {^iftwoc
5937 ! m2
5938 if(b0field) then
5939 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*((tmp1+tmp2)*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
5940 +wprim(ix^d,b1_)*wprim(ix^d,b2_)+block%B0(ix^d,1,0)*wprim(ix^d,b2_)&
5941 +wprim(ix^d,b1_)*block%B0(ix^d,2,0))
5942 else
5943 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*(tmp1*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
5944 +wprim(ix^d,b1_)*wprim(ix^d,b2_))
5945 end if
5946 ! b2
5947 if(.not.stagger_grid) then
5948 if(b0field) then
5949 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)&
5950 +wprim(ix^d,m1_)*block%B0(ix^d,2,0)-wprim(ix^d,m2_)*block%B0(ix^d,1,0)
5951 else
5952 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
5953 end if
5954 if(mhd_glm) then
5955 tmp=tmp+wprim(ix^d,psi_)*cot
5956 end if
5957 w(ix^d,mag(2))=w(ix^d,mag(2))+tmp*invr
5958 end if
5959 }
5960 {^ifthreec
5961 ! m2
5962 if(b0field) then
5963 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*((tmp1+tmp2)*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
5964 +wprim(ix^d,b1_)*wprim(ix^d,b2_)+block%B0(ix^d,1,0)*wprim(ix^d,b2_)&
5965 +wprim(ix^d,b1_)*block%B0(ix^d,2,0)&
5966 +(wprim(ix^d,m3_)*wct(ix^d,m3_)-wprim(ix^d,b3_)**2-two*block%B0(ix^d,3,0)*wprim(ix^d,b3_))*cot)
5967 else
5968 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*(tmp1*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
5969 +wprim(ix^d,b1_)*wprim(ix^d,b2_)&
5970 +(wprim(ix^d,m3_)*wct(ix^d,m3_)-wprim(ix^d,b3_)**2)*cot)
5971 end if
5972 ! b2
5973 if(.not.stagger_grid) then
5974 if(b0field) then
5975 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)&
5976 +wprim(ix^d,m1_)*block%B0(ix^d,2,0)-wprim(ix^d,m2_)*block%B0(ix^d,1,0)
5977 else
5978 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
5979 end if
5980 if(mhd_glm) then
5981 tmp=tmp+wprim(ix^d,psi_)*cot
5982 end if
5983 w(ix^d,mag(2))=w(ix^d,mag(2))+tmp*invr
5984 end if
5985 ! m3
5986 if(b0field) then
5987 w(ix^d,mom(3))=w(ix^d,mom(3))-invr*&
5988 (wprim(ix^d,m3_)*wct(ix^d,m1_) &
5989 -wprim(ix^d,b3_)*wprim(ix^d,b1_) &
5990 +block%B0(ix^d,1,0)*wprim(ix^d,b3_) &
5991 +wprim(ix^d,b1_)*block%B0(ix^d,3,0) &
5992 +(wprim(ix^d,m2_)*wct(ix^d,m3_) &
5993 -wprim(ix^d,b2_)*wprim(ix^d,b3_) &
5994 +block%B0(ix^d,2,0)*wprim(ix^d,b3_) &
5995 +wprim(ix^d,b2_)*block%B0(ix^d,3,0))*cot)
5996 else
5997 w(ix^d,mom(3))=w(ix^d,mom(3))-invr*&
5998 (wprim(ix^d,m3_)*wct(ix^d,m1_) &
5999 -wprim(ix^d,b3_)*wprim(ix^d,b1_) &
6000 +(wprim(ix^d,m2_)*wct(ix^d,m3_) &
6001 -wprim(ix^d,b2_)*wprim(ix^d,b3_))*cot)
6002 end if
6003 ! b3
6004 if(.not.stagger_grid) then
6005 if(b0field) then
6006 w(ix^d,mag(3))=w(ix^d,mag(3))+invr*&
6007 (wprim(ix^d,m1_)*wprim(ix^d,b3_) &
6008 -wprim(ix^d,m3_)*wprim(ix^d,b1_) &
6009 +wprim(ix^d,m1_)*block%B0(ix^d,3,0) &
6010 -wprim(ix^d,m3_)*block%B0(ix^d,1,0) &
6011 -(wprim(ix^d,m3_)*wprim(ix^d,b2_) &
6012 -wprim(ix^d,m2_)*wprim(ix^d,b3_) &
6013 +wprim(ix^d,m3_)*block%B0(ix^d,2,0) &
6014 -wprim(ix^d,m2_)*block%B0(ix^d,3,0))*cot)
6015 else
6016 w(ix^d,mag(3))=w(ix^d,mag(3))+invr*&
6017 (wprim(ix^d,m1_)*wprim(ix^d,b3_) &
6018 -wprim(ix^d,m3_)*wprim(ix^d,b1_) &
6019 -(wprim(ix^d,m3_)*wprim(ix^d,b2_) &
6020 -wprim(ix^d,m2_)*wprim(ix^d,b3_))*cot)
6021 end if
6022 end if
6023 }
6024 {end do\}
6025 end select
6026
6027 if (mhd_rotating_frame) then
6028 call rotating_frame_add_source(qdt,dtfactor,ixi^l,ixo^l,wprim,w,x)
6029 end if
6030
6031 end subroutine mhd_add_source_geom_split
6032
6033 !> Compute 2 times total magnetic energy
6034 function mhd_mag_en_all(w, ixI^L, ixO^L) result(mge)
6036 integer, intent(in) :: ixi^l, ixo^l
6037 double precision, intent(in) :: w(ixi^s, nw)
6038 double precision :: mge(ixo^s)
6039
6040 if (b0field) then
6041 mge = sum((w(ixo^s, mag(:))+block%B0(ixo^s,:,b0i))**2, dim=ndim+1)
6042 else
6043 mge = sum(w(ixo^s, mag(:))**2, dim=ndim+1)
6044 end if
6045 end function mhd_mag_en_all
6046
6047 subroutine mhd_getv_hall(w,x,ixI^L,ixO^L,vHall)
6049
6050 integer, intent(in) :: ixi^l, ixo^l
6051 double precision, intent(in) :: w(ixi^s,nw)
6052 double precision, intent(in) :: x(ixi^s,1:ndim)
6053 double precision, intent(inout) :: vhall(ixi^s,1:3)
6054
6055 double precision :: current(ixi^s,7-2*ndir:3)
6056 double precision :: rho(ixi^s)
6057 integer :: idir, idirmin, ix^d
6058
6059 call mhd_get_rho(w,x,ixi^l,ixo^l,rho)
6060 ! Calculate current density and idirmin
6061 call get_current(w,ixi^l,ixo^l,idirmin,current)
6062 do idir = idirmin, 3
6063 {do ix^db=ixomin^db,ixomax^db\}
6064 vhall(ix^d,idir)=-mhd_etah*current(ix^d,idir)/rho(ix^d)
6065 {end do\}
6066 end do
6067
6068 end subroutine mhd_getv_hall
6069
6070 subroutine mhd_get_jambi(w,x,ixI^L,ixO^L,res)
6072
6073 integer, intent(in) :: ixi^l, ixo^l
6074 double precision, intent(in) :: w(ixi^s,nw)
6075 double precision, intent(in) :: x(ixi^s,1:ndim)
6076 double precision, allocatable, intent(inout) :: res(:^d&,:)
6077
6078
6079 double precision :: current(ixi^s,7-2*ndir:3)
6080 integer :: idir, idirmin
6081
6082 res = 0d0
6083
6084 ! Calculate current density and idirmin
6085 call get_current(w,ixi^l,ixo^l,idirmin,current)
6086
6087 res(ixo^s,idirmin:3)=-current(ixo^s,idirmin:3)
6088 do idir = idirmin, 3
6089 call multiplyambicoef(ixi^l,ixo^l,res(ixi^s,idir),w,x)
6090 enddo
6091
6092 end subroutine mhd_get_jambi
6093
6094 subroutine mhd_modify_wlr(ixI^L,ixO^L,qt,wLC,wRC,wLp,wRp,s,idir)
6096 use mod_usr_methods
6097 integer, intent(in) :: ixi^l, ixo^l, idir
6098 double precision, intent(in) :: qt
6099 double precision, intent(inout) :: wlc(ixi^s,1:nw), wrc(ixi^s,1:nw)
6100 double precision, intent(inout) :: wlp(ixi^s,1:nw), wrp(ixi^s,1:nw)
6101 type(state) :: s
6102
6103 double precision :: db(ixo^s), dpsi(ixo^s)
6104 integer :: ix^d
6105
6106 if(stagger_grid) then
6107 {do ix^db=ixomin^db,ixomax^db\}
6108 wlc(ix^d,mag(idir))=s%ws(ix^d,idir)
6109 wrc(ix^d,mag(idir))=s%ws(ix^d,idir)
6110 wlp(ix^d,mag(idir))=s%ws(ix^d,idir)
6111 wrp(ix^d,mag(idir))=s%ws(ix^d,idir)
6112 {end do\}
6113 else
6114 ! Solve the Riemann problem for the linear 2x2 system for normal
6115 ! B-field and GLM_Psi according to Dedner 2002:
6116 ! This implements eq. (42) in Dedner et al. 2002 JcP 175
6117 ! Gives the Riemann solution on the interface
6118 ! for the normal B component and Psi in the GLM-MHD system.
6119 ! 23/04/2013 Oliver Porth
6120 {do ix^db=ixomin^db,ixomax^db\}
6121 db(ix^d)=wrp(ix^d,mag(idir))-wlp(ix^d,mag(idir))
6122 dpsi(ix^d)=wrp(ix^d,psi_)-wlp(ix^d,psi_)
6123 wlp(ix^d,mag(idir))=half*(wrp(ix^d,mag(idir))+wlp(ix^d,mag(idir))-dpsi(ix^d)/cmax_global)
6124 wlp(ix^d,psi_)=half*(wrp(ix^d,psi_)+wlp(ix^d,psi_)-db(ix^d)*cmax_global)
6125 wrp(ix^d,mag(idir))=wlp(ix^d,mag(idir))
6126 wrp(ix^d,psi_)=wlp(ix^d,psi_)
6127 if(total_energy) then
6128 wrc(ix^d,e_)=wrc(ix^d,e_)-half*wrc(ix^d,mag(idir))**2
6129 wlc(ix^d,e_)=wlc(ix^d,e_)-half*wlc(ix^d,mag(idir))**2
6130 end if
6131 wrc(ix^d,mag(idir))=wlp(ix^d,mag(idir))
6132 wrc(ix^d,psi_)=wlp(ix^d,psi_)
6133 wlc(ix^d,mag(idir))=wlp(ix^d,mag(idir))
6134 wlc(ix^d,psi_)=wlp(ix^d,psi_)
6135 ! modify total energy according to the change of magnetic field
6136 if(total_energy) then
6137 wrc(ix^d,e_)=wrc(ix^d,e_)+half*wrc(ix^d,mag(idir))**2
6138 wlc(ix^d,e_)=wlc(ix^d,e_)+half*wlc(ix^d,mag(idir))**2
6139 end if
6140 {end do\}
6141 end if
6142
6143 if(associated(usr_set_wlr)) call usr_set_wlr(ixi^l,ixo^l,qt,wlc,wrc,wlp,wrp,s,idir)
6144
6145 end subroutine mhd_modify_wlr
6146
6147 subroutine mhd_boundary_adjust(igrid,psb)
6149 integer, intent(in) :: igrid
6150 type(state), target :: psb(max_blocks)
6151
6152 integer :: ib, idims, iside, ixo^l, i^d
6153
6154 block=>ps(igrid)
6155 ^d&dxlevel(^d)=rnode(rpdx^d_,igrid);
6156 do idims=1,ndim
6157 ! to avoid using as yet unknown corner info in more than 1D, we
6158 ! fill only interior mesh ranges of the ghost cell ranges at first,
6159 ! and progressively enlarge the ranges to include corners later
6160 do iside=1,2
6161 i^d=kr(^d,idims)*(2*iside-3);
6162 if (neighbor_type(i^d,igrid)/=1) cycle
6163 ib=(idims-1)*2+iside
6164 if(.not.boundary_divbfix(ib)) cycle
6165 if(any(typeboundary(:,ib)==bc_special)) then
6166 ! MF nonlinear force-free B field extrapolation and data driven
6167 ! require normal B of the first ghost cell layer to be untouched by
6168 ! fixdivB=0 process, set boundary_divbfix_skip(iB)=1 in par file
6169 select case (idims)
6170 {case (^d)
6171 if (iside==2) then
6172 ! maximal boundary
6173 ixomin^dd=ixghi^d+1-nghostcells+boundary_divbfix_skip(2*^d)^d%ixOmin^dd=ixglo^dd;
6174 ixomax^dd=ixghi^dd;
6175 else
6176 ! minimal boundary
6177 ixomin^dd=ixglo^dd;
6178 ixomax^dd=ixglo^d-1+nghostcells-boundary_divbfix_skip(2*^d-1)^d%ixOmax^dd=ixghi^dd;
6179 end if \}
6180 end select
6181 call fixdivb_boundary(ixg^ll,ixo^l,psb(igrid)%w,psb(igrid)%x,ib)
6182 end if
6183 end do
6184 end do
6185
6186 end subroutine mhd_boundary_adjust
6187
6188 subroutine fixdivb_boundary(ixG^L,ixO^L,w,x,iB)
6190
6191 integer, intent(in) :: ixg^l,ixo^l,ib
6192 double precision, intent(inout) :: w(ixg^s,1:nw)
6193 double precision, intent(in) :: x(ixg^s,1:ndim)
6194
6195 double precision :: dx1x2,dx1x3,dx2x1,dx2x3,dx3x1,dx3x2
6196 integer :: ix^d,ixf^l
6197
6198 select case(ib)
6199 case(1)
6200 ! 2nd order CD for divB=0 to set normal B component better
6201 if(total_energy) call mhd_to_primitive(ixg^l,ixo^l,w,x)
6202 {^iftwod
6203 ixfmin1=ixomin1+1
6204 ixfmax1=ixomax1+1
6205 ixfmin2=ixomin2+1
6206 ixfmax2=ixomax2-1
6207 if(slab_uniform) then
6208 dx1x2=dxlevel(1)/dxlevel(2)
6209 do ix1=ixfmax1,ixfmin1,-1
6210 w(ix1-1,ixfmin2:ixfmax2,mag(1))=w(ix1+1,ixfmin2:ixfmax2,mag(1)) &
6211 +dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))-&
6212 w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))
6213 enddo
6214 else
6215 do ix1=ixfmax1,ixfmin1,-1
6216 w(ix1-1,ixfmin2:ixfmax2,mag(1))=( (w(ix1+1,ixfmin2:ixfmax2,mag(1))+&
6217 w(ix1,ixfmin2:ixfmax2,mag(1)))*block%surfaceC(ix1,ixfmin2:ixfmax2,1)&
6218 +(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))+w(ix1,ixfmin2:ixfmax2,mag(2)))*&
6219 block%surfaceC(ix1,ixfmin2:ixfmax2,2)&
6220 -(w(ix1,ixfmin2:ixfmax2,mag(2))+w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))*&
6221 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,2) )&
6222 /block%surfaceC(ix1-1,ixfmin2:ixfmax2,1)-w(ix1,ixfmin2:ixfmax2,mag(1))
6223 end do
6224 end if
6225 }
6226 {^ifthreed
6227 ixfmin1=ixomin1+1
6228 ixfmax1=ixomax1+1
6229 ixfmin2=ixomin2+1
6230 ixfmax2=ixomax2-1
6231 ixfmin3=ixomin3+1
6232 ixfmax3=ixomax3-1
6233 if(slab_uniform) then
6234 dx1x2=dxlevel(1)/dxlevel(2)
6235 dx1x3=dxlevel(1)/dxlevel(3)
6236 do ix1=ixfmax1,ixfmin1,-1
6237 w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
6238 w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)) &
6239 +dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))-&
6240 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2))) &
6241 +dx1x3*(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))-&
6242 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))
6243 end do
6244 else
6245 do ix1=ixfmax1,ixfmin1,-1
6246 w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
6247 ( (w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))+&
6248 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)))*&
6249 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)&
6250 +(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))+&
6251 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2)))*&
6252 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,2)&
6253 -(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2))+&
6254 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2)))*&
6255 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,2)&
6256 +(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))+&
6257 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3)))*&
6258 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,3)&
6259 -(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3))+&
6260 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))*&
6261 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,3) )&
6262 /block%surfaceC(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)-&
6263 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))
6264 end do
6265 end if
6266 }
6267 if(total_energy) call mhd_to_conserved(ixg^l,ixo^l,w,x)
6268 case(2)
6269 if(total_energy) call mhd_to_primitive(ixg^l,ixo^l,w,x)
6270 {^iftwod
6271 ixfmin1=ixomin1-1
6272 ixfmax1=ixomax1-1
6273 ixfmin2=ixomin2+1
6274 ixfmax2=ixomax2-1
6275 if(slab_uniform) then
6276 dx1x2=dxlevel(1)/dxlevel(2)
6277 do ix1=ixfmin1,ixfmax1
6278 w(ix1+1,ixfmin2:ixfmax2,mag(1))=w(ix1-1,ixfmin2:ixfmax2,mag(1)) &
6279 -dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))-&
6280 w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))
6281 enddo
6282 else
6283 do ix1=ixfmin1,ixfmax1
6284 w(ix1+1,ixfmin2:ixfmax2,mag(1))=( (w(ix1-1,ixfmin2:ixfmax2,mag(1))+&
6285 w(ix1,ixfmin2:ixfmax2,mag(1)))*block%surfaceC(ix1-1,ixfmin2:ixfmax2,1)&
6286 -(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))+w(ix1,ixfmin2:ixfmax2,mag(2)))*&
6287 block%surfaceC(ix1,ixfmin2:ixfmax2,2)&
6288 +(w(ix1,ixfmin2:ixfmax2,mag(2))+w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))*&
6289 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,2) )&
6290 /block%surfaceC(ix1,ixfmin2:ixfmax2,1)-w(ix1,ixfmin2:ixfmax2,mag(1))
6291 end do
6292 end if
6293 }
6294 {^ifthreed
6295 ixfmin1=ixomin1-1
6296 ixfmax1=ixomax1-1
6297 ixfmin2=ixomin2+1
6298 ixfmax2=ixomax2-1
6299 ixfmin3=ixomin3+1
6300 ixfmax3=ixomax3-1
6301 if(slab_uniform) then
6302 dx1x2=dxlevel(1)/dxlevel(2)
6303 dx1x3=dxlevel(1)/dxlevel(3)
6304 do ix1=ixfmin1,ixfmax1
6305 w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
6306 w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)) &
6307 -dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))-&
6308 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2))) &
6309 -dx1x3*(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))-&
6310 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))
6311 end do
6312 else
6313 do ix1=ixfmin1,ixfmax1
6314 w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
6315 ( (w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))+&
6316 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)))*&
6317 block%surfaceC(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)&
6318 -(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))+&
6319 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2)))*&
6320 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,2)&
6321 +(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2))+&
6322 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2)))*&
6323 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,2)&
6324 -(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))+&
6325 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3)))*&
6326 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,3)&
6327 +(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3))+&
6328 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))*&
6329 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,3) )&
6330 /block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)-&
6331 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))
6332 end do
6333 end if
6334 }
6335 if(total_energy) call mhd_to_conserved(ixg^l,ixo^l,w,x)
6336 case(3)
6337 if(total_energy) call mhd_to_primitive(ixg^l,ixo^l,w,x)
6338 {^iftwod
6339 ixfmin1=ixomin1+1
6340 ixfmax1=ixomax1-1
6341 ixfmin2=ixomin2+1
6342 ixfmax2=ixomax2+1
6343 if(slab_uniform) then
6344 dx2x1=dxlevel(2)/dxlevel(1)
6345 do ix2=ixfmax2,ixfmin2,-1
6346 w(ixfmin1:ixfmax1,ix2-1,mag(2))=w(ixfmin1:ixfmax1,ix2+1,mag(2)) &
6347 +dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))-&
6348 w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))
6349 enddo
6350 else
6351 do ix2=ixfmax2,ixfmin2,-1
6352 w(ixfmin1:ixfmax1,ix2-1,mag(2))=( (w(ixfmin1:ixfmax1,ix2+1,mag(2))+&
6353 w(ixfmin1:ixfmax1,ix2,mag(2)))*block%surfaceC(ixfmin1:ixfmax1,ix2,2)&
6354 +(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))+w(ixfmin1:ixfmax1,ix2,mag(1)))*&
6355 block%surfaceC(ixfmin1:ixfmax1,ix2,1)&
6356 -(w(ixfmin1:ixfmax1,ix2,mag(1))+w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))*&
6357 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,1) )&
6358 /block%surfaceC(ixfmin1:ixfmax1,ix2-1,2)-w(ixfmin1:ixfmax1,ix2,mag(2))
6359 end do
6360 end if
6361 }
6362 {^ifthreed
6363 ixfmin1=ixomin1+1
6364 ixfmax1=ixomax1-1
6365 ixfmin3=ixomin3+1
6366 ixfmax3=ixomax3-1
6367 ixfmin2=ixomin2+1
6368 ixfmax2=ixomax2+1
6369 if(slab_uniform) then
6370 dx2x1=dxlevel(2)/dxlevel(1)
6371 dx2x3=dxlevel(2)/dxlevel(3)
6372 do ix2=ixfmax2,ixfmin2,-1
6373 w(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,mag(2))=w(ixfmin1:ixfmax1,&
6374 ix2+1,ixfmin3:ixfmax3,mag(2)) &
6375 +dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))-&
6376 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1))) &
6377 +dx2x3*(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))-&
6378 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))
6379 end do
6380 else
6381 do ix2=ixfmax2,ixfmin2,-1
6382 w(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,mag(2))=&
6383 ( (w(ixfmin1:ixfmax1,ix2+1,ixfmin3:ixfmax3,mag(2))+&
6384 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2)))*&
6385 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,2)&
6386 +(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))+&
6387 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1)))*&
6388 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,1)&
6389 -(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1))+&
6390 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1)))*&
6391 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,1)&
6392 +(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))+&
6393 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3)))*&
6394 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,3)&
6395 -(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3))+&
6396 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))*&
6397 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,3) )&
6398 /block%surfaceC(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,2)-&
6399 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2))
6400 end do
6401 end if
6402 }
6403 if(total_energy) call mhd_to_conserved(ixg^l,ixo^l,w,x)
6404 case(4)
6405 if(total_energy) call mhd_to_primitive(ixg^l,ixo^l,w,x)
6406 {^iftwod
6407 ixfmin1=ixomin1+1
6408 ixfmax1=ixomax1-1
6409 ixfmin2=ixomin2-1
6410 ixfmax2=ixomax2-1
6411 if(slab_uniform) then
6412 dx2x1=dxlevel(2)/dxlevel(1)
6413 do ix2=ixfmin2,ixfmax2
6414 w(ixfmin1:ixfmax1,ix2+1,mag(2))=w(ixfmin1:ixfmax1,ix2-1,mag(2)) &
6415 -dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))-&
6416 w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))
6417 end do
6418 else
6419 do ix2=ixfmin2,ixfmax2
6420 w(ixfmin1:ixfmax1,ix2+1,mag(2))=( (w(ixfmin1:ixfmax1,ix2-1,mag(2))+&
6421 w(ixfmin1:ixfmax1,ix2,mag(2)))*block%surfaceC(ixfmin1:ixfmax1,ix2-1,2)&
6422 -(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))+w(ixfmin1:ixfmax1,ix2,mag(1)))*&
6423 block%surfaceC(ixfmin1:ixfmax1,ix2,1)&
6424 +(w(ixfmin1:ixfmax1,ix2,mag(1))+w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))*&
6425 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,1) )&
6426 /block%surfaceC(ixfmin1:ixfmax1,ix2,2)-w(ixfmin1:ixfmax1,ix2,mag(2))
6427 end do
6428 end if
6429 }
6430 {^ifthreed
6431 ixfmin1=ixomin1+1
6432 ixfmax1=ixomax1-1
6433 ixfmin3=ixomin3+1
6434 ixfmax3=ixomax3-1
6435 ixfmin2=ixomin2-1
6436 ixfmax2=ixomax2-1
6437 if(slab_uniform) then
6438 dx2x1=dxlevel(2)/dxlevel(1)
6439 dx2x3=dxlevel(2)/dxlevel(3)
6440 do ix2=ixfmin2,ixfmax2
6441 w(ixfmin1:ixfmax1,ix2+1,ixfmin3:ixfmax3,mag(2))=w(ixfmin1:ixfmax1,&
6442 ix2-1,ixfmin3:ixfmax3,mag(2)) &
6443 -dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))-&
6444 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1))) &
6445 -dx2x3*(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))-&
6446 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))
6447 end do
6448 else
6449 do ix2=ixfmin2,ixfmax2
6450 w(ixfmin1:ixfmax1,ix2+1,ixfmin3:ixfmax3,mag(2))=&
6451 ( (w(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,mag(2))+&
6452 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2)))*&
6453 block%surfaceC(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,2)&
6454 -(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))+&
6455 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1)))*&
6456 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,1)&
6457 +(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1))+&
6458 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1)))*&
6459 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,1)&
6460 -(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))+&
6461 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3)))*&
6462 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,3)&
6463 +(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3))+&
6464 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))*&
6465 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,3) )&
6466 /block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,2)-&
6467 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2))
6468 end do
6469 end if
6470 }
6471 if(total_energy) call mhd_to_conserved(ixg^l,ixo^l,w,x)
6472 {^ifthreed
6473 case(5)
6474 if(total_energy) call mhd_to_primitive(ixg^l,ixo^l,w,x)
6475 ixfmin1=ixomin1+1
6476 ixfmax1=ixomax1-1
6477 ixfmin2=ixomin2+1
6478 ixfmax2=ixomax2-1
6479 ixfmin3=ixomin3+1
6480 ixfmax3=ixomax3+1
6481 if(slab_uniform) then
6482 dx3x1=dxlevel(3)/dxlevel(1)
6483 dx3x2=dxlevel(3)/dxlevel(2)
6484 do ix3=ixfmax3,ixfmin3,-1
6485 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,mag(3))=w(ixfmin1:ixfmax1,&
6486 ixfmin2:ixfmax2,ix3+1,mag(3)) &
6487 +dx3x1*(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))-&
6488 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1))) &
6489 +dx3x2*(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))-&
6490 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))
6491 end do
6492 else
6493 do ix3=ixfmax3,ixfmin3,-1
6494 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,mag(3))=&
6495 ( (w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3+1,mag(3))+&
6496 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3)))*&
6497 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,3)&
6498 +(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))+&
6499 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1)))*&
6500 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,1)&
6501 -(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1))+&
6502 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1)))*&
6503 block%surfaceC(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,1)&
6504 +(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))+&
6505 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2)))*&
6506 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,2)&
6507 -(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2))+&
6508 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))*&
6509 block%surfaceC(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,2) )&
6510 /block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,3)-&
6511 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3))
6512 end do
6513 end if
6514 if(total_energy) call mhd_to_conserved(ixg^l,ixo^l,w,x)
6515 case(6)
6516 if(total_energy) call mhd_to_primitive(ixg^l,ixo^l,w,x)
6517 ixfmin1=ixomin1+1
6518 ixfmax1=ixomax1-1
6519 ixfmin2=ixomin2+1
6520 ixfmax2=ixomax2-1
6521 ixfmin3=ixomin3-1
6522 ixfmax3=ixomax3-1
6523 if(slab_uniform) then
6524 dx3x1=dxlevel(3)/dxlevel(1)
6525 dx3x2=dxlevel(3)/dxlevel(2)
6526 do ix3=ixfmin3,ixfmax3
6527 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3+1,mag(3))=w(ixfmin1:ixfmax1,&
6528 ixfmin2:ixfmax2,ix3-1,mag(3)) &
6529 -dx3x1*(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))-&
6530 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1))) &
6531 -dx3x2*(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))-&
6532 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))
6533 end do
6534 else
6535 do ix3=ixfmin3,ixfmax3
6536 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3+1,mag(3))=&
6537 ( (w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,mag(3))+&
6538 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3)))*&
6539 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,3)&
6540 -(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))+&
6541 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1)))*&
6542 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,1)&
6543 +(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1))+&
6544 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1)))*&
6545 block%surfaceC(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,1)&
6546 -(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))+&
6547 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2)))*&
6548 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,2)&
6549 +(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2))+&
6550 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))*&
6551 block%surfaceC(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,2) )&
6552 /block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,3)-&
6553 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3))
6554 end do
6555 end if
6556 if(total_energy) call mhd_to_conserved(ixg^l,ixo^l,w,x)
6557 }
6558 case default
6559 call mpistop("Special boundary is not defined for this region")
6560 end select
6561
6562 end subroutine fixdivb_boundary
6563
6564 {^nooned
6565 subroutine mhd_clean_divb_multigrid(qdt, qt, active)
6566 use mod_forest
6569 use mod_geometry
6570
6571 double precision, intent(in) :: qdt !< Current time step
6572 double precision, intent(in) :: qt !< Current time
6573 logical, intent(inout) :: active !< Output if the source is active
6574
6575 integer :: id
6576 integer, parameter :: max_its = 50
6577 double precision :: residual_it(max_its), max_divb
6578 double precision :: tmp(ixg^t), grad(ixg^t, ndim)
6579 double precision :: res
6580 double precision, parameter :: max_residual = 1d-3
6581 double precision, parameter :: residual_reduction = 1d-10
6582 integer :: iigrid, igrid
6583 integer :: n, nc, lvl, ix^l, ixc^l, idim
6584 type(tree_node), pointer :: pnode
6585
6586 mg%operator_type = mg_laplacian
6587
6588 ! Set boundary conditions
6589 do n = 1, 2*ndim
6590 idim = (n+1)/2
6591 select case (typeboundary(mag(idim), n))
6592 case (bc_symm)
6593 ! d/dx B = 0, take phi = 0
6594 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
6595 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
6596 case (bc_asymm)
6597 ! B = 0, so grad(phi) = 0
6598 mg%bc(n, mg_iphi)%bc_type = mg_bc_neumann
6599 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
6600 case (bc_cont)
6601 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
6602 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
6603 case (bc_special)
6604 ! Assume Dirichlet boundary conditions, derivative zero
6605 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
6606 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
6607 case (bc_periodic)
6608 ! Nothing to do here
6609 case default
6610 write(*,*) "mhd_clean_divb_multigrid warning: unknown boundary type"
6611 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
6612 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
6613 end select
6614 end do
6615
6616 ix^l=ixm^ll^ladd1;
6617 max_divb = 0.0d0
6618
6619 ! Store divergence of B as right-hand side
6620 do iigrid = 1, igridstail
6621 igrid = igrids(iigrid);
6622 pnode => igrid_to_node(igrid, mype)%node
6623 id = pnode%id
6624 lvl = mg%boxes(id)%lvl
6625 nc = mg%box_size_lvl(lvl)
6626
6627 ! Geometry subroutines expect this to be set
6628 block => ps(igrid)
6629 ^d&dxlevel(^d)=rnode(rpdx^d_,igrid);
6630
6631 call get_divb(ps(igrid)%w(ixg^t, 1:nw), ixg^ll, ixm^ll, tmp, &
6633 mg%boxes(id)%cc({1:nc}, mg_irhs) = tmp(ixm^t)
6634 max_divb = max(max_divb, maxval(abs(tmp(ixm^t))))
6635 end do
6636
6637 ! Solve laplacian(phi) = divB
6638 if(stagger_grid) then
6639 call mpi_allreduce(mpi_in_place, max_divb, 1, mpi_double_precision, &
6640 mpi_max, icomm, ierrmpi)
6641
6642 if (mype == 0) print *, "Performing multigrid divB cleaning"
6643 if (mype == 0) print *, "iteration vs residual"
6644 ! Solve laplacian(phi) = divB
6645 do n = 1, max_its
6646 call mg_fas_fmg(mg, n>1, max_res=residual_it(n))
6647 if (mype == 0) write(*, "(I4,E11.3)") n, residual_it(n)
6648 if (residual_it(n) < residual_reduction * max_divb) exit
6649 end do
6650 if (mype == 0 .and. n > max_its) then
6651 print *, "divb_multigrid warning: not fully converged"
6652 print *, "current amplitude of divb: ", residual_it(max_its)
6653 print *, "multigrid smallest grid: ", &
6654 mg%domain_size_lvl(:, mg%lowest_lvl)
6655 print *, "note: smallest grid ideally has <= 8 cells"
6656 print *, "multigrid dx/dy/dz ratio: ", mg%dr(:, 1)/mg%dr(1, 1)
6657 print *, "note: dx/dy/dz should be similar"
6658 end if
6659 else
6660 do n = 1, max_its
6661 call mg_fas_vcycle(mg, max_res=res)
6662 if (res < max_residual) exit
6663 end do
6664 if (res > max_residual) call mpistop("divb_multigrid: no convergence")
6665 end if
6666
6667
6668 ! Correct the magnetic field
6669 do iigrid = 1, igridstail
6670 igrid = igrids(iigrid);
6671 pnode => igrid_to_node(igrid, mype)%node
6672 id = pnode%id
6673
6674 ! Geometry subroutines expect this to be set
6675 block => ps(igrid)
6676 ^d&dxlevel(^d)=rnode(rpdx^d_,igrid);
6677
6678 ! Compute the gradient of phi
6679 tmp(ix^s) = mg%boxes(id)%cc({:,}, mg_iphi)
6680
6681 if(stagger_grid) then
6682 do idim =1, ndim
6683 ixcmin^d=ixmlo^d-kr(idim,^d);
6684 ixcmax^d=ixmhi^d;
6685 call gradientf(tmp,ps(igrid)%x,ixg^ll,ixc^l,idim,grad(ixg^t,idim))
6686 ! Apply the correction B* = B - gradient(phi)
6687 ps(igrid)%ws(ixc^s,idim)=ps(igrid)%ws(ixc^s,idim)-grad(ixc^s,idim)
6688 end do
6689 ! store cell-center magnetic energy
6690 tmp(ixm^t) = sum(ps(igrid)%w(ixm^t, mag(1:ndim))**2, dim=ndim+1)
6691 ! change cell-center magnetic field
6692 call mhd_face_to_center(ixm^ll,ps(igrid))
6693 else
6694 do idim = 1, ndim
6695 call gradient(tmp,ixg^ll,ixm^ll,idim,grad(ixg^t, idim))
6696 end do
6697 ! store cell-center magnetic energy
6698 tmp(ixm^t) = sum(ps(igrid)%w(ixm^t, mag(1:ndim))**2, dim=ndim+1)
6699 ! Apply the correction B* = B - gradient(phi)
6700 ps(igrid)%w(ixm^t, mag(1:ndim)) = &
6701 ps(igrid)%w(ixm^t, mag(1:ndim)) - grad(ixm^t, :)
6702 end if
6703
6704 if(total_energy) then
6705 ! Determine magnetic energy difference
6706 tmp(ixm^t) = 0.5_dp * (sum(ps(igrid)%w(ixm^t, &
6707 mag(1:ndim))**2, dim=ndim+1) - tmp(ixm^t))
6708 ! Keep thermal pressure the same
6709 ps(igrid)%w(ixm^t, e_) = ps(igrid)%w(ixm^t, e_) + tmp(ixm^t)
6710 end if
6711 end do
6712
6713 active = .true.
6714
6715 end subroutine mhd_clean_divb_multigrid
6716 }
6717
6718 subroutine mhd_update_faces(ixI^L,ixO^L,qt,qdt,wprim,fC,fE,sCT,s,vcts)
6720
6721 integer, intent(in) :: ixi^l, ixo^l
6722 double precision, intent(in) :: qt,qdt
6723 ! cell-center primitive variables
6724 double precision, intent(in) :: wprim(ixi^s,1:nw)
6725 type(state) :: sct, s
6726 type(ct_velocity) :: vcts
6727 double precision, intent(in) :: fc(ixi^s,1:nwflux,1:ndim)
6728 double precision, intent(inout) :: fe(ixi^s,sdim:3)
6729
6730 select case(type_ct)
6731 case('average')
6732 call update_faces_average(ixi^l,ixo^l,qt,qdt,fc,fe,sct,s)
6733 case('uct_contact')
6734 call update_faces_contact(ixi^l,ixo^l,qt,qdt,wprim,fc,fe,sct,s,vcts)
6735 case('uct_hll')
6736 call update_faces_hll(ixi^l,ixo^l,qt,qdt,fe,sct,s,vcts)
6737 case default
6738 call mpistop('choose average, uct_contact,or uct_hll for type_ct!')
6739 end select
6740
6741 end subroutine mhd_update_faces
6742
6743 !> get electric field though averaging neighors to update faces in CT
6744 subroutine update_faces_average(ixI^L,ixO^L,qt,qdt,fC,fE,sCT,s)
6746 use mod_usr_methods
6747
6748 integer, intent(in) :: ixi^l, ixo^l
6749 double precision, intent(in) :: qt, qdt
6750 type(state) :: sct, s
6751 double precision, intent(in) :: fc(ixi^s,1:nwflux,1:ndim)
6752 double precision, intent(inout) :: fe(ixi^s,sdim:3)
6753
6754 double precision :: circ(ixi^s,1:ndim)
6755 ! non-ideal electric field on cell edges
6756 double precision, dimension(ixI^S,sdim:3) :: e_resi, e_ambi
6757 integer :: ix^d,ixc^l,ixa^l,i1kr^d,i2kr^d
6758 integer :: idim1,idim2,idir,iwdim1,iwdim2
6759
6760 associate(bfaces=>s%ws,x=>s%x)
6761
6762 ! Calculate contribution to FEM of each edge,
6763 ! that is, estimate value of line integral of
6764 ! electric field in the positive idir direction.
6765
6766 ! if there is resistivity, get eta J
6767 if(mhd_eta/=zero) call get_resistive_electric_field(ixi^l,ixo^l,sct,s,e_resi)
6768
6769 ! if there is ambipolar diffusion, get E_ambi
6770 if(mhd_ambipolar_exp) call get_ambipolar_electric_field(ixi^l,ixo^l,sct%w,x,e_ambi)
6771
6772 do idim1=1,ndim
6773 iwdim1 = mag(idim1)
6774 i1kr^d=kr(idim1,^d);
6775 do idim2=1,ndim
6776 iwdim2 = mag(idim2)
6777 i2kr^d=kr(idim2,^d);
6778 do idir=sdim,3! Direction of line integral
6779 ! Allow only even permutations
6780 if (lvc(idim1,idim2,idir)==1) then
6781 ixcmax^d=ixomax^d;
6782 ixcmin^d=ixomin^d+kr(idir,^d)-1;
6783 ! average cell-face electric field to cell edges
6784 {do ix^db=ixcmin^db,ixcmax^db\}
6785 fe(ix^d,idir)=quarter*&
6786 (fc(ix^d,iwdim1,idim2)+fc({ix^d+i1kr^d},iwdim1,idim2)&
6787 -fc(ix^d,iwdim2,idim1)-fc({ix^d+i2kr^d},iwdim2,idim1))
6788 ! add resistive electric field at cell edges E=-vxB+eta J
6789 if(mhd_eta/=zero) fe(ix^d,idir)=fe(ix^d,idir)+e_resi(ix^d,idir)
6790 ! add ambipolar electric field
6791 if(mhd_ambipolar_exp) fe(ix^d,idir)=fe(ix^d,idir)+e_ambi(ix^d,idir)
6792
6793 ! times time step and edge length
6794 fe(ix^d,idir)=fe(ix^d,idir)*qdt*s%dsC(ix^d,idir)
6795 {end do\}
6796 end if
6797 end do
6798 end do
6799 end do
6800
6801 ! allow user to change inductive electric field, especially for boundary driven applications
6802 if(associated(usr_set_electric_field)) &
6803 call usr_set_electric_field(ixi^l,ixo^l,qt,qdt,fe,sct)
6804
6805 circ(ixi^s,1:ndim)=zero
6806
6807 ! Calculate circulation on each face
6808 do idim1=1,ndim ! Coordinate perpendicular to face
6809 ixcmax^d=ixomax^d;
6810 ixcmin^d=ixomin^d-kr(idim1,^d);
6811 do idim2=1,ndim
6812 ixa^l=ixc^l-kr(idim2,^d);
6813 do idir=sdim,3 ! Direction of line integral
6814 ! Assemble indices
6815 if(lvc(idim1,idim2,idir)==1) then
6816 ! Add line integrals in direction idir
6817 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
6818 +(fe(ixc^s,idir)&
6819 -fe(ixa^s,idir))
6820 else if(lvc(idim1,idim2,idir)==-1) then
6821 ! Add line integrals in direction idir
6822 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
6823 -(fe(ixc^s,idir)&
6824 -fe(ixa^s,idir))
6825 end if
6826 end do
6827 end do
6828 ! Divide by the area of the face to get dB/dt
6829 where(s%surfaceC(ixc^s,idim1) > 1.0d-9*s%dvolume(ixc^s))
6830 circ(ixc^s,idim1)=circ(ixc^s,idim1)/s%surfaceC(ixc^s,idim1)
6831 elsewhere
6832 circ(ixc^s,idim1)=zero
6833 end where
6834 ! Time update cell-face magnetic field component
6835 bfaces(ixc^s,idim1)=bfaces(ixc^s,idim1)-circ(ixc^s,idim1)
6836 end do
6837
6838 end associate
6839
6840 end subroutine update_faces_average
6841
6842 !> update faces using UCT contact mode by Gardiner and Stone 2005 JCP 205, 509
6843 subroutine update_faces_contact(ixI^L,ixO^L,qt,qdt,wp,fC,fE,sCT,s,vcts)
6845 use mod_usr_methods
6846 use mod_geometry
6847
6848 integer, intent(in) :: ixi^l, ixo^l
6849 double precision, intent(in) :: qt, qdt
6850 ! cell-center primitive variables
6851 double precision, intent(in) :: wp(ixi^s,1:nw)
6852 type(state) :: sct, s
6853 type(ct_velocity) :: vcts
6854 double precision, intent(in) :: fc(ixi^s,1:nwflux,1:ndim)
6855 double precision, intent(inout) :: fe(ixi^s,sdim:3)
6856
6857 double precision :: circ(ixi^s,1:ndim)
6858 ! electric field at cell centers
6859 double precision :: ecc(ixi^s,sdim:3)
6860 double precision :: ein(ixi^s,sdim:3)
6861 ! gradient of E at left and right side of a cell face
6862 double precision :: el(ixi^s),er(ixi^s)
6863 ! gradient of E at left and right side of a cell corner
6864 double precision :: elc,erc
6865 ! non-ideal electric field on cell edges
6866 double precision, dimension(ixI^S,sdim:3) :: e_resi, e_ambi
6867 ! current on cell edges
6868 double precision :: jce(ixi^s,sdim:3)
6869 ! location at cell faces
6870 double precision :: xs(ixgs^t,1:ndim)
6871 double precision :: gradi(ixgs^t)
6872 integer :: ixc^l,ixa^l
6873 integer :: idim1,idim2,idir,iwdim1,iwdim2,ix^d,i1kr^d,i2kr^d
6874
6875 associate(bfaces=>s%ws,x=>s%x,w=>s%w,vnorm=>vcts%vnorm,wcts=>sct%ws)
6876
6877 ! if there is resistivity, get eta J
6878 if(mhd_eta/=zero) call get_resistive_electric_field(ixi^l,ixo^l,sct,s,e_resi)
6879
6880 ! if there is ambipolar diffusion, get E_ambi
6881 if(mhd_ambipolar_exp) call get_ambipolar_electric_field(ixi^l,ixo^l,sct%w,x,e_ambi)
6882
6883 if(b0field) then
6884 {do ix^db=iximin^db,iximax^db\}
6885 ! Calculate electric field at cell centers
6886 {^ifthreed
6887 ecc(ix^d,1)=(wp(ix^d,b2_)+block%B0(ix^d,2,0))*wp(ix^d,m3_)-(wp(ix^d,b3_)+block%B0(ix^d,3,0))*wp(ix^d,m2_)
6888 ecc(ix^d,2)=(wp(ix^d,b3_)+block%B0(ix^d,3,0))*wp(ix^d,m1_)-(wp(ix^d,b1_)+block%B0(ix^d,1,0))*wp(ix^d,m3_)
6889 ecc(ix^d,3)=(wp(ix^d,b1_)+block%B0(ix^d,1,0))*wp(ix^d,m2_)-(wp(ix^d,b2_)+block%B0(ix^d,2,0))*wp(ix^d,m1_)
6890 }
6891 {^iftwod
6892 ecc(ix^d,3)=wp(ix^d,b1_)*wp(ix^d,m2_)-wp(ix^d,b2_)*wp(ix^d,m1_)
6893 }
6894 {^ifoned
6895 ecc(ix^d,3)=0.d0
6896 }
6897 {end do\}
6898 else
6899 {do ix^db=iximin^db,iximax^db\}
6900 ! Calculate electric field at cell centers
6901 {^ifthreed
6902 ecc(ix^d,1)=wp(ix^d,b2_)*wp(ix^d,m3_)-wp(ix^d,b3_)*wp(ix^d,m2_)
6903 ecc(ix^d,2)=wp(ix^d,b3_)*wp(ix^d,m1_)-wp(ix^d,b1_)*wp(ix^d,m3_)
6904 ecc(ix^d,3)=wp(ix^d,b1_)*wp(ix^d,m2_)-wp(ix^d,b2_)*wp(ix^d,m1_)
6905 }
6906 {^iftwod
6907 ecc(ix^d,3)=wp(ix^d,b1_)*wp(ix^d,m2_)-wp(ix^d,b2_)*wp(ix^d,m1_)
6908 }
6909 {^ifoned
6910 ecc(ix^d,3)=0.d0
6911 }
6912 {end do\}
6913 end if
6914
6915 ! Calculate contribution to FEM of each edge,
6916 ! that is, estimate value of line integral of
6917 ! electric field in the positive idir direction.
6918 ! evaluate electric field along cell edges according to equation (41)
6919 do idim1=1,ndim
6920 iwdim1 = mag(idim1)
6921 i1kr^d=kr(idim1,^d);
6922 do idim2=1,ndim
6923 iwdim2 = mag(idim2)
6924 i2kr^d=kr(idim2,^d);
6925 do idir=sdim,3 ! Direction of line integral
6926 ! Allow only even permutations
6927 if (lvc(idim1,idim2,idir)==1) then
6928 ixcmax^d=ixomax^d;
6929 ixcmin^d=ixomin^d+kr(idir,^d)-1;
6930 ! Assemble indices
6931 ! average cell-face electric field to cell edges
6932 {do ix^db=ixcmin^db,ixcmax^db\}
6933 fe(ix^d,idir)=quarter*&
6934 (fc(ix^d,iwdim1,idim2)+fc({ix^d+i1kr^d},iwdim1,idim2)&
6935 -fc(ix^d,iwdim2,idim1)-fc({ix^d+i2kr^d},iwdim2,idim1))
6936 if(partial_energy) ein(ix^d,idir)=fe(ix^d,idir)
6937 {end do\}
6938 ! add slope in idim2 direction from equation (50)
6939 ixamin^d=ixcmin^d;
6940 ixamax^d=ixcmax^d+i1kr^d;
6941 {do ix^db=ixamin^db,ixamax^db\}
6942 el(ix^d)=fc(ix^d,iwdim1,idim2)-ecc(ix^d,idir)
6943 er(ix^d)=fc(ix^d,iwdim1,idim2)-ecc({ix^d+i2kr^d},idir)
6944 {end do\}
6945 {!dir$ ivdep
6946 do ix^db=ixcmin^db,ixcmax^db\}
6947 if(vnorm(ix^d,idim1)>0.d0) then
6948 elc=el(ix^d)
6949 else if(vnorm(ix^d,idim1)<0.d0) then
6950 elc=el({ix^d+i1kr^d})
6951 else
6952 elc=0.5d0*(el(ix^d)+el({ix^d+i1kr^d}))
6953 end if
6954 if(vnorm({ix^d+i2kr^d},idim1)>0.d0) then
6955 erc=er(ix^d)
6956 else if(vnorm({ix^d+i2kr^d},idim1)<0.d0) then
6957 erc=er({ix^d+i1kr^d})
6958 else
6959 erc=0.5d0*(er(ix^d)+er({ix^d+i1kr^d}))
6960 end if
6961 fe(ix^d,idir)=fe(ix^d,idir)+0.25d0*(elc+erc)
6962 {end do\}
6963
6964 ! add slope in idim1 direction from equation (50)
6965 ixamin^d=ixcmin^d;
6966 ixamax^d=ixcmax^d+i2kr^d;
6967 {do ix^db=ixamin^db,ixamax^db\}
6968 el(ix^d)=-fc(ix^d,iwdim2,idim1)-ecc(ix^d,idir)
6969 er(ix^d)=-fc(ix^d,iwdim2,idim1)-ecc({ix^d+i1kr^d},idir)
6970 {end do\}
6971 {!dir$ ivdep
6972 do ix^db=ixcmin^db,ixcmax^db\}
6973 if(vnorm(ix^d,idim2)>0.d0) then
6974 elc=el(ix^d)
6975 else if(vnorm(ix^d,idim2)<0.d0) then
6976 elc=el({ix^d+i2kr^d})
6977 else
6978 elc=0.5d0*(el(ix^d)+el({ix^d+i2kr^d}))
6979 end if
6980 if(vnorm({ix^d+i1kr^d},idim2)>0.d0) then
6981 erc=er(ix^d)
6982 else if(vnorm({ix^d+i1kr^d},idim2)<0.d0) then
6983 erc=er({ix^d+i2kr^d})
6984 else
6985 erc=0.5d0*(er(ix^d)+er({ix^d+i2kr^d}))
6986 end if
6987 fe(ix^d,idir)=fe(ix^d,idir)+0.25d0*(elc+erc)
6988 ! difference between average and upwind interpolated E
6989 if(partial_energy) ein(ix^d,idir)=fe(ix^d,idir)-ein(ix^d,idir)
6990 ! add resistive electric field at cell edges E=-vxB+eta J
6991 if(mhd_eta/=zero) fe(ix^d,idir)=fe(ix^d,idir)+e_resi(ix^d,idir)
6992 ! add ambipolar electric field
6993 if(mhd_ambipolar_exp) fe(ix^d,idir)=fe(ix^d,idir)+e_ambi(ix^d,idir)
6994
6995 ! times time step and edge length
6996 fe(ix^d,idir)=fe(ix^d,idir)*qdt*s%dsC(ix^d,idir)
6997 {end do\}
6998 end if
6999 end do
7000 end do
7001 end do
7002
7003 if(partial_energy) then
7004 ! add upwind diffused magnetic energy back to energy
7005 ! calculate current density at cell edges
7006 jce=0.d0
7007 do idim1=1,ndim
7008 do idim2=1,ndim
7009 do idir=sdim,3
7010 if (lvc(idim1,idim2,idir)==0) cycle
7011 ixcmax^d=ixomax^d;
7012 ixcmin^d=ixomin^d+kr(idir,^d)-1;
7013 ixamax^d=ixcmax^d-kr(idir,^d)+1;
7014 ixamin^d=ixcmin^d;
7015 ! current at transverse faces
7016 xs(ixa^s,:)=x(ixa^s,:)
7017 xs(ixa^s,idim2)=x(ixa^s,idim2)+half*s%dx(ixa^s,idim2)
7018 call gradientf(wcts(ixgs^t,idim2),xs,ixgs^ll,ixc^l,idim1,gradi)
7019 if (lvc(idim1,idim2,idir)==1) then
7020 jce(ixc^s,idir)=jce(ixc^s,idir)+gradi(ixc^s)
7021 else
7022 jce(ixc^s,idir)=jce(ixc^s,idir)-gradi(ixc^s)
7023 end if
7024 end do
7025 end do
7026 end do
7027 do idir=sdim,3
7028 ixcmax^d=ixomax^d;
7029 ixcmin^d=ixomin^d+kr(idir,^d)-1;
7030 ! E dot J on cell edges
7031 ein(ixc^s,idir)=ein(ixc^s,idir)*jce(ixc^s,idir)
7032 ! average from cell edge to cell center
7033 {^ifthreed
7034 if(idir==1) then
7035 {do ix^db=ixomin^db,ixomax^db\}
7036 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1,ix2-1,ix3,idir)+ein(ix1,ix2,ix3-1,idir)&
7037 +ein(ix1,ix2-1,ix3-1,idir))
7038 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
7039 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
7040 {end do\}
7041 else if(idir==2) then
7042 {do ix^db=ixomin^db,ixomax^db\}
7043 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1-1,ix2,ix3,idir)+ein(ix1,ix2,ix3-1,idir)&
7044 +ein(ix1-1,ix2,ix3-1,idir))
7045 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
7046 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
7047 {end do\}
7048 else
7049 {do ix^db=ixomin^db,ixomax^db\}
7050 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1-1,ix2,ix3,idir)+ein(ix1,ix2-1,ix3,idir)&
7051 +ein(ix1-1,ix2-1,ix3,idir))
7052 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
7053 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
7054 {end do\}
7055 end if
7056 }
7057 {^iftwod
7058 !idir=3
7059 {do ix^db=ixomin^db,ixomax^db\}
7060 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1-1,ix2,idir)+ein(ix1,ix2-1,idir)&
7061 +ein(ix1-1,ix2-1,idir))
7062 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
7063 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
7064 {end do\}
7065 }
7066 ! save additional numerical resistive heating to an extra variable
7067 if(nwextra>0) then
7068 block%w(ixo^s,nw)=block%w(ixo^s,nw)+jce(ixo^s,idir)
7069 end if
7070 end do
7071 end if
7072
7073 ! allow user to change inductive electric field, especially for boundary driven applications
7074 if(associated(usr_set_electric_field)) &
7075 call usr_set_electric_field(ixi^l,ixo^l,qt,qdt,fe,sct)
7076
7077 circ(ixi^s,1:ndim)=zero
7078
7079 ! Calculate circulation on each face
7080 do idim1=1,ndim ! Coordinate perpendicular to face
7081 ixcmax^d=ixomax^d;
7082 ixcmin^d=ixomin^d-kr(idim1,^d);
7083 do idim2=1,ndim
7084 ixa^l=ixc^l-kr(idim2,^d);
7085 do idir=sdim,3 ! Direction of line integral
7086 ! Assemble indices
7087 if(lvc(idim1,idim2,idir)==1) then
7088 ! Add line integrals in direction idir
7089 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
7090 +(fe(ixc^s,idir)&
7091 -fe(ixa^s,idir))
7092 else if(lvc(idim1,idim2,idir)==-1) then
7093 ! Add line integrals in direction idir
7094 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
7095 -(fe(ixc^s,idir)&
7096 -fe(ixa^s,idir))
7097 end if
7098 end do
7099 end do
7100 ! Divide by the area of the face to get dB/dt
7101 where(s%surfaceC(ixc^s,idim1) > smalldouble)
7102 circ(ixc^s,idim1)=circ(ixc^s,idim1)/s%surfaceC(ixc^s,idim1)
7103 elsewhere
7104 circ(ixc^s,idim1)=zero
7105 end where
7106 ! Time update cell-face magnetic field component
7107 bfaces(ixc^s,idim1)=bfaces(ixc^s,idim1)-circ(ixc^s,idim1)
7108 end do
7109
7110 end associate
7111
7112 end subroutine update_faces_contact
7113
7114 !> update faces
7115 subroutine update_faces_hll(ixI^L,ixO^L,qt,qdt,fE,sCT,s,vcts)
7118 use mod_usr_methods
7119
7120 integer, intent(in) :: ixi^l, ixo^l
7121 double precision, intent(in) :: qt, qdt
7122 double precision, intent(inout) :: fe(ixi^s,sdim:3)
7123 type(state) :: sct, s
7124 type(ct_velocity) :: vcts
7125
7126 double precision :: vtill(ixi^s,2)
7127 double precision :: vtilr(ixi^s,2)
7128 double precision :: bfacetot(ixi^s,ndim)
7129 double precision :: btill(ixi^s,ndim)
7130 double precision :: btilr(ixi^s,ndim)
7131 double precision :: cp(ixi^s,2)
7132 double precision :: cm(ixi^s,2)
7133 double precision :: circ(ixi^s,1:ndim)
7134 ! non-ideal electric field on cell edges
7135 double precision, dimension(ixI^S,sdim:3) :: e_resi, e_ambi
7136 integer :: hxc^l,ixc^l,ixcp^l,jxc^l,ixcm^l
7137 integer :: idim1,idim2,idir
7138
7139 associate(bfaces=>s%ws,bfacesct=>sct%ws,x=>s%x,vbarc=>vcts%vbarC,cbarmin=>vcts%cbarmin,&
7140 cbarmax=>vcts%cbarmax)
7141
7142 ! Calculate contribution to FEM of each edge,
7143 ! that is, estimate value of line integral of
7144 ! electric field in the positive idir direction.
7145
7146 ! Loop over components of electric field
7147
7148 ! idir: electric field component we need to calculate
7149 ! idim1: directions in which we already performed the reconstruction
7150 ! idim2: directions in which we perform the reconstruction
7151
7152 ! if there is resistivity, get eta J
7153 if(mhd_eta/=zero) call get_resistive_electric_field(ixi^l,ixo^l,sct,s,e_resi)
7154
7155 ! if there is ambipolar diffusion, get E_ambi
7156 if(mhd_ambipolar_exp) call get_ambipolar_electric_field(ixi^l,ixo^l,sct%w,x,e_ambi)
7157
7158 do idir=sdim,3
7159 ! Indices
7160 ! idir: electric field component
7161 ! idim1: one surface
7162 ! idim2: the other surface
7163 ! cyclic permutation: idim1,idim2,idir=1,2,3
7164 ! Velocity components on the surface
7165 ! follow cyclic premutations:
7166 ! Sx(1),Sx(2)=y,z ; Sy(1),Sy(2)=z,x ; Sz(1),Sz(2)=x,y
7167
7168 ixcmax^d=ixomax^d;
7169 ixcmin^d=ixomin^d-1+kr(idir,^d);
7170
7171 ! Set indices and directions
7172 idim1=mod(idir,3)+1
7173 idim2=mod(idir+1,3)+1
7174
7175 jxc^l=ixc^l+kr(idim1,^d);
7176 ixcp^l=ixc^l+kr(idim2,^d);
7177
7178 ! Reconstruct transverse transport velocities
7179 call reconstruct(ixi^l,ixc^l,idim2,vbarc(ixi^s,idim1,1),&
7180 vtill(ixi^s,2),vtilr(ixi^s,2))
7181
7182 call reconstruct(ixi^l,ixc^l,idim1,vbarc(ixi^s,idim2,2),&
7183 vtill(ixi^s,1),vtilr(ixi^s,1))
7184
7185 ! Reconstruct magnetic fields
7186 ! Eventhough the arrays are larger, reconstruct works with
7187 ! the limits ixG.
7188 if(b0field) then
7189 bfacetot(ixi^s,idim1)=bfacesct(ixi^s,idim1)+block%B0(ixi^s,idim1,idim1)
7190 bfacetot(ixi^s,idim2)=bfacesct(ixi^s,idim2)+block%B0(ixi^s,idim2,idim2)
7191 else
7192 bfacetot(ixi^s,idim1)=bfacesct(ixi^s,idim1)
7193 bfacetot(ixi^s,idim2)=bfacesct(ixi^s,idim2)
7194 end if
7195 call reconstruct(ixi^l,ixc^l,idim2,bfacetot(ixi^s,idim1),&
7196 btill(ixi^s,idim1),btilr(ixi^s,idim1))
7197
7198 call reconstruct(ixi^l,ixc^l,idim1,bfacetot(ixi^s,idim2),&
7199 btill(ixi^s,idim2),btilr(ixi^s,idim2))
7200
7201 ! Take the maximum characteristic
7202
7203 cm(ixc^s,1)=max(cbarmin(ixcp^s,idim1),cbarmin(ixc^s,idim1))
7204 cp(ixc^s,1)=max(cbarmax(ixcp^s,idim1),cbarmax(ixc^s,idim1))
7205
7206 cm(ixc^s,2)=max(cbarmin(jxc^s,idim2),cbarmin(ixc^s,idim2))
7207 cp(ixc^s,2)=max(cbarmax(jxc^s,idim2),cbarmax(ixc^s,idim2))
7208
7209
7210 ! Calculate eletric field
7211 fe(ixc^s,idir)=-(cp(ixc^s,1)*vtill(ixc^s,1)*btill(ixc^s,idim2) &
7212 + cm(ixc^s,1)*vtilr(ixc^s,1)*btilr(ixc^s,idim2) &
7213 - cp(ixc^s,1)*cm(ixc^s,1)*(btilr(ixc^s,idim2)-btill(ixc^s,idim2)))&
7214 /(cp(ixc^s,1)+cm(ixc^s,1)) &
7215 +(cp(ixc^s,2)*vtill(ixc^s,2)*btill(ixc^s,idim1) &
7216 + cm(ixc^s,2)*vtilr(ixc^s,2)*btilr(ixc^s,idim1) &
7217 - cp(ixc^s,2)*cm(ixc^s,2)*(btilr(ixc^s,idim1)-btill(ixc^s,idim1)))&
7218 /(cp(ixc^s,2)+cm(ixc^s,2))
7219
7220 ! add resistive electric field at cell edges E=-vxB+eta J
7221 if(mhd_eta/=zero) fe(ixc^s,idir)=fe(ixc^s,idir)+e_resi(ixc^s,idir)
7222 ! add ambipolar electric field
7223 if(mhd_ambipolar_exp) fe(ixc^s,idir)=fe(ixc^s,idir)+e_ambi(ixc^s,idir)
7224
7225 fe(ixc^s,idir)=qdt*s%dsC(ixc^s,idir)*fe(ixc^s,idir)
7226
7227 if (.not.slab) then
7228 where(abs(x(ixc^s,r_)+half*dxlevel(r_)).lt.1.0d-9)
7229 fe(ixc^s,idir)=zero
7230 end where
7231 end if
7232
7233 end do
7234
7235 ! allow user to change inductive electric field, especially for boundary driven applications
7236 if(associated(usr_set_electric_field)) &
7237 call usr_set_electric_field(ixi^l,ixo^l,qt,qdt,fe,sct)
7238
7239 circ(ixi^s,1:ndim)=zero
7240
7241 ! Calculate circulation on each face: interal(fE dot dl)
7242 do idim1=1,ndim ! Coordinate perpendicular to face
7243 ixcmax^d=ixomax^d;
7244 ixcmin^d=ixomin^d-kr(idim1,^d);
7245 do idim2=1,ndim
7246 do idir=sdim,3 ! Direction of line integral
7247 ! Assemble indices
7248 if(lvc(idim1,idim2,idir)/=0) then
7249 hxc^l=ixc^l-kr(idim2,^d);
7250 ! Add line integrals in direction idir
7251 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
7252 +lvc(idim1,idim2,idir)&
7253 *(fe(ixc^s,idir)&
7254 -fe(hxc^s,idir))
7255 end if
7256 end do
7257 end do
7258 ! Divide by the area of the face to get dB/dt
7259 where(s%surfaceC(ixc^s,idim1) > 1.0d-9*s%dvolume(ixc^s))
7260 circ(ixc^s,idim1)=circ(ixc^s,idim1)/s%surfaceC(ixc^s,idim1)
7261 elsewhere
7262 circ(ixc^s,idim1)=zero
7263 end where
7264 ! Time update cell-face magnetic field component
7265 bfaces(ixc^s,idim1)=bfaces(ixc^s,idim1)-circ(ixc^s,idim1)
7266 end do
7267
7268 end associate
7269 end subroutine update_faces_hll
7270
7271 !> calculate eta J at cell edges
7272 subroutine get_resistive_electric_field(ixI^L,ixO^L,sCT,s,jce)
7274 use mod_usr_methods
7275 use mod_geometry
7276
7277 integer, intent(in) :: ixi^l, ixo^l
7278 type(state), intent(in) :: sct, s
7279 ! current on cell edges
7280 double precision :: jce(ixi^s,sdim:3)
7281
7282 ! current on cell centers
7283 double precision :: jcc(ixi^s,7-2*ndir:3)
7284 ! location at cell faces
7285 double precision :: xs(ixgs^t,1:ndim)
7286 ! resistivity
7287 double precision :: eta(ixi^s)
7288 double precision :: gradi(ixgs^t)
7289 integer :: ix^d,ixc^l,ixa^l,ixb^l,idir,idirmin,idim1,idim2
7290
7291 associate(x=>s%x,dx=>s%dx,w=>s%w,wct=>sct%w,wcts=>sct%ws)
7292 ! calculate current density at cell edges
7293 jce=0.d0
7294 do idim1=1,ndim
7295 do idim2=1,ndim
7296 do idir=sdim,3
7297 if (lvc(idim1,idim2,idir)==0) cycle
7298 ixcmax^d=ixomax^d;
7299 ixcmin^d=ixomin^d+kr(idir,^d)-1;
7300 ixbmax^d=ixcmax^d-kr(idir,^d)+1;
7301 ixbmin^d=ixcmin^d;
7302 ! current at transverse faces
7303 xs(ixb^s,:)=x(ixb^s,:)
7304 xs(ixb^s,idim2)=x(ixb^s,idim2)+half*dx(ixb^s,idim2)
7305 call gradientf(wcts(ixgs^t,idim2),xs,ixgs^ll,ixc^l,idim1,gradi,2)
7306 if (lvc(idim1,idim2,idir)==1) then
7307 jce(ixc^s,idir)=jce(ixc^s,idir)+gradi(ixc^s)
7308 else
7309 jce(ixc^s,idir)=jce(ixc^s,idir)-gradi(ixc^s)
7310 end if
7311 end do
7312 end do
7313 end do
7314 ! get resistivity
7315 if(mhd_eta>zero)then
7316 jce(ixi^s,:)=jce(ixi^s,:)*mhd_eta
7317 else
7318 ixa^l=ixo^l^ladd1;
7319 call get_current(wct,ixi^l,ixa^l,idirmin,jcc)
7320 call usr_special_resistivity(wct,ixi^l,ixa^l,idirmin,x,jcc,eta)
7321 ! calcuate eta on cell edges
7322 do idir=sdim,3
7323 ixcmax^d=ixomax^d;
7324 ixcmin^d=ixomin^d+kr(idir,^d)-1;
7325 jcc(ixc^s,idir)=0.d0
7326 {do ix^db=0,1\}
7327 if({ ix^d==1 .and. ^d==idir | .or.}) cycle
7328 ixamin^d=ixcmin^d+ix^d;
7329 ixamax^d=ixcmax^d+ix^d;
7330 jcc(ixc^s,idir)=jcc(ixc^s,idir)+eta(ixa^s)
7331 {end do\}
7332 jcc(ixc^s,idir)=jcc(ixc^s,idir)*0.25d0
7333 jce(ixc^s,idir)=jce(ixc^s,idir)*jcc(ixc^s,idir)
7334 end do
7335 end if
7336
7337 end associate
7338 end subroutine get_resistive_electric_field
7339
7340 !> get ambipolar electric field on cell edges
7341 subroutine get_ambipolar_electric_field(ixI^L,ixO^L,w,x,fE)
7343
7344 integer, intent(in) :: ixi^l, ixo^l
7345 double precision, intent(in) :: w(ixi^s,1:nw)
7346 double precision, intent(in) :: x(ixi^s,1:ndim)
7347 double precision, intent(out) :: fe(ixi^s,sdim:3)
7348
7349 double precision :: jxbxb(ixi^s,1:3)
7350 integer :: idir,ixa^l,ixc^l,ix^d
7351
7352 ixa^l=ixo^l^ladd1;
7353 call mhd_get_jxbxb(w,x,ixi^l,ixa^l,jxbxb)
7354 ! calcuate electric field on cell edges from cell centers
7355 do idir=sdim,3
7356 !set electric field in jxbxb: E=nuA * jxbxb, where nuA=-etaA/rho^2
7357 !jxbxb(ixA^S,i) = -(mhd_eta_ambi/w(ixA^S, rho_)**2) * jxbxb(ixA^S,i)
7358 call multiplyambicoef(ixi^l,ixa^l,jxbxb(ixi^s,idir),w,x)
7359 ixcmax^d=ixomax^d;
7360 ixcmin^d=ixomin^d+kr(idir,^d)-1;
7361 fe(ixc^s,idir)=0.d0
7362 {do ix^db=0,1\}
7363 if({ ix^d==1 .and. ^d==idir | .or.}) cycle
7364 ixamin^d=ixcmin^d+ix^d;
7365 ixamax^d=ixcmax^d+ix^d;
7366 fe(ixc^s,idir)=fe(ixc^s,idir)+jxbxb(ixa^s,idir)
7367 {end do\}
7368 fe(ixc^s,idir)=fe(ixc^s,idir)*0.25d0
7369 end do
7370
7371 end subroutine get_ambipolar_electric_field
7372
7373 !> calculate cell-center values from face-center values
7374 subroutine mhd_face_to_center(ixO^L,s)
7376 ! Non-staggered interpolation range
7377 integer, intent(in) :: ixo^l
7378 type(state) :: s
7379
7380 integer :: ix^d
7381
7382 ! calculate cell-center values from face-center values in 2nd order
7383 ! because the staggered arrays have an additional place to the left.
7384 ! Interpolate to cell barycentre using arithmetic average
7385 ! This might be done better later, to make the method less diffusive.
7386 {!dir$ ivdep
7387 do ix^db=ixomin^db,ixomax^db\}
7388 {^ifthreed
7389 s%w(ix^d,b1_)=half/s%surface(ix^d,1)*(s%ws(ix^d,1)*s%surfaceC(ix^d,1)&
7390 +s%ws(ix1-1,ix2,ix3,1)*s%surfaceC(ix1-1,ix2,ix3,1))
7391 s%w(ix^d,b2_)=half/s%surface(ix^d,2)*(s%ws(ix^d,2)*s%surfaceC(ix^d,2)&
7392 +s%ws(ix1,ix2-1,ix3,2)*s%surfaceC(ix1,ix2-1,ix3,2))
7393 s%w(ix^d,b3_)=half/s%surface(ix^d,3)*(s%ws(ix^d,3)*s%surfaceC(ix^d,3)&
7394 +s%ws(ix1,ix2,ix3-1,3)*s%surfaceC(ix1,ix2,ix3-1,3))
7395 }
7396 {^iftwod
7397 s%w(ix^d,b1_)=half/s%surface(ix^d,1)*(s%ws(ix^d,1)*s%surfaceC(ix^d,1)&
7398 +s%ws(ix1-1,ix2,1)*s%surfaceC(ix1-1,ix2,1))
7399 s%w(ix^d,b2_)=half/s%surface(ix^d,2)*(s%ws(ix^d,2)*s%surfaceC(ix^d,2)&
7400 +s%ws(ix1,ix2-1,2)*s%surfaceC(ix1,ix2-1,2))
7401 }
7402 {end do\}
7403
7404 ! calculate cell-center values from face-center values in 4th order
7405 !do idim=1,ndim
7406 ! gxO^L=ixO^L-2*kr(idim,^D);
7407 ! hxO^L=ixO^L-kr(idim,^D);
7408 ! jxO^L=ixO^L+kr(idim,^D);
7409
7410 ! ! Interpolate to cell barycentre using fourth order central formula
7411 ! w(ixO^S,mag(idim))=(0.0625d0/s%surface(ixO^S,idim))*&
7412 ! ( -ws(gxO^S,idim)*s%surfaceC(gxO^S,idim) &
7413 ! +9.0d0*ws(hxO^S,idim)*s%surfaceC(hxO^S,idim) &
7414 ! +9.0d0*ws(ixO^S,idim)*s%surfaceC(ixO^S,idim) &
7415 ! -ws(jxO^S,idim)*s%surfaceC(jxO^S,idim) )
7416 !end do
7417
7418 ! calculate cell-center values from face-center values in 6th order
7419 !do idim=1,ndim
7420 ! fxO^L=ixO^L-3*kr(idim,^D);
7421 ! gxO^L=ixO^L-2*kr(idim,^D);
7422 ! hxO^L=ixO^L-kr(idim,^D);
7423 ! jxO^L=ixO^L+kr(idim,^D);
7424 ! kxO^L=ixO^L+2*kr(idim,^D);
7425
7426 ! ! Interpolate to cell barycentre using sixth order central formula
7427 ! w(ixO^S,mag(idim))=(0.00390625d0/s%surface(ixO^S,idim))* &
7428 ! ( +3.0d0*ws(fxO^S,idim)*s%surfaceC(fxO^S,idim) &
7429 ! -25.0d0*ws(gxO^S,idim)*s%surfaceC(gxO^S,idim) &
7430 ! +150.0d0*ws(hxO^S,idim)*s%surfaceC(hxO^S,idim) &
7431 ! +150.0d0*ws(ixO^S,idim)*s%surfaceC(ixO^S,idim) &
7432 ! -25.0d0*ws(jxO^S,idim)*s%surfaceC(jxO^S,idim) &
7433 ! +3.0d0*ws(kxO^S,idim)*s%surfaceC(kxO^S,idim) )
7434 !end do
7435
7436 end subroutine mhd_face_to_center
7437
7438 !> calculate magnetic field from vector potential
7439 subroutine b_from_vector_potential(ixIs^L, ixI^L, ixO^L, ws, x)
7442
7443 integer, intent(in) :: ixis^l, ixi^l, ixo^l
7444 double precision, intent(inout) :: ws(ixis^s,1:nws)
7445 double precision, intent(in) :: x(ixi^s,1:ndim)
7446
7447 double precision :: adummy(ixis^s,1:3)
7448
7449 call b_from_vector_potentiala(ixis^l, ixi^l, ixo^l, ws, x, adummy)
7450
7451 end subroutine b_from_vector_potential
7452
7453 subroutine rfactor_from_temperature_ionization(w,x,ixI^L,ixO^L,Rfactor)
7456 integer, intent(in) :: ixi^l, ixo^l
7457 double precision, intent(in) :: w(ixi^s,1:nw)
7458 double precision, intent(in) :: x(ixi^s,1:ndim)
7459 double precision, intent(out):: rfactor(ixi^s)
7460
7461 double precision :: iz_h(ixo^s),iz_he(ixo^s)
7462
7463 call ionization_degree_from_temperature(ixi^l,ixo^l,w(ixi^s,te_),iz_h,iz_he)
7464 ! assume the first and second ionization of Helium have the same degree
7465 rfactor(ixo^s)=(1.d0+iz_h(ixo^s)+0.1d0*(1.d0+iz_he(ixo^s)*(1.d0+iz_he(ixo^s))))/(2.d0+3.d0*he_abundance)
7466
7467 end subroutine rfactor_from_temperature_ionization
7468
7469 subroutine rfactor_from_constant_ionization(w,x,ixI^L,ixO^L,Rfactor)
7471 integer, intent(in) :: ixi^l, ixo^l
7472 double precision, intent(in) :: w(ixi^s,1:nw)
7473 double precision, intent(in) :: x(ixi^s,1:ndim)
7474 double precision, intent(out):: rfactor(ixi^s)
7475
7476 rfactor(ixo^s)=rr
7477
7478 end subroutine rfactor_from_constant_ionization
7479end module mod_mhd_phys
Module to include CAK radiation line force in (magneto)hydrodynamic models Computes both the force fr...
subroutine cak_get_dt(w, ixil, ixol, dtnew, dxd, x)
Check time step for total radiation contribution.
subroutine cak_init(phys_gamma)
Initialize the module.
subroutine cak_add_source(qdt, ixil, ixol, wct, w, x, energy, qsourcesplit, active)
w[iw]=w[iw]+qdt*S[wCT,qtC,x] where S is the source based on wCT within ixO
subroutine, public mpistop(message)
Exit MPI-AMRVAC with an error message.
Module for physical and numeric constants.
double precision, parameter bigdouble
A very large real number.
subroutine reconstruct(ixil, ixcl, idir, q, ql, qr)
Reconstruct scalar q within ixO^L to 1/2 dx in direction idir Return both left and right reconstructe...
subroutine b_from_vector_potentiala(ixisl, ixil, ixol, ws, x, a)
calculate magnetic field from vector potential A at cell edges
subroutine add_convert_method(phys_convert_vars, nwc, dataset_names, file_suffix)
Definition mod_convert.t:59
Module for flux conservation near refinement boundaries.
subroutine, public store_flux(igrid, fc, idimlim, nwfluxin)
subroutine, public store_edge(igrid, ixil, fe, idimlim)
Module with basic grid data structures.
Definition mod_forest.t:2
type(tree_node_ptr), dimension(:,:), allocatable, save igrid_to_node
Array to go from an [igrid, ipe] index to a node pointer.
Definition mod_forest.t:32
subroutine, public get_divb(w, ixil, ixol, divb, nth_in)
Calculate div B within ixO.
integer, dimension(:), allocatable, public mag
Indices of the magnetic field.
Module with geometry-related routines (e.g., divergence, curl)
Definition mod_geometry.t:2
subroutine divvector(qvec, ixil, ixol, divq, nth_in)
integer coordinate
Definition mod_geometry.t:7
integer, parameter cylindrical
subroutine curlvector(qvec, ixil, ixol, curlvec, idirmin, idirmin0, ndir0, fourthorder)
Calculate curl of a vector qvec within ixL Options to employ standard second order CD evaluations use...
subroutine gradient(q, ixil, ixol, idir, gradq, nth_in)
subroutine gradientf(q, x, ixil, ixol, idir, gradq, nth_in, pm_in)
subroutine gradientl(q, ixil, ixol, idir, gradq)
This module contains definitions of global parameters and variables and some generic functions/subrou...
type(state), pointer block
Block pointer for using one block and its previous state.
double precision dtdiffpar
For resistive MHD, the time step is also limited by the diffusion time: .
character(len=std_len) typegrad
double precision unit_charge
Physical scaling factor for charge.
integer ixghi
Upper index of grid block arrays.
pure subroutine cross_product(ixil, ixol, a, b, axb)
Cross product of two vectors.
integer, dimension(3, 3, 3) lvc
Levi-Civita tensor.
double precision unit_time
Physical scaling factor for time.
double precision unit_density
Physical scaling factor for density.
integer, parameter unitpar
file handle for IO
double precision unit_mass
Physical scaling factor for mass.
integer, dimension(3, 3) kr
Kronecker delta tensor.
integer, dimension(:, :), allocatable typeboundary
Array indicating the type of boundary condition per variable and per physical boundary.
double precision unit_numberdensity
Physical scaling factor for number density.
character(len=std_len) convert_type
Which format to use when converting.
double precision unit_pressure
Physical scaling factor for pressure.
integer, parameter ndim
Number of spatial dimensions for grid variables.
double precision unit_length
Physical scaling factor for length.
logical stagger_grid
True for using stagger grid.
double precision cmax_global
global fastest wave speed needed in fd scheme and glm method
logical use_particles
Use particles module or not.
character(len=std_len), dimension(:), allocatable par_files
Which par files are used as input.
integer icomm
The MPI communicator.
double precision bdip
amplitude of background dipolar, quadrupolar, octupolar, user's field
integer b0i
background magnetic field location indicator
integer mype
The rank of the current MPI task.
double precision, dimension(:), allocatable, parameter d
logical local_timestep
each cell has its own timestep or not
double precision dt
global time step
integer ndir
Number of spatial dimensions (components) for vector variables.
integer ixm
the mesh range of a physical block without ghost cells
integer ierrmpi
A global MPI error return code.
logical autoconvert
If true, already convert to output format during the run.
logical slab
Cartesian geometry or not.
integer, parameter bc_periodic
integer, parameter bc_special
boundary condition types
double precision unit_magneticfield
Physical scaling factor for magnetic field.
double precision unit_velocity
Physical scaling factor for velocity.
double precision c_norm
Normalised speed of light.
logical b0field
split magnetic field as background B0 field
double precision, dimension(:,:), allocatable rnode
Corner coordinates.
double precision unit_temperature
Physical scaling factor for temperature.
logical si_unit
Use SI units (.true.) or use cgs units (.false.)
double precision, dimension(:,:), allocatable dx
integer nghostcells
Number of ghost cells surrounding a grid.
integer, parameter sdim
starting dimension for electric field
logical phys_trac
Use TRAC for MHD or 1D HD.
logical need_global_cmax
need global maximal wave speed
logical convert
If true and restart_from_file is given, convert snapshots to other file formats.
logical fix_small_values
fix small values with average or replace methods
double precision, dimension(^nd) dxlevel
store unstretched cell size of current level
logical use_multigrid
Use multigrid (only available in 2D and 3D)
logical slab_uniform
uniform Cartesian geometry or not (stretched Cartesian)
integer max_blocks
The maximum number of grid blocks in a processor.
integer r_
Indices for cylindrical coordinates FOR TESTS, negative value when not used:
integer boundspeed
bound (left/min and right.max) speed of Riemann fan
integer, parameter unitconvert
integer number_equi_vars
number of equilibrium set variables, besides the mag field
integer, parameter ixglo
Lower index of grid block arrays (always 1)
Module for including gravity in (magneto)hydrodynamics simulations.
Definition mod_gravity.t:2
subroutine gravity_get_dt(w, ixil, ixol, dtnew, dxd, x)
Definition mod_gravity.t:87
subroutine gravity_init()
Initialize the module.
Definition mod_gravity.t:26
subroutine gravity_add_source(qdt, ixil, ixol, wct, wctprim, w, x, energy, rhov, qsourcesplit, active)
w[iw]=w[iw]+qdt*S[wCT,qtC,x] where S is the source based on wCT within ixO
Definition mod_gravity.t:43
module ionization degree - get ionization degree for given temperature
subroutine ionization_degree_from_temperature(ixil, ixol, te, iz_h, iz_he)
module mod_magnetofriction.t Purpose: use magnetofrictional method to relax 3D magnetic field to forc...
subroutine magnetofriction_init()
Initialize the module.
Magneto-hydrodynamics module.
Definition mod_mhd_phys.t:2
integer, public, protected c_
logical, public, protected mhd_gravity
Whether gravity is added.
logical, public has_equi_rho0
whether split off equilibrium density
logical, public, protected mhd_internal_e
Whether internal energy is solved instead of total energy.
logical, public, protected mhd_glm_extended
Whether extended GLM-MHD is used with additional sources.
character(len=std_len), public, protected type_ct
Method type of constrained transport.
integer, dimension(:), allocatable, public, protected mom
Indices of the momentum density.
subroutine, public mhd_clean_divb_multigrid(qdt, qt, active)
logical, public, protected mhd_hyperbolic_thermal_conduction
Whether thermal conduction is used.
logical, public, protected mhd_radiative_cooling
Whether radiative cooling is added.
subroutine, public mhd_e_to_ei(ixil, ixol, w, x)
Transform total energy to internal energy.
double precision, public mhd_adiab
The adiabatic constant.
logical, public, protected mhd_partial_ionization
Whether plasma is partially ionized.
double precision, public mhd_eta_hyper
The MHD hyper-resistivity.
double precision, public, protected rr
double precision, public, protected h_ion_fr
Ionization fraction of H H_ion_fr = H+/(H+ + H)
double precision, public mhd_gamma
The adiabatic index.
integer, public, protected mhd_trac_finegrid
Distance between two adjacent traced magnetic field lines (in finest cell size)
subroutine, public get_normalized_divb(w, ixil, ixol, divb)
get dimensionless div B = |divB| * volume / area / |B|
type(tc_fluid), allocatable, public tc_fl
type of fluid for thermal conduction
logical, public, protected mhd_rotating_frame
Whether rotating frame is activated.
logical, public, protected mhd_semirelativistic
Whether semirelativistic MHD equations (Gombosi 2002 JCP) are solved.
integer, public, protected mhd_divb_nth
Whether divB is computed with a fourth order approximation.
integer, public, protected q_
Index of the heat flux q.
integer, public, protected mhd_n_tracer
Number of tracer species.
integer, public, protected te_
Indices of temperature.
integer, public, protected m
integer, public equi_rho0_
equi vars indices in the stateequi_vars array
integer, public, protected mhd_trac_type
Which TRAC method is used.
logical, public, protected mhd_cak_force
Whether CAK radiation line force is activated.
logical, public, protected source_split_divb
Whether divB cleaning sources are added splitting from fluid solver.
logical, public, protected mhd_hall
Whether Hall-MHD is used.
type(te_fluid), allocatable, public te_fl_mhd
type of fluid for thermal emission synthesis
logical, public, protected mhd_ambipolar
Whether Ambipolar term is used.
double precision, public hypertc_kappa
The thermal conductivity kappa in hyperbolic thermal conduction.
double precision, public mhd_glm_alpha
GLM-MHD parameter: ratio of the diffusive and advective time scales for div b taking values within [0...
double precision function, dimension(ixo^s), public mhd_mag_en_all(w, ixil, ixol)
Compute 2 times total magnetic energy.
subroutine, public multiplyambicoef(ixil, ixol, res, w, x)
multiply res by the ambipolar coefficient The ambipolar coefficient is calculated as -mhd_eta_ambi/rh...
logical, public partial_energy
Whether an internal or hydrodynamic energy equation is used.
subroutine, public b_from_vector_potential(ixisl, ixil, ixol, ws, x)
calculate magnetic field from vector potential
double precision, public, protected he_ion_fr
Ionization fraction of He He_ion_fr = (He2+ + He+)/(He2+ + He+ + He)
logical, public, protected mhd_viscosity
Whether viscosity is added.
double precision, public, protected mhd_reduced_c
Reduced speed of light for semirelativistic MHD: 2% of light speed.
logical, public, protected mhd_energy
Whether an energy equation is used.
logical, public, protected mhd_ambipolar_exp
Whether Ambipolar term is implemented explicitly.
logical, public, protected mhd_glm
Whether GLM-MHD is used to control div B.
logical, public clean_initial_divb
clean initial divB
procedure(sub_convert), pointer, public mhd_to_conserved
double precision, public mhd_eta
The MHD resistivity.
logical, public divbwave
Add divB wave in Roe solver.
logical, public, protected mhd_magnetofriction
Whether magnetofriction is added.
double precision, public, protected mhd_trac_mask
Height of the mask used in the TRAC method.
procedure(mask_subroutine), pointer, public usr_mask_ambipolar
character(len=std_len), public, protected typedivbfix
Method type to clean divergence of B.
logical, public, protected mhd_thermal_conduction
Whether thermal conduction is used.
procedure(sub_get_pthermal), pointer, public mhd_get_temperature
integer, public equi_pe0_
integer, public, protected p_
Index of the gas pressure (-1 if not present) should equal e_.
integer, public, protected c
Indices of the momentum density for the form of better vectorization.
double precision, public, protected he_ion_fr2
Ratio of number He2+ / number He+ + He2+ He_ion_fr2 = He2+/(He2+ + He+)
procedure(sub_convert), pointer, public mhd_to_primitive
logical, public has_equi_pe0
whether split off equilibrium thermal pressure
logical, public, protected mhd_dump_full_vars
whether dump full variables (when splitting is used) in a separate dat file
logical, public, protected mhd_particles
Whether particles module is added.
integer, public, protected b
subroutine, public mhd_face_to_center(ixol, s)
calculate cell-center values from face-center values
logical, dimension(2 *^nd), public, protected boundary_divbfix
To control divB=0 fix for boundary.
subroutine, public get_current(w, ixil, ixol, idirmin, current)
Calculate idirmin and the idirmin:3 components of the common current array make sure that dxlevel(^D)...
double precision, public mhd_etah
Hall resistivity.
subroutine, public mhd_get_v(w, x, ixil, ixol, v)
Calculate v vector.
double precision, public mhd_eta_ambi
The MHD ambipolar coefficient.
logical, public, protected mhd_hydrodynamic_e
Whether hydrodynamic energy is solved instead of total energy.
subroutine, public mhd_phys_init()
logical, public, protected mhd_trac
Whether TRAC method is used.
logical, public, protected eq_state_units
type(rc_fluid), allocatable, public rc_fl
type of fluid for radiative cooling
integer, dimension(:), allocatable, public, protected tracer
Indices of the tracers.
integer, public, protected rho_
Index of the density (in the w array)
logical, public, protected b0field_forcefree
B0 field is force-free.
integer, dimension(2 *^nd), public, protected boundary_divbfix_skip
To skip * layer of ghost cells during divB=0 fix for boundary.
integer, public, protected tweight_
logical, public, protected mhd_ambipolar_sts
Whether Ambipolar term is implemented using supertimestepping.
procedure(sub_get_pthermal), pointer, public mhd_get_pthermal
subroutine, public mhd_ei_to_e(ixil, ixol, w, x)
Transform internal energy to total energy.
integer, public, protected e_
Index of the energy density (-1 if not present)
double precision, public, protected he_abundance
Helium abundance over Hydrogen.
logical, public, protected mhd_4th_order
MHD fourth order.
integer, public, protected tcoff_
Index of the cutoff temperature for the TRAC method.
subroutine, public mhd_get_rho(w, x, ixil, ixol, rho)
integer, public, protected psi_
Indices of the GLM psi.
logical, public mhd_equi_thermal
Module to couple the octree-mg library to AMRVAC. This file uses the VACPP preprocessor,...
type(mg_t) mg
Data structure containing the multigrid tree.
Module containing all the particle routines.
subroutine particles_init()
Initialize particle data and parameters.
This module defines the procedures of a physics module. It contains function pointers for the various...
Definition mod_physics.t:4
module radiative cooling – add optically thin radiative cooling for HD and MHD
subroutine radiative_cooling_init_params(phys_gamma, he_abund)
Radiative cooling initialization.
subroutine cooling_get_dt(w, ixil, ixol, dtnew, dxd, x, fl)
subroutine radiative_cooling_init(fl, read_params)
subroutine radiative_cooling_add_source(qdt, ixil, ixol, wct, wctprim, w, x, qsourcesplit, active, fl)
Module for including rotating frame in (magneto)hydrodynamics simulations The rotation vector is assu...
subroutine rotating_frame_add_source(qdt, dtfactor, ixil, ixol, wct, w, x)
w[iw]=w[iw]+qdt*S[wCT,qtC,x] where S is the source based on wCT within ixO
subroutine rotating_frame_init()
Initialize the module.
Module for handling problematic values in simulations, such as negative pressures.
subroutine, public small_values_average(ixil, ixol, w, x, w_flag, windex)
logical, public trace_small_values
trace small values in the source file using traceback flag of compiler
subroutine, public small_values_error(wprim, x, ixil, ixol, w_flag, subname)
logical, dimension(:), allocatable, public small_values_fix_iw
Whether to apply small value fixes to certain variables.
character(len=20), public small_values_method
How to handle small values.
Generic supertimestepping method 1) in amrvac.par in sts_list set the following parameters which have...
subroutine, public add_sts_method(sts_getdt, sts_set_sources, startvar, nflux, startwbc, nwbc, evolve_b)
subroutine which added programatically a term to be calculated using STS Params: sts_getdt function c...
subroutine, public set_conversion_methods_to_head(sts_before_first_cycle, sts_after_last_cycle)
Set the hooks called before the first cycle and after the last cycle in the STS update This method sh...
subroutine, public set_error_handling_to_head(sts_error_handling)
Set the hook of error handling in the STS update. This method is called before updating the BC....
subroutine, public sts_init()
Initialize sts module.
Thermal conduction for HD and MHD or RHD and RMHD or twofl (plasma-neutral) module Adaptation of mod_...
double precision function, public get_tc_dt_mhd(w, ixil, ixol, dxd, x, fl)
Get the explicut timestep for the TC (mhd implementation)
subroutine tc_init_params(phys_gamma)
subroutine, public sts_set_source_tc_mhd(ixil, ixol, w, x, wres, fix_conserve_at_step, my_dt, igrid, nflux, fl)
anisotropic thermal conduction with slope limited symmetric scheme Sharma 2007 Journal of Computation...
subroutine, public tc_get_mhd_params(fl, read_mhd_params)
Init TC coefficients: MHD case.
subroutine get_euv_image(qunit, fl)
subroutine get_sxr_image(qunit, fl)
subroutine get_euv_spectrum(qunit, fl)
subroutine get_whitelight_image(qunit, fl)
Module with all the methods that users can customize in AMRVAC.
procedure(rfactor), pointer usr_rfactor
procedure(special_resistivity), pointer usr_special_resistivity
procedure(phys_gravity), pointer usr_gravity
procedure(set_equi_vars), pointer usr_set_equi_vars
procedure(set_electric_field), pointer usr_set_electric_field
The module add viscous source terms and check time step.
subroutine viscosity_add_source(qdt, ixil, ixol, wct, w, x, energy, qsourcesplit, active)
subroutine viscosity_init(phys_wider_stencil)
Initialize the module.
subroutine viscosity_get_dt(w, ixil, ixol, dtnew, dxd, x)
The data structure that contains information about a tree node/grid block.
Definition mod_forest.t:11