MPI-AMRVAC 3.1
The MPI - Adaptive Mesh Refinement - Versatile Advection Code (development version)
Loading...
Searching...
No Matches
mod_rmhd_phys.t
Go to the documentation of this file.
1!> Radiation-magneto-hydrodynamics module
3
4#include "amrvac.h"
5
6 use mod_global_parameters, only: std_len, const_c
10 use mod_comm_lib, only: mpistop
12
13 implicit none
14 private
15
16 !> The adiabatic index
17 double precision, public :: rmhd_gamma = 5.d0/3.0d0
18 !> The adiabatic constant
19 double precision, public :: rmhd_adiab = 1.0d0
20 !> The MHD resistivity
21 double precision, public :: rmhd_eta = 0.0d0
22 !> The MHD hyper-resistivity
23 double precision, public :: rmhd_eta_hyper = 0.0d0
24 !> Hall resistivity
25 double precision, public :: rmhd_etah = 0.0d0
26 !> The small_est allowed energy
27 double precision, protected :: small_e
28 !> The smallest allowed radiation energy
29 double precision, public, protected :: small_r_e = 0.d0
30 !> Height of the mask used in the TRAC method
31 double precision, public, protected :: rmhd_trac_mask = 0.d0
32 !> GLM-MHD parameter: ratio of the diffusive and advective time scales for div b
33 !> taking values within [0, 1]
34 double precision, public :: rmhd_glm_alpha = 0.5d0
35 !> The thermal conductivity kappa in hyperbolic thermal conduction
36 double precision, public :: hypertc_kappa
37 !> Coefficient of diffusive divB cleaning
38 double precision :: divbdiff = 0.8d0
39 !> Helium abundance over Hydrogen
40 double precision, public, protected :: he_abundance=0.1d0
41 !> Ionization fraction of H
42 !> H_ion_fr = H+/(H+ + H)
43 double precision, public, protected :: h_ion_fr=1d0
44 !> Ionization fraction of He
45 !> He_ion_fr = (He2+ + He+)/(He2+ + He+ + He)
46 double precision, public, protected :: he_ion_fr=1d0
47 !> Ratio of number He2+ / number He+ + He2+
48 !> He_ion_fr2 = He2+/(He2+ + He+)
49 double precision, public, protected :: he_ion_fr2=1d0
50 ! used for eq of state when it is not defined by units,
51 ! the units do not contain terms related to ionization fraction
52 ! and it is p = RR * rho * T
53 double precision, public, protected :: rr=1d0
54 !> gamma minus one and its inverse
55 double precision :: gamma_1, inv_gamma_1
56 !> inverse of squared speed of light c0 and reduced speed of light c
57 double precision :: inv_squared_c0, inv_squared_c
58 !> equi vars indices in the state%equi_vars array
59 integer, public :: equi_rho0_ = -1
60 integer, public :: equi_pe0_ = -1
61 !> Number of tracer species
62 integer, public, protected :: rmhd_n_tracer = 0
63 !> Index of the density (in the w array)
64 integer, public, protected :: rho_
65 !> Indices of the momentum density
66 integer, allocatable, public, protected :: mom(:)
67 !> Indices of the momentum density for the form of better vectorization
68 integer, public, protected :: ^c&m^C_
69 !> Index of the energy density (-1 if not present)
70 integer, public, protected :: e_
71 !> Index of the radiation energy
72 integer, public, protected :: r_e
73 !> Indices of the momentum density for the form of better vectorization
74 integer, public, protected :: ^c&b^C_
75 !> Index of the gas pressure (-1 if not present) should equal e_
76 integer, public, protected :: p_
77 !> Index of the heat flux q
78 integer, public, protected :: q_
79 !> Indices of the GLM psi
80 integer, public, protected :: psi_
81 !> Indices of temperature
82 integer, public, protected :: te_
83 !> Index of the cutoff temperature for the TRAC method
84 integer, public, protected :: tcoff_
85 integer, public, protected :: tweight_
86 !> Indices of the tracers
87 integer, allocatable, public, protected :: tracer(:)
88 !> The number of waves
89 integer :: nwwave=8
90 !> Method type in a integer for good performance
91 integer :: type_divb
92 !> To skip * layer of ghost cells during divB=0 fix for boundary
93 integer, public, protected :: boundary_divbfix_skip(2*^nd)=0
94 ! DivB cleaning methods
95 integer, parameter :: divb_none = 0
96 integer, parameter :: divb_multigrid = -1
97 integer, parameter :: divb_glm = 1
98 integer, parameter :: divb_powel = 2
99 integer, parameter :: divb_janhunen = 3
100 integer, parameter :: divb_linde = 4
101 integer, parameter :: divb_lindejanhunen = 5
102 integer, parameter :: divb_lindepowel = 6
103 integer, parameter :: divb_lindeglm = 7
104 integer, parameter :: divb_ct = 8
105 !> Whether an energy equation is used
106 logical, public, protected :: rmhd_energy = .true.
107 !> Whether thermal conduction is used
108 logical, public, protected :: rmhd_thermal_conduction = .false.
109 !> Whether thermal conduction is used
110 logical, public, protected :: rmhd_hyperbolic_thermal_conduction = .false.
111 !> Whether viscosity is added
112 logical, public, protected :: rmhd_viscosity = .false.
113 !> Whether gravity is added
114 logical, public, protected :: rmhd_gravity = .false.
115 !> Whether particles module is added
116 logical, public, protected :: rmhd_particles = .false.
117 !> Whether GLM-MHD is used to control div B
118 logical, public, protected :: rmhd_glm = .false.
119 !> Whether extended GLM-MHD is used with additional sources
120 logical, public, protected :: rmhd_glm_extended = .true.
121 !> Whether TRAC method is used
122 logical, public, protected :: rmhd_trac = .false.
123 !> Which TRAC method is used
124 integer, public, protected :: rmhd_trac_type=1
125 !> Distance between two adjacent traced magnetic field lines (in finest cell size)
126 integer, public, protected :: rmhd_trac_finegrid=4
127 !> Whether divB cleaning sources are added splitting from fluid solver
128 logical, public, protected :: source_split_divb = .false.
129 !> Whether plasma is partially ionized
130 logical, public, protected :: rmhd_partial_ionization = .false.
131 !> Whether CAK radiation line force is activated
132 logical, public, protected :: rmhd_cak_force = .false.
133 !> MHD fourth order
134 logical, public, protected :: rmhd_4th_order = .false.
135 !> whether split off equilibrium density
136 logical, public :: has_equi_rho0 = .false.
137 !> whether split off equilibrium thermal pressure
138 logical, public :: has_equi_pe0 = .false.
139 logical, public :: rmhd_equi_thermal = .false.
140 !> whether dump full variables (when splitting is used) in a separate dat file
141 logical, public, protected :: rmhd_dump_full_vars = .false.
142 !> Whether divB is computed with a fourth order approximation
143 integer, public, protected :: rmhd_divb_nth = 1
144 !> Use a compact way to add resistivity
145 logical :: compactres = .false.
146 !> Add divB wave in Roe solver
147 logical, public :: divbwave = .true.
148 !> clean initial divB
149 logical, public :: clean_initial_divb = .false.
150 !> Formalism to treat radiation
151 character(len=8), public :: rmhd_radiation_formalism = 'fld'
152 !> In the case of no rmhd_energy, how to compute pressure
153 character(len=8), public :: rmhd_pressure = 'Trad'
154 !> Treat radiation fld_Rad_force
155 logical, public, protected :: rmhd_radiation_force = .true.
156 !> Treat radiation-gas energy interaction
157 logical, public, protected :: rmhd_energy_interact = .true.
158 !> Treat radiation energy diffusion
159 logical, public, protected :: rmhd_radiation_diffusion = .true.
160 !> Treat radiation advection
161 logical, public, protected :: rmhd_radiation_advection = .true.
162 !> Do a running mean over the radiation pressure when determining dt
163 logical, protected :: radio_acoustic_filter = .false.
164 integer, protected :: size_ra_filter = 1
165 !> kb/(m_p mu)* 1/a_rad**4,
166 double precision, public :: kbmpmua4
167 !> Use the speed of light to calculate the timestep, usefull for debugging
168 logical :: dt_c = .false.
169 ! remove the below flag and assume default value = .false.
170 ! when eq state properly implemented everywhere
171 ! and not anymore through units
172 logical, public, protected :: eq_state_units = .true.
173 !> To control divB=0 fix for boundary
174 logical, public, protected :: boundary_divbfix(2*^nd)=.true.
175 !> B0 field is force-free
176 logical, public, protected :: b0field_forcefree=.true.
177 !> Whether an total energy equation is used
178 logical :: total_energy = .true.
179 !> Whether an internal or hydrodynamic energy equation is used
180 logical, public :: partial_energy = .false.
181 !> Whether gravity work is included in energy equation
182 logical :: gravity_energy
183 !> gravity work is calculated use density times velocity or conservative momentum
184 logical :: gravity_rhov = .false.
185 !> Method type to clean divergence of B
186 character(len=std_len), public, protected :: typedivbfix = 'linde'
187 !> Method type of constrained transport
188 character(len=std_len), public, protected :: type_ct = 'uct_contact'
189 !> Update all equations due to divB cleaning
190 character(len=std_len) :: typedivbdiff = 'all'
191 !> type of fluid for thermal conduction
192 type(tc_fluid), public, allocatable :: tc_fl
193 !> type of fluid for thermal emission synthesis
194 type(te_fluid), public, allocatable :: te_fl_rmhd
195
196 procedure(sub_convert), pointer :: rmhd_to_primitive => null()
197 procedure(sub_convert), pointer :: rmhd_to_conserved => null()
198 procedure(sub_small_values), pointer :: rmhd_handle_small_values => null()
199 procedure(sub_get_pthermal), pointer :: rmhd_get_pthermal => null()
200 procedure(sub_get_pthermal), pointer :: rmhd_get_rfactor => null()
201 procedure(sub_get_pthermal), pointer :: rmhd_get_temperature=> null()
202 ! Public methods
203 public :: rmhd_phys_init
204 public :: rmhd_get_pthermal
205 public :: rmhd_get_temperature
206 public :: rmhd_get_v
207 public :: rmhd_get_rho
208 public :: rmhd_to_conserved
209 public :: rmhd_to_primitive
210 public :: rmhd_e_to_ei
211 public :: rmhd_ei_to_e
212 public :: rmhd_face_to_center
213 public :: get_divb
214 public :: get_current
215 public :: get_normalized_divb
217 public :: rmhd_mag_en_all
218 {^nooned
220 }
221 public :: rmhd_get_pradiation
223 public :: rmhd_get_tgas
224 public :: rmhd_get_trad
225 public :: rmhd_set_mg_bounds
226
227contains
228
229 !> Read this module"s parameters from a file
230 subroutine rmhd_read_params(files)
232 use mod_particles, only: particles_eta, particles_etah
233 character(len=*), intent(in) :: files(:)
234 integer :: n
235
236 namelist /rmhd_list/ rmhd_energy, rmhd_n_tracer, rmhd_gamma, rmhd_adiab,&
240 typedivbdiff, type_ct, compactres, divbwave, he_abundance,&
243 particles_eta, particles_etah,has_equi_rho0, has_equi_pe0,rmhd_equi_thermal,&
249 rmhd_radiation_advection, radio_acoustic_filter, size_ra_filter, dt_c
250
251 do n = 1, size(files)
252 open(unitpar, file=trim(files(n)), status="old")
253 read(unitpar, rmhd_list, end=111)
254111 close(unitpar)
255 end do
256
257 end subroutine rmhd_read_params
258
259 !> Write this module's parameters to a snapsoht
260 subroutine rmhd_write_info(fh)
262 integer, intent(in) :: fh
263 integer :: er
264 integer, parameter :: n_par = 1
265 double precision :: values(n_par)
266 integer, dimension(MPI_STATUS_SIZE) :: st
267 character(len=name_len) :: names(n_par)
268
269 call mpi_file_write(fh, n_par, 1, mpi_integer, st, er)
270
271 names(1) = "gamma"
272 values(1) = rmhd_gamma
273 call mpi_file_write(fh, values, n_par, mpi_double_precision, st, er)
274 call mpi_file_write(fh, names, n_par * name_len, mpi_character, st, er)
275 end subroutine rmhd_write_info
276
277 subroutine rmhd_phys_init()
281 use mod_gravity, only: gravity_init
282 use mod_particles, only: particles_init, particles_eta, particles_etah
283 use mod_fld
284 use mod_afld
287 use mod_cak_force, only: cak_init
290 {^nooned
292 }
293
294 integer :: itr, idir
295
296 call rmhd_read_params(par_files)
297
298 if(.not.eq_state_units) then
301 if(mype==0) write(*,*) 'WARNING: set rmhd_partial_ionization=F when eq_state_units=F'
302 end if
303 end if
304
307 if(mype==0) write(*,*) 'WARNING: turn off parabolic TC when using hyperbolic TC'
308 end if
309
310 physics_type = "rmhd"
311 phys_energy=rmhd_energy
314 phys_partial_ionization=rmhd_partial_ionization
315
316 phys_gamma = rmhd_gamma
318
319 if(rmhd_energy) then
320 partial_energy=.false.
321 total_energy=.true.
322 else
323 total_energy=.false.
324 end if
325 phys_total_energy=total_energy
326 if(rmhd_energy) then
327 gravity_energy=.true.
328 if(has_equi_rho0) then
329 gravity_rhov=.true.
330 end if
331 else
332 gravity_energy=.false.
333 end if
334
335 {^ifoned
336 if(rmhd_trac .and. rmhd_trac_type .gt. 2) then
338 if(mype==0) write(*,*) 'WARNING: reset rmhd_trac_type=1 for 1D simulation'
339 end if
340 }
341 if(rmhd_trac .and. rmhd_trac_type .le. 4) then
342 rmhd_trac_mask=bigdouble
343 if(mype==0) write(*,*) 'WARNING: set rmhd_trac_mask==bigdouble for global TRAC method'
344 end if
346
347 ! set default gamma for polytropic/isothermal process
349 if(ndim==1) typedivbfix='none'
350 select case (typedivbfix)
351 case ('none')
352 type_divb = divb_none
353 {^nooned
354 case ('multigrid')
355 type_divb = divb_multigrid
356 use_multigrid = .true.
357 mg%operator_type = mg_laplacian
358 phys_global_source_after => rmhd_clean_divb_multigrid
359 }
360 case ('glm')
361 rmhd_glm = .true.
362 need_global_cmax = .true.
363 type_divb = divb_glm
364 case ('powel', 'powell')
365 type_divb = divb_powel
366 case ('janhunen')
367 type_divb = divb_janhunen
368 case ('linde')
369 type_divb = divb_linde
370 case ('lindejanhunen')
371 type_divb = divb_lindejanhunen
372 case ('lindepowel')
373 type_divb = divb_lindepowel
374 case ('lindeglm')
375 rmhd_glm = .true.
376 need_global_cmax = .true.
377 type_divb = divb_lindeglm
378 case ('ct')
379 type_divb = divb_ct
380 stagger_grid = .true.
381 case default
382 call mpistop('Unknown divB fix')
383 end select
384
385 allocate(start_indices(number_species),stop_indices(number_species))
386 ! set the index of the first flux variable for species 1
387 start_indices(1)=1
388 ! Determine flux variables
389 rho_ = var_set_rho()
390
391 allocate(mom(ndir))
392 mom(:) = var_set_momentum(ndir)
393 m^c_=mom(^c);
394
395 ! Set index of energy variable
396 if (rmhd_energy) then
397 nwwave = 8
398 e_ = var_set_energy() ! energy density
399 p_ = e_ ! gas pressure
400 else
401 nwwave = 7
402 e_ = -1
403 p_ = -1
404 end if
405
406 allocate(mag(ndir))
407 mag(:) = var_set_bfield(ndir)
408 b^c_=mag(^c);
409
410 if (rmhd_glm) then
411 psi_ = var_set_fluxvar('psi', 'psi', need_bc=.false.)
412 else
413 psi_ = -1
414 end if
415
416 !> set radiation energy
417 r_e = var_set_radiation_energy()
418
420 ! hyperbolic thermal conduction flux q
421 q_ = var_set_q()
422 need_global_cmax=.true.
423 else
424 q_=-1
425 end if
426
427 allocate(tracer(rmhd_n_tracer))
428 ! Set starting index of tracers
429 do itr = 1, rmhd_n_tracer
430 tracer(itr) = var_set_fluxvar("trc", "trp", itr, need_bc=.false.)
431 end do
432
433 !if(rmhd_hyperbolic_thermal_conduction) then
434 ! ! hyperbolic thermal conduction flux q
435 ! q_ = var_set_auxvar('q','q')
436 ! need_global_cmax=.true.
437 !else
438 ! q_=-1
439 !end if
440
441 ! set temperature as an auxiliary variable to get ionization degree
443 te_ = var_set_auxvar('Te','Te')
444 else
445 te_ = -1
446 end if
447
448 ! set number of variables which need update ghostcells
449 nwgc=nwflux+nwaux
450
451 ! set the index of the last flux variable for species 1
452 stop_indices(1)=nwflux
453
454 ! set cutoff temperature when using the TRAC method, as well as an auxiliary weight
455 tweight_ = -1
456 if(rmhd_trac) then
457 tcoff_ = var_set_wextra()
458 iw_tcoff=tcoff_
459 if(rmhd_trac_type .ge. 3) then
460 tweight_ = var_set_wextra()
461 endif
462 else
463 tcoff_ = -1
464 end if
465
466 ! set indices of equi vars and update number_equi_vars
468 if(has_equi_rho0) then
471 iw_equi_rho = equi_rho0_
472 endif
473 if(has_equi_pe0) then
476 iw_equi_p = equi_pe0_
477 endif
478 ! determine number of stagger variables
479 nws=ndim
480
481 nvector = 2 ! No. vector vars
482 allocate(iw_vector(nvector))
483 iw_vector(1) = mom(1) - 1 ! TODO: why like this?
484 iw_vector(2) = mag(1) - 1 ! TODO: why like this?
485
486 ! Check whether custom flux types have been defined
487 if (.not. allocated(flux_type)) then
488 allocate(flux_type(ndir, nwflux))
489 flux_type = flux_default
490 else if (any(shape(flux_type) /= [ndir, nwflux])) then
491 call mpistop("phys_check error: flux_type has wrong shape")
492 end if
493
494 if(nwflux>mag(ndir)) then
495 ! for flux of tracers, using hll flux
496 flux_type(:,mag(ndir)+1:nwflux)=flux_hll
497 end if
498
499 if(ndim>1) then
500 if(rmhd_glm) then
501 flux_type(:,psi_)=flux_special
502 do idir=1,ndir
503 flux_type(idir,mag(idir))=flux_special
504 end do
505 else
506 do idir=1,ndir
507 flux_type(idir,mag(idir))=flux_tvdlf
508 end do
509 end if
510 end if
511
512 phys_get_rho => rmhd_get_rho
513 phys_get_dt => rmhd_get_dt
514 phys_get_cmax => rmhd_get_cmax_origin
515 phys_get_a2max => rmhd_get_a2max
516 phys_get_tcutoff => rmhd_get_tcutoff
517 phys_get_h_speed => rmhd_get_h_speed
518 if(has_equi_rho0) then
519 phys_get_cbounds => rmhd_get_cbounds_split_rho
520 else
521 phys_get_cbounds => rmhd_get_cbounds
522 end if
523 if(has_equi_rho0) then
524 phys_to_primitive => rmhd_to_primitive_split_rho
525 rmhd_to_primitive => rmhd_to_primitive_split_rho
526 phys_to_conserved => rmhd_to_conserved_split_rho
527 rmhd_to_conserved => rmhd_to_conserved_split_rho
528 else
529 phys_to_primitive => rmhd_to_primitive_origin
530 rmhd_to_primitive => rmhd_to_primitive_origin
531 phys_to_conserved => rmhd_to_conserved_origin
532 rmhd_to_conserved => rmhd_to_conserved_origin
533 end if
534 if(b0field.or.has_equi_rho0.or.has_equi_pe0) then
535 phys_get_flux => rmhd_get_flux_split
536 else
537 phys_get_flux => rmhd_get_flux
538 end if
539 phys_get_v => rmhd_get_v
540 if(b0field.or.has_equi_rho0) then
541 phys_add_source_geom => rmhd_add_source_geom_split
542 else
543 phys_add_source_geom => rmhd_add_source_geom
544 end if
545 phys_add_source => rmhd_add_source
546 phys_check_params => rmhd_check_params
547 phys_write_info => rmhd_write_info
548
549 phys_handle_small_values => rmhd_handle_small_values_origin
550 rmhd_handle_small_values => rmhd_handle_small_values_origin
551 phys_check_w => rmhd_check_w_origin
552
553 phys_set_mg_bounds => rmhd_set_mg_bounds
554 phys_get_trad => rmhd_get_trad
555 phys_get_tgas => rmhd_get_tgas
556
557 phys_get_pthermal => rmhd_get_pthermal_origin
558 rmhd_get_pthermal => rmhd_get_pthermal_origin
559
560 if(number_equi_vars>0) then
561 phys_set_equi_vars => set_equi_vars_grid
562 endif
563
564 if(type_divb==divb_glm) then
565 phys_modify_wlr => rmhd_modify_wlr
566 end if
567
568 ! choose Rfactor in ideal gas law
570 rmhd_get_rfactor=>rfactor_from_temperature_ionization
571 phys_update_temperature => rmhd_update_temperature
572 else if(associated(usr_rfactor)) then
573 rmhd_get_rfactor=>usr_rfactor
574 else
575 rmhd_get_rfactor=>rfactor_from_constant_ionization
576 end if
577
579 rmhd_get_temperature => rmhd_get_temperature_from_te
580 else
581 if(has_equi_pe0 .and. has_equi_rho0) then
582 rmhd_get_temperature => rmhd_get_temperature_from_etot_with_equi
583 else
584 rmhd_get_temperature => rmhd_get_temperature_from_etot
585 end if
586 end if
587
588 ! if using ct stagger grid, boundary divb=0 is not done here
589 if(stagger_grid) then
590 phys_get_ct_velocity => rmhd_get_ct_velocity
591 phys_update_faces => rmhd_update_faces
592 phys_face_to_center => rmhd_face_to_center
593 phys_modify_wlr => rmhd_modify_wlr
594 else if(ndim>1) then
595 phys_boundary_adjust => rmhd_boundary_adjust
596 end if
597
598 {^nooned
599 ! clean initial divb
600 if(clean_initial_divb) phys_clean_divb => rmhd_clean_divb_multigrid
601 }
602
603 ! derive units from basic units
604 call rmhd_physical_units()
605
606 !> Initiate radiation-closure module
607 select case(rmhd_radiation_formalism)
608 case('fld')
610 case('afld')
612 case default
613 call mpistop('Radiation formalism unknown')
614 end select
615
618 end if
619 if(.not. rmhd_energy .and. rmhd_thermal_conduction) then
620 call mpistop("thermal conduction needs rmhd_energy=T")
621 end if
623 call mpistop("hyperbolic thermal conduction needs rmhd_energy=T")
624 end if
625
626 ! initialize thermal conduction module
628 call sts_init()
630
631 allocate(tc_fl)
632 call tc_get_mhd_params(tc_fl,tc_params_read_rmhd)
633 call add_sts_method(rmhd_get_tc_dt_rmhd,rmhd_sts_set_source_tc_rmhd,e_,1,e_,1,.false.)
634 if(has_equi_pe0 .and. has_equi_rho0) then
635 tc_fl%get_temperature_from_conserved => rmhd_get_temperature_from_etot_with_equi
636 else
637 tc_fl%get_temperature_from_conserved => rmhd_get_temperature_from_etot
638 end if
639 if(has_equi_pe0 .and. has_equi_rho0) then
640 tc_fl%get_temperature_from_eint => rmhd_get_temperature_from_eint_with_equi
641 if(rmhd_equi_thermal) then
642 tc_fl%has_equi = .true.
643 tc_fl%get_temperature_equi => rmhd_get_temperature_equi
644 tc_fl%get_rho_equi => rmhd_get_rho_equi
645 else
646 tc_fl%has_equi = .false.
647 end if
648 else
649 tc_fl%get_temperature_from_eint => rmhd_get_temperature_from_eint
650 end if
652 call set_error_handling_to_head(rmhd_tc_handle_small_e)
653 tc_fl%get_rho => rmhd_get_rho
654 tc_fl%e_ = e_
655 tc_fl%Tcoff_ = tcoff_
656 end if
657
658 allocate(te_fl_rmhd)
659 te_fl_rmhd%get_rho=> rmhd_get_rho
660 te_fl_rmhd%get_pthermal=> rmhd_get_pthermal
661 te_fl_rmhd%get_var_Rfactor => rmhd_get_rfactor
662{^ifthreed
663 phys_te_images => rmhd_te_images
664}
665 ! Initialize viscosity module
666 if (rmhd_viscosity) call viscosity_init(phys_wider_stencil)
667
668 ! Initialize gravity module
669 if(rmhd_gravity) then
670 call gravity_init()
671 end if
672
673 ! Initialize particles module
674 if(rmhd_particles) then
675 call particles_init()
676 if (particles_eta < zero) particles_eta = rmhd_eta
677 if (particles_etah < zero) particles_eta = rmhd_etah
678 if(mype==0) then
679 write(*,*) '*****Using particles: with rmhd_eta, rmhd_etah :', rmhd_eta, rmhd_etah
680 write(*,*) '*****Using particles: particles_eta, particles_etah :', particles_eta, particles_etah
681 end if
682 end if
683
684 ! initialize ionization degree table
686
687 ! Initialize CAK radiation force module
689 end subroutine rmhd_phys_init
690
691{^ifthreed
692 subroutine rmhd_te_images
695
696 select case(convert_type)
697 case('EIvtiCCmpi','EIvtuCCmpi')
699 case('ESvtiCCmpi','ESvtuCCmpi')
701 case('SIvtiCCmpi','SIvtuCCmpi')
703 case('WIvtiCCmpi','WIvtuCCmpi')
705 case default
706 call mpistop("Error in synthesize emission: Unknown convert_type")
707 end select
708 end subroutine rmhd_te_images
709}
710
711!!start th cond
712 ! wrappers for STS functions in thermal_conductivity module
713 ! which take as argument the tc_fluid (defined in the physics module)
714 subroutine rmhd_sts_set_source_tc_rmhd(ixI^L,ixO^L,w,x,wres,fix_conserve_at_step,my_dt,igrid,nflux)
718 integer, intent(in) :: ixi^l, ixo^l, igrid, nflux
719 double precision, intent(in) :: x(ixi^s,1:ndim)
720 double precision, intent(inout) :: wres(ixi^s,1:nw), w(ixi^s,1:nw)
721 double precision, intent(in) :: my_dt
722 logical, intent(in) :: fix_conserve_at_step
723 call sts_set_source_tc_mhd(ixi^l,ixo^l,w,x,wres,fix_conserve_at_step,my_dt,igrid,nflux,tc_fl)
724 end subroutine rmhd_sts_set_source_tc_rmhd
725
726 function rmhd_get_tc_dt_rmhd(w,ixI^L,ixO^L,dx^D,x) result(dtnew)
727 !Check diffusion time limit dt < dx_i**2/((gamma-1)*tc_k_para_i/rho)
728 !where tc_k_para_i=tc_k_para*B_i**2/B**2
729 !and T=p/rho
732 integer, intent(in) :: ixi^l, ixo^l
733 double precision, intent(in) :: dx^d, x(ixi^s,1:ndim)
734 double precision, intent(in) :: w(ixi^s,1:nw)
735 double precision :: dtnew
736
737 dtnew=get_tc_dt_mhd(w,ixi^l,ixo^l,dx^d,x,tc_fl)
738 end function rmhd_get_tc_dt_rmhd
739
740 subroutine rmhd_tc_handle_small_e(w, x, ixI^L, ixO^L, step)
742 integer, intent(in) :: ixi^l,ixo^l
743 double precision, intent(inout) :: w(ixi^s,1:nw)
744 double precision, intent(in) :: x(ixi^s,1:ndim)
745 integer, intent(in) :: step
746 character(len=140) :: error_msg
747
748 write(error_msg,"(a,i3)") "Thermal conduction step ", step
749 call rmhd_handle_small_ei(w,x,ixi^l,ixo^l,e_,error_msg)
750 end subroutine rmhd_tc_handle_small_e
751
752 ! fill in tc_fluid fields from namelist
753 subroutine tc_params_read_rmhd(fl)
755 type(tc_fluid), intent(inout) :: fl
756 double precision :: tc_k_para=0d0
757 double precision :: tc_k_perp=0d0
758 integer :: n
759 ! list parameters
760 logical :: tc_perpendicular=.false.
761 logical :: tc_saturate=.false.
762 character(len=std_len) :: tc_slope_limiter="MC"
763
764 namelist /tc_list/ tc_perpendicular, tc_saturate, tc_slope_limiter, tc_k_para, tc_k_perp
765
766 do n = 1, size(par_files)
767 open(unitpar, file=trim(par_files(n)), status="old")
768 read(unitpar, tc_list, end=111)
769111 close(unitpar)
770 end do
771
772 fl%tc_perpendicular = tc_perpendicular
773 fl%tc_saturate = tc_saturate
774 fl%tc_k_para = tc_k_para
775 fl%tc_k_perp = tc_k_perp
776 select case(tc_slope_limiter)
777 case ('no','none')
778 fl%tc_slope_limiter = 0
779 case ('MC')
780 ! montonized central limiter Woodward and Collela limiter (eq.3.51h), a factor of 2 is pulled out
781 fl%tc_slope_limiter = 1
782 case('minmod')
783 ! minmod limiter
784 fl%tc_slope_limiter = 2
785 case ('superbee')
786 ! Roes superbee limiter (eq.3.51i)
787 fl%tc_slope_limiter = 3
788 case ('koren')
789 ! Barry Koren Right variant
790 fl%tc_slope_limiter = 4
791 case default
792 call mpistop("Unknown tc_slope_limiter, choose MC, minmod")
793 end select
794 end subroutine tc_params_read_rmhd
795!!end th cond
796
797 !> sets the equilibrium variables
798 subroutine set_equi_vars_grid_faces(igrid,x,ixI^L,ixO^L)
801 integer, intent(in) :: igrid, ixi^l, ixo^l
802 double precision, intent(in) :: x(ixi^s,1:ndim)
803 double precision :: delx(ixi^s,1:ndim)
804 double precision :: xc(ixi^s,1:ndim),xshift^d
805 integer :: idims, ixc^l, hxo^l, ix, idims2
806
807 if(slab_uniform)then
808 ^d&delx(ixi^s,^d)=rnode(rpdx^d_,igrid)\
809 else
810 ! for all non-cartesian and stretched cartesian coordinates
811 delx(ixi^s,1:ndim)=ps(igrid)%dx(ixi^s,1:ndim)
812 endif
813
814 do idims=1,ndim
815 hxo^l=ixo^l-kr(idims,^d);
816 if(stagger_grid) then
817 ! ct needs all transverse cells
818 ixcmax^d=ixomax^d+nghostcells-nghostcells*kr(idims,^d); ixcmin^d=hxomin^d-nghostcells+nghostcells*kr(idims,^d);
819 else
820 ! ixC is centered index in the idims direction from ixOmin-1/2 to ixOmax+1/2
821 ixcmax^d=ixomax^d; ixcmin^d=hxomin^d;
822 end if
823 ! always xshift=0 or 1/2
824 xshift^d=half*(one-kr(^d,idims));
825 do idims2=1,ndim
826 select case(idims2)
827 {case(^d)
828 do ix = ixc^lim^d
829 ! xshift=half: this is the cell center coordinate
830 ! xshift=0: this is the cell edge i+1/2 coordinate
831 xc(ix^d%ixC^s,^d)=x(ix^d%ixC^s,^d)+(half-xshift^d)*delx(ix^d%ixC^s,^d)
832 end do\}
833 end select
834 end do
835 call usr_set_equi_vars(ixi^l,ixc^l,xc,ps(igrid)%equi_vars(ixi^s,1:number_equi_vars,idims))
836 end do
837 end subroutine set_equi_vars_grid_faces
838
839 !> sets the equilibrium variables
840 subroutine set_equi_vars_grid(igrid)
843 integer, intent(in) :: igrid
844
845 !values at the center
846 call usr_set_equi_vars(ixg^ll,ixg^ll,ps(igrid)%x,ps(igrid)%equi_vars(ixg^t,1:number_equi_vars,0))
847
848 !values at the interfaces
849 call set_equi_vars_grid_faces(igrid,ps(igrid)%x,ixg^ll,ixm^ll)
850 end subroutine set_equi_vars_grid
851
852 ! w, wnew conserved, add splitted variables back to wnew
853 function convert_vars_splitting(ixI^L,ixO^L, w, x, nwc) result(wnew)
855 integer, intent(in) :: ixi^l,ixo^l, nwc
856 double precision, intent(in) :: w(ixi^s, 1:nw)
857 double precision, intent(in) :: x(ixi^s,1:ndim)
858 double precision :: wnew(ixo^s, 1:nwc)
859
860 if(has_equi_rho0) then
861 wnew(ixo^s,rho_)=w(ixo^s,rho_)+block%equi_vars(ixo^s,equi_rho0_,0)
862 else
863 wnew(ixo^s,rho_)=w(ixo^s,rho_)
864 endif
865 wnew(ixo^s,mom(:))=w(ixo^s,mom(:))
866
867 if (b0field) then
868 ! add background magnetic field B0 to B
869 wnew(ixo^s,mag(1:ndir))=w(ixo^s,mag(1:ndir))+block%B0(ixo^s,1:ndir,0)
870 else
871 wnew(ixo^s,mag(1:ndir))=w(ixo^s,mag(1:ndir))
872 end if
873
874 if(rmhd_energy) then
875 wnew(ixo^s,e_)=w(ixo^s,e_)
876 if(has_equi_pe0) then
877 wnew(ixo^s,e_)=wnew(ixo^s,e_)+block%equi_vars(ixo^s,equi_pe0_,0)*inv_gamma_1
878 end if
879 if(b0field .and. total_energy) then
880 wnew(ixo^s,e_)=wnew(ixo^s,e_)+0.5d0*sum(block%B0(ixo^s,:,0)**2,dim=ndim+1) &
881 + sum(w(ixo^s,mag(:))*block%B0(ixo^s,:,0),dim=ndim+1)
882 end if
883 end if
884 end function convert_vars_splitting
885
886 subroutine rmhd_check_params
890
891 ! after user parameter setting
892 gamma_1=rmhd_gamma-1.d0
893 if (.not. rmhd_energy) then
894 if (rmhd_gamma <= 0.0d0) call mpistop ("Error: rmhd_gamma <= 0")
895 if (rmhd_adiab < 0.0d0) call mpistop ("Error: rmhd_adiab < 0")
897 else
898 if (rmhd_gamma <= 0.0d0 .or. rmhd_gamma == 1.0d0) &
899 call mpistop ("Error: rmhd_gamma <= 0 or rmhd_gamma == 1")
900 inv_gamma_1=1.d0/gamma_1
901 small_e = small_pressure * inv_gamma_1
902 end if
903
905
906 if (number_equi_vars > 0 .and. .not. associated(usr_set_equi_vars)) then
907 call mpistop("usr_set_equi_vars has to be implemented in the user file")
908 endif
909 if(convert .or. autoconvert) then
910 if(convert_type .eq. 'dat_generic_mpi') then
911 if(rmhd_dump_full_vars) then
912 if(mype .eq. 0) print*, " add conversion method: split -> full "
913 call add_convert_method(convert_vars_splitting, nw, cons_wnames, "new")
914 endif
915 endif
916 endif
917
919 end subroutine rmhd_check_params
920
921 !> Set the boundaries for the diffusion of E
926 integer :: ib
927
928 ! Set boundary conditions for the multigrid solver
929 do ib = 1, 2*ndim
930 select case (typeboundary(r_e, ib))
931 case (bc_symm)
932 ! d/dx u = 0
933 mg%bc(ib, mg_iphi)%bc_type = mg_bc_neumann
934 mg%bc(ib, mg_iphi)%bc_value = 0.0_dp
935 case (bc_asymm)
936 ! u = 0
937 mg%bc(ib, mg_iphi)%bc_type = mg_bc_dirichlet
938 mg%bc(ib, mg_iphi)%bc_value = 0.0_dp
939 case (bc_cont)
940 ! d/dx u = 0
941 ! mg%bc(iB, mg_iphi)%bc_type = mg_bc_continuous
942 mg%bc(ib, mg_iphi)%bc_type = mg_bc_neumann
943 mg%bc(ib, mg_iphi)%bc_value = 0.0_dp
944 case (bc_periodic)
945 ! Nothing to do here
946 case (bc_noinflow)
947 call usr_special_mg_bc(ib)
948 case (bc_special)
949 call usr_special_mg_bc(ib)
950 case default
951 call mpistop("divE_multigrid warning: unknown b.c. ")
952 end select
953 end do
954 end subroutine rmhd_set_mg_bounds
955
956 subroutine rmhd_physical_units()
958 double precision :: mp,kb,miu0,c_lightspeed
959 double precision :: a,b
960
961 ! Derive scaling units
962 if(si_unit) then
963 mp=mp_si
964 kb=kb_si
965 miu0=miu0_si
966 c_lightspeed=c_si
967 else
968 mp=mp_cgs
969 kb=kb_cgs
970 miu0=4.d0*dpi ! G^2 cm^2 dyne^-1
971 c_lightspeed=const_c
972 end if
973 if(eq_state_units) then
974 a = 1d0 + 4d0 * he_abundance
976 b = 2+.3d0
977 else
978 b = 1d0 + h_ion_fr + he_abundance*(he_ion_fr*(he_ion_fr2 + 1d0)+1d0)
979 end if
980 rr = 1d0
981 else
982 a = 1d0
983 b = 1d0
984 rr = (1d0 + h_ion_fr + he_abundance*(he_ion_fr*(he_ion_fr2 + 1d0)+1d0))/(1d0 + 4d0 * he_abundance)
985 end if
986 if(unit_density/=1.d0) then
988 else
989 ! unit of numberdensity is independent by default
991 end if
992 if(unit_velocity/=1.d0) then
996 else if(unit_pressure/=1.d0) then
1000 else if(unit_magneticfield/=1.d0) then
1004 else if(unit_temperature/=1.d0) then
1008 end if
1009 if(unit_time/=1.d0) then
1011 else
1012 ! unit of length is independent by default
1014 end if
1015 ! Additional units needed for the particles
1016 c_norm=c_lightspeed/unit_velocity
1018 if (.not. si_unit) unit_charge = unit_charge*const_c
1020
1021 !> Units for radiative flux and opacity
1024 end subroutine rmhd_physical_units
1025
1026 subroutine rmhd_check_w_origin(primitive,ixI^L,ixO^L,w,flag)
1028 logical, intent(in) :: primitive
1029 integer, intent(in) :: ixi^l, ixo^l
1030 double precision, intent(in) :: w(ixi^s,nw)
1031 logical, intent(inout) :: flag(ixi^s,1:nw)
1032 double precision :: tmp
1033 integer :: ix^d
1034
1035 flag=.false.
1036 {do ix^db=ixomin^db,ixomax^db\}
1037 if(has_equi_rho0) then
1038 tmp=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
1039 else
1040 tmp=w(ix^d,rho_)
1041 end if
1042 if(tmp<small_density) flag(ix^d,rho_) = .true.
1043 if(primitive) then
1044 if(has_equi_pe0) then
1045 if(w(ix^d,p_)+block%equi_vars(ix^d,equi_pe0_,0)<small_pressure) flag(ix^d,e_) = .true.
1046 else
1047 if(w(ix^d,p_)<small_pressure) flag(ix^d,e_) = .true.
1048 end if
1049 else
1050 tmp=w(ix^d,e_)-half*((^c&w(ix^d,m^c_)**2+)/tmp+(^c&w(ix^d,b^c_)**2+))
1051 if(has_equi_pe0) then
1052 if(tmp+block%equi_vars(ix^d,equi_pe0_,0)*inv_gamma_1<small_e) flag(ix^d,e_) = .true.
1053 else
1054 if(tmp<small_e) flag(ix^d,e_) = .true.
1055 end if
1056 end if
1057 if(w(ix^d,r_e)<small_r_e) flag(ix^d,r_e) = .true.
1058 {end do\}
1059 end subroutine rmhd_check_w_origin
1060
1061 !> Transform primitive variables into conservative ones
1062 subroutine rmhd_to_conserved_origin(ixI^L,ixO^L,w,x)
1064 integer, intent(in) :: ixi^l, ixo^l
1065 double precision, intent(inout) :: w(ixi^s, nw)
1066 double precision, intent(in) :: x(ixi^s, 1:ndim)
1067 integer :: ix^d
1068
1069 {do ix^db=ixomin^db,ixomax^db\}
1070 ! Calculate total energy from pressure, kinetic and magnetic energy
1071 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1&
1072 +half*((^c&w(ix^d,m^c_)**2+)*w(ix^d,rho_)&
1073 +(^c&w(ix^d,b^c_)**2+))
1074 ! Convert velocity to momentum
1075 ^c&w(ix^d,m^c_)=w(ix^d,rho_)*w(ix^d,m^c_)\
1076 {end do\}
1077 end subroutine rmhd_to_conserved_origin
1078
1079 !> Transform primitive variables into conservative ones
1080 subroutine rmhd_to_conserved_split_rho(ixI^L,ixO^L,w,x)
1082 integer, intent(in) :: ixi^l, ixo^l
1083 double precision, intent(inout) :: w(ixi^s, nw)
1084 double precision, intent(in) :: x(ixi^s, 1:ndim)
1085 double precision :: rho
1086 integer :: ix^d
1087
1088 {do ix^db=ixomin^db,ixomax^db\}
1089 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i)
1090 ! Calculate total energy from pressure, kinetic and magnetic energy
1091 w(ix^d,e_)=w(ix^d,p_)*inv_gamma_1&
1092 +half*((^c&w(ix^d,m^c_)**2+)*rho&
1093 +(^c&w(ix^d,b^c_)**2+))
1094 ! Convert velocity to momentum
1095 ^c&w(ix^d,m^c_)=rho*w(ix^d,m^c_)\
1096 {end do\}
1097 end subroutine rmhd_to_conserved_split_rho
1098
1099 !> Transform conservative variables into primitive ones
1100 subroutine rmhd_to_primitive_origin(ixI^L,ixO^L,w,x)
1102 integer, intent(in) :: ixi^l, ixo^l
1103 double precision, intent(inout) :: w(ixi^s, nw)
1104 double precision, intent(in) :: x(ixi^s, 1:ndim)
1105 double precision :: inv_rho
1106 integer :: ix^d
1107
1108 if (fix_small_values) then
1109 ! fix small values preventing NaN numbers in the following converting
1110 call rmhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'rmhd_to_primitive_origin')
1111 end if
1112
1113 {do ix^db=ixomin^db,ixomax^db\}
1114 inv_rho = 1.d0/w(ix^d,rho_)
1115 ! Convert momentum to velocity
1116 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)*inv_rho\
1117 ! Calculate pressure = (gamma-1) * (e-ek-eb)
1118 w(ix^d,p_)=gamma_1*(w(ix^d,e_)&
1119 -half*(w(ix^d,rho_)*(^c&w(ix^d,m^c_)**2+)&
1120 +(^c&w(ix^d,b^c_)**2+)))
1121 {end do\}
1122 end subroutine rmhd_to_primitive_origin
1123
1124 !> Transform conservative variables into primitive ones
1125 subroutine rmhd_to_primitive_split_rho(ixI^L,ixO^L,w,x)
1127 integer, intent(in) :: ixi^l, ixo^l
1128 double precision, intent(inout) :: w(ixi^s, nw)
1129 double precision, intent(in) :: x(ixi^s, 1:ndim)
1130 double precision :: inv_rho
1131 integer :: ix^d
1132
1133 if (fix_small_values) then
1134 ! fix small values preventing NaN numbers in the following converting
1135 call rmhd_handle_small_values(.false., w, x, ixi^l, ixo^l, 'rmhd_to_primitive_split_rho')
1136 end if
1137
1138 {do ix^db=ixomin^db,ixomax^db\}
1139 inv_rho=1.d0/(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1140 ! Convert momentum to velocity
1141 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)*inv_rho\
1142 ! Calculate pressure = (gamma-1) * (e-ek-eb)
1143 w(ix^d,p_)=gamma_1*(w(ix^d,e_)&
1144 -half*((w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))*&
1145 (^c&w(ix^d,m^c_)**2+)+(^c&w(ix^d,b^c_)**2+)))
1146 {end do\}
1147 end subroutine rmhd_to_primitive_split_rho
1148
1149 !> Transform internal energy to total energy
1150 subroutine rmhd_ei_to_e(ixI^L,ixO^L,w,x)
1152 integer, intent(in) :: ixi^l, ixo^l
1153 double precision, intent(inout) :: w(ixi^s, nw)
1154 double precision, intent(in) :: x(ixi^s, 1:ndim)
1155
1156 integer :: ix^d
1157
1158 if(has_equi_rho0) then
1159 {do ix^db=ixomin^db,ixomax^db\}
1160 ! Calculate e = ei + ek + eb
1161 w(ix^d,e_)=w(ix^d,e_)&
1162 +half*((^c&w(ix^d,m^c_)**2+)/&
1163 (w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0))&
1164 +(^c&w(ix^d,b^c_)**2+))
1165 {end do\}
1166 else
1167 {do ix^db=ixomin^db,ixomax^db\}
1168 ! Calculate e = ei + ek + eb
1169 w(ix^d,e_)=w(ix^d,e_)&
1170 +half*((^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)&
1171 +(^c&w(ix^d,b^c_)**2+))
1172 {end do\}
1173 end if
1174 end subroutine rmhd_ei_to_e
1175
1176 !> Transform total energy to internal energy
1177 subroutine rmhd_e_to_ei(ixI^L,ixO^L,w,x)
1179 integer, intent(in) :: ixi^l, ixo^l
1180 double precision, intent(inout) :: w(ixi^s, nw)
1181 double precision, intent(in) :: x(ixi^s, 1:ndim)
1182
1183 integer :: ix^d
1184
1185 if(has_equi_rho0) then
1186 {do ix^db=ixomin^db,ixomax^db\}
1187 ! Calculate ei = e - ek - eb
1188 w(ix^d,e_)=w(ix^d,e_)&
1189 -half*((^c&w(ix^d,m^c_)**2+)/&
1190 (w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0))&
1191 +(^c&w(ix^d,b^c_)**2+))
1192 {end do\}
1193 else
1194 {do ix^db=ixomin^db,ixomax^db\}
1195 ! Calculate ei = e - ek - eb
1196 w(ix^d,e_)=w(ix^d,e_)&
1197 -half*((^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)&
1198 +(^c&w(ix^d,b^c_)**2+))
1199 {end do\}
1200 end if
1201
1202 if(fix_small_values) then
1203 call rmhd_handle_small_ei(w,x,ixi^l,ixi^l,e_,'rmhd_e_to_ei')
1204 end if
1205 end subroutine rmhd_e_to_ei
1206
1207 subroutine rmhd_handle_small_values_origin(primitive, w, x, ixI^L, ixO^L, subname)
1210 logical, intent(in) :: primitive
1211 integer, intent(in) :: ixi^l,ixo^l
1212 double precision, intent(inout) :: w(ixi^s,1:nw)
1213 double precision, intent(in) :: x(ixi^s,1:ndim)
1214 character(len=*), intent(in) :: subname
1215 double precision :: rho
1216 integer :: idir, ix^d
1217 logical :: flag(ixi^s,1:nw)
1218
1219 call phys_check_w(primitive, ixi^l, ixi^l, w, flag)
1220 if(any(flag)) then
1221 select case (small_values_method)
1222 case ("replace")
1223 {do ix^db=ixomin^db,ixomax^db\}
1224 if(has_equi_rho0) then
1225 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
1226 if(flag(ix^d,rho_)) w(ix^d,rho_)=small_density-block%equi_vars(ix^d,equi_rho0_,0)
1227 else
1228 rho=w(ix^d,rho_)
1229 if(flag(ix^d,rho_)) w(ix^d,rho_)=small_density
1230 end if
1231 {
1232 if(small_values_fix_iw(m^c_)) then
1233 if(flag({ix^d},rho_)) w({ix^d},m^c_)=0.0d0
1234 end if
1235 \}
1236 if(primitive) then
1237 if(has_equi_pe0) then
1238 if(flag(ix^d,e_)) w(ix^d,p_)=small_pressure-block%equi_vars(ix^d,equi_pe0_,0)
1239 else
1240 if(flag(ix^d,e_)) w(ix^d,p_)=small_pressure
1241 end if
1242 else
1243 if(has_equi_pe0) then
1244 if(flag(ix^d,e_)) &
1245 w(ix^d,e_)=small_e+half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))&
1246 -block%equi_vars(ix^d,equi_pe0_,0)*inv_gamma_1
1247 else
1248 if(flag(ix^d,e_)) &
1249 w(ix^d,e_)=small_e+half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))
1250 end if
1251 end if
1252 if(flag(ix^d,r_e)) w(ix^d,r_e)=small_r_e
1253 {end do\}
1254 case ("average")
1255 ! do averaging of density
1256 call small_values_average(ixi^l, ixo^l, w, x, flag, rho_)
1257 if(primitive)then
1258 call small_values_average(ixi^l, ixo^l, w, x, flag, p_)
1259 else
1260 ! do averaging of internal energy
1261 {do ix^db=iximin^db,iximax^db\}
1262 if(has_equi_rho0) then
1263 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
1264 else
1265 rho=w(ix^d,rho_)
1266 end if
1267 w(ix^d,e_)=w(ix^d,e_)&
1268 -half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))
1269 {end do\}
1270 call small_values_average(ixi^l, ixo^l, w, x, flag, e_)
1271 ! convert back
1272 {do ix^db=iximin^db,iximax^db\}
1273 if(has_equi_rho0) then
1274 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
1275 else
1276 rho=w(ix^d,rho_)
1277 end if
1278 w(ix^d,e_)=w(ix^d,e_)&
1279 +half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+))
1280 {end do\}
1281 end if
1282 call small_values_average(ixi^l, ixo^l, w, x, flag, r_e)
1283 case default
1284 if(.not.primitive) then
1285 !convert w to primitive
1286 ! do averaging of internal energy
1287 {do ix^db=iximin^db,iximax^db\}
1288 if(has_equi_rho0) then
1289 rho=w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,0)
1290 else
1291 rho=w(ix^d,rho_)
1292 end if
1293 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)/rho\
1294 w(ix^d,p_)=gamma_1*(w(ix^d,e_)&
1295 -half*((^c&w(ix^d,m^c_)**2+)/rho+(^c&w(ix^d,b^c_)**2+)))
1296 {end do\}
1297 end if
1298 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
1299 end select
1300 end if
1301 end subroutine rmhd_handle_small_values_origin
1302
1303 !> Calculate v vector
1304 subroutine rmhd_get_v(w,x,ixI^L,ixO^L,v)
1306 integer, intent(in) :: ixi^l, ixo^l
1307 double precision, intent(in) :: w(ixi^s,nw), x(ixi^s,1:ndim)
1308 double precision, intent(out) :: v(ixi^s,ndir)
1309 double precision :: rho(ixi^s)
1310 integer :: idir
1311
1312 call rmhd_get_rho(w,x,ixi^l,ixo^l,rho)
1313 rho(ixo^s)=1.d0/rho(ixo^s)
1314 ! Convert momentum to velocity
1315 do idir = 1, ndir
1316 v(ixo^s, idir) = w(ixo^s, mom(idir))*rho(ixo^s)
1317 end do
1318 end subroutine rmhd_get_v
1319
1320 !> Calculate cmax_idim=csound+abs(v_idim) within ixO^L
1321 subroutine rmhd_get_cmax_origin(w,x,ixI^L,ixO^L,idim,cmax)
1323 integer, intent(in) :: ixi^l, ixo^l, idim
1324 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
1325 double precision, intent(inout) :: cmax(ixi^s)
1326 double precision :: rho, inv_rho, cfast2, avmincs2, b2, kmax
1327 integer :: ix^d
1328
1329 if(b0field) then
1330 {do ix^db=ixomin^db,ixomax^db \}
1331 if(has_equi_rho0) then
1332 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1333 else
1334 rho=w(ix^d,rho_)
1335 end if
1336 inv_rho=1.d0/rho
1337 ! sound speed**2
1338 cmax(ix^d)=rmhd_gamma*w(ix^d,p_)*inv_rho
1339 ! store |B|^2 in v
1340 b2=(^c&(w(ix^d,b^c_)+block%B0(ix^d,^c,b0i))**2+)
1341 cfast2=b2*inv_rho+cmax(ix^d)
1342 avmincs2=cfast2**2-4.0d0*cmax(ix^d)*(w(ix^d,mag(idim))+block%B0(ix^d,idim,b0i))**2*inv_rho
1343 if(avmincs2<zero) avmincs2=zero
1344 cmax(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
1345 cmax(ix^d)=abs(w(ix^d,mom(idim)))+cmax(ix^d)
1346 {end do\}
1347 else
1348 {do ix^db=ixomin^db,ixomax^db \}
1349 if(has_equi_rho0) then
1350 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1351 else
1352 rho=w(ix^d,rho_)
1353 end if
1354 inv_rho=1.d0/rho
1355 ! sound speed**2
1356 cmax(ix^d)=rmhd_gamma*w(ix^d,p_)*inv_rho
1357 ! store |B|^2 in v
1358 b2=(^c&w(ix^d,b^c_)**2+)
1359 cfast2=b2*inv_rho+cmax(ix^d)
1360 avmincs2=cfast2**2-4.0d0*cmax(ix^d)*w(ix^d,mag(idim))**2*inv_rho
1361 if(avmincs2<zero) avmincs2=zero
1362 cmax(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
1363 cmax(ix^d)=abs(w(ix^d,mom(idim)))+cmax(ix^d)
1364 {end do\}
1365 end if
1366 end subroutine rmhd_get_cmax_origin
1367
1368 subroutine rmhd_get_a2max(w,x,ixI^L,ixO^L,a2max)
1370 integer, intent(in) :: ixi^l, ixo^l
1371 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
1372 double precision, intent(inout) :: a2max(ndim)
1373 double precision :: a2(ixi^s,ndim,nw)
1374 integer :: gxo^l,hxo^l,jxo^l,kxo^l,i,j
1375
1376 a2=zero
1377 do i = 1,ndim
1378 !> 4th order
1379 hxo^l=ixo^l-kr(i,^d);
1380 gxo^l=hxo^l-kr(i,^d);
1381 jxo^l=ixo^l+kr(i,^d);
1382 kxo^l=jxo^l+kr(i,^d);
1383 a2(ixo^s,i,1:nw)=abs(-w(kxo^s,1:nw)+16.d0*w(jxo^s,1:nw)&
1384 -30.d0*w(ixo^s,1:nw)+16.d0*w(hxo^s,1:nw)-w(gxo^s,1:nw))
1385 a2max(i)=maxval(a2(ixo^s,i,1:nw))/12.d0/dxlevel(i)**2
1386 end do
1387 end subroutine rmhd_get_a2max
1388
1389 !> get adaptive cutoff temperature for TRAC (Johnston 2019 ApJL, 873, L22)
1390 subroutine rmhd_get_tcutoff(ixI^L,ixO^L,w,x,Tco_local,Tmax_local)
1392 use mod_geometry
1393 integer, intent(in) :: ixi^l,ixo^l
1394 double precision, intent(in) :: x(ixi^s,1:ndim)
1395 double precision, intent(out) :: tco_local,tmax_local
1396 ! in primitive form
1397 double precision, intent(inout) :: w(ixi^s,1:nw)
1398 double precision, parameter :: trac_delta=0.25d0
1399 double precision :: tmp1(ixi^s),te(ixi^s),lts(ixi^s)
1400 double precision, dimension(ixI^S,1:ndir) :: bunitvec
1401 double precision, dimension(ixI^S,1:ndim) :: gradt
1402 double precision :: bdir(ndim)
1403 double precision :: ltrc,ltrp,altr(ixi^s)
1404 integer :: idims,jxo^l,hxo^l,ixa^d,ixb^d,ix^d
1405 integer :: jxp^l,hxp^l,ixp^l,ixq^l
1406 logical :: lrlt(ixi^s)
1407
1409 call rmhd_get_temperature_from_te(w,x,ixi^l,ixi^l,te)
1410 else
1411 call rmhd_get_rfactor(w,x,ixi^l,ixi^l,te)
1412 te(ixi^s)=w(ixi^s,p_)/(te(ixi^s)*w(ixi^s,rho_))
1413 end if
1414 tco_local=zero
1415 tmax_local=maxval(te(ixo^s))
1416
1417 {^ifoned
1418 select case(rmhd_trac_type)
1419 case(0)
1420 !> test case, fixed cutoff temperature
1421 block%wextra(ixi^s,tcoff_)=2.5d5/unit_temperature
1422 case(1)
1423 hxo^l=ixo^l-1;
1424 jxo^l=ixo^l+1;
1425 lts(ixo^s)=0.5d0*abs(te(jxo^s)-te(hxo^s))/te(ixo^s)
1426 lrlt=.false.
1427 where(lts(ixo^s) > trac_delta)
1428 lrlt(ixo^s)=.true.
1429 end where
1430 if(any(lrlt(ixo^s))) then
1431 tco_local=maxval(te(ixo^s), mask=lrlt(ixo^s))
1432 end if
1433 case(2)
1434 !> iijima et al. 2021, LTRAC method
1435 ltrc=1.5d0
1436 ltrp=4.d0
1437 ixp^l=ixo^l^ladd1;
1438 hxo^l=ixo^l-1;
1439 jxo^l=ixo^l+1;
1440 hxp^l=ixp^l-1;
1441 jxp^l=ixp^l+1;
1442 lts(ixp^s)=0.5d0*abs(te(jxp^s)-te(hxp^s))/te(ixp^s)
1443 lts(ixp^s)=max(one, (exp(lts(ixp^s))/ltrc)**ltrp)
1444 lts(ixo^s)=0.25d0*(lts(jxo^s)+two*lts(ixo^s)+lts(hxo^s))
1445 block%wextra(ixo^s,tcoff_)=te(ixo^s)*lts(ixo^s)**0.4d0
1446 case default
1447 call mpistop("rmhd_trac_type not allowed for 1D simulation")
1448 end select
1449 }
1450 {^nooned
1451 select case(rmhd_trac_type)
1452 case(0)
1453 !> test case, fixed cutoff temperature
1454 block%wextra(ixi^s,tcoff_)=2.5d5/unit_temperature
1455 case(1,4,6)
1456 ! temperature gradient at cell centers
1457 do idims=1,ndim
1458 call gradient(te,ixi^l,ixo^l,idims,tmp1)
1459 gradt(ixo^s,idims)=tmp1(ixo^s)
1460 end do
1461 ! B vector
1462 if(b0field) then
1463 bunitvec(ixo^s,:)=w(ixo^s,iw_mag(:))+block%B0(ixo^s,:,0)
1464 else
1465 bunitvec(ixo^s,:)=w(ixo^s,iw_mag(:))
1466 end if
1467 if(rmhd_trac_type .gt. 1) then
1468 ! B direction at cell center
1469 bdir=zero
1470 {do ixa^d=0,1\}
1471 ixb^d=(ixomin^d+ixomax^d-1)/2+ixa^d;
1472 bdir(1:ndim)=bdir(1:ndim)+bunitvec(ixb^d,1:ndim)
1473 {end do\}
1474 if(sum(bdir(:)**2) .gt. zero) then
1475 bdir(1:ndim)=bdir(1:ndim)/dsqrt(sum(bdir(:)**2))
1476 end if
1477 block%special_values(3:ndim+2)=bdir(1:ndim)
1478 end if
1479 tmp1(ixo^s)=dsqrt(sum(bunitvec(ixo^s,:)**2,dim=ndim+1))
1480 where(tmp1(ixo^s)/=0.d0)
1481 tmp1(ixo^s)=1.d0/tmp1(ixo^s)
1482 elsewhere
1483 tmp1(ixo^s)=bigdouble
1484 end where
1485 ! b unit vector: magnetic field direction vector
1486 do idims=1,ndim
1487 bunitvec(ixo^s,idims)=bunitvec(ixo^s,idims)*tmp1(ixo^s)
1488 end do
1489 ! temperature length scale inversed
1490 lts(ixo^s)=abs(sum(gradt(ixo^s,1:ndim)*bunitvec(ixo^s,1:ndim),dim=ndim+1))/te(ixo^s)
1491 ! fraction of cells size to temperature length scale
1492 if(slab_uniform) then
1493 lts(ixo^s)=minval(dxlevel)*lts(ixo^s)
1494 else
1495 lts(ixo^s)=minval(block%ds(ixo^s,:),dim=ndim+1)*lts(ixo^s)
1496 end if
1497 lrlt=.false.
1498 where(lts(ixo^s) > trac_delta)
1499 lrlt(ixo^s)=.true.
1500 end where
1501 if(any(lrlt(ixo^s))) then
1502 block%special_values(1)=maxval(te(ixo^s), mask=lrlt(ixo^s))
1503 else
1504 block%special_values(1)=zero
1505 end if
1506 block%special_values(2)=tmax_local
1507 case(2)
1508 !> iijima et al. 2021, LTRAC method
1509 ltrc=1.5d0
1510 ltrp=4.d0
1511 ixp^l=ixo^l^ladd2;
1512 ! temperature gradient at cell centers
1513 do idims=1,ndim
1514 ixq^l=ixp^l;
1515 hxp^l=ixp^l;
1516 jxp^l=ixp^l;
1517 select case(idims)
1518 {case(^d)
1519 ixqmin^d=ixqmin^d+1
1520 ixqmax^d=ixqmax^d-1
1521 hxpmax^d=ixpmin^d
1522 jxpmin^d=ixpmax^d
1523 \}
1524 end select
1525 call gradient(te,ixi^l,ixq^l,idims,gradt(ixi^s,idims))
1526 call gradientf(te,x,ixi^l,hxp^l,idims,gradt(ixi^s,idims),nghostcells,.true.)
1527 call gradientf(te,x,ixi^l,jxp^l,idims,gradt(ixi^s,idims),nghostcells,.false.)
1528 end do
1529 ! B vector
1530 {do ix^db=ixpmin^db,ixpmax^db\}
1531 if(b0field) then
1532 ^c&bunitvec(ix^d,^c)=w(ix^d,iw_mag(^c))+block%B0(ix^d,^c,0)\
1533 else
1534 ^c&bunitvec(ix^d,^c)=w(ix^d,iw_mag(^c))\
1535 end if
1536 tmp1(ix^d)=1.d0/(dsqrt(^c&bunitvec(ix^d,^c)**2+)+smalldouble)
1537 ! b unit vector: magnetic field direction vector
1538 ^d&bunitvec({ix^d},^d)=bunitvec({ix^d},^d)*tmp1({ix^d})\
1539 ! temperature length scale inversed
1540 lts(ix^d)=abs(^d&gradt({ix^d},^d)*bunitvec({ix^d},^d)+)/te(ix^d)
1541 ! fraction of cells size to temperature length scale
1542 if(slab_uniform) then
1543 lts(ix^d)=min(^d&dxlevel(^d))*lts(ix^d)
1544 else
1545 lts(ix^d)=min(^d&block%ds({ix^d},^d))*lts(ix^d)
1546 end if
1547 lts(ix^d)=max(one,(exp(lts(ix^d))/ltrc)**ltrp)
1548 {end do\}
1549 ! need one ghost layer for thermal conductivity
1550 ixp^l=ixo^l^ladd1;
1551 do idims=1,ndim
1552 hxo^l=ixp^l-kr(idims,^d);
1553 jxo^l=ixp^l+kr(idims,^d);
1554 if(idims==1) then
1555 altr(ixp^s)=0.25d0*(lts(hxo^s)+two*lts(ixp^s)+lts(jxo^s))*bunitvec(ixp^s,idims)**2
1556 else
1557 altr(ixp^s)=altr(ixp^s)+0.25d0*(lts(hxo^s)+two*lts(ixp^s)+lts(jxo^s))*bunitvec(ixp^s,idims)**2
1558 end if
1559 end do
1560 block%wextra(ixp^s,tcoff_)=te(ixp^s)*altr(ixp^s)**0.4d0
1561 case(3,5)
1562 !> do nothing here
1563 case default
1564 call mpistop("unknown rmhd_trac_type")
1565 end select
1566 }
1567 end subroutine rmhd_get_tcutoff
1568
1569 !> get H speed for H-correction to fix the carbuncle problem at grid-aligned shock front
1570 subroutine rmhd_get_h_speed(wprim,x,ixI^L,ixO^L,idim,Hspeed)
1572
1573 integer, intent(in) :: ixi^l, ixo^l, idim
1574 double precision, intent(in) :: wprim(ixi^s, nw)
1575 double precision, intent(in) :: x(ixi^s,1:ndim)
1576 double precision, intent(out) :: hspeed(ixi^s,1:number_species)
1577
1578 double precision :: csound(ixi^s,ndim)
1579 double precision, allocatable :: tmp(:^d&)
1580 integer :: jxc^l, ixc^l, ixa^l, id, ix^d
1581
1582 hspeed=0.d0
1583 ixa^l=ixo^l^ladd1;
1584 allocate(tmp(ixa^s))
1585 do id=1,ndim
1586 call rmhd_get_csound_prim(wprim,x,ixi^l,ixa^l,id,tmp)
1587 csound(ixa^s,id)=tmp(ixa^s)
1588 end do
1589 ixcmax^d=ixomax^d;
1590 ixcmin^d=ixomin^d+kr(idim,^d)-1;
1591 jxcmax^d=ixcmax^d+kr(idim,^d);
1592 jxcmin^d=ixcmin^d+kr(idim,^d);
1593 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))
1594
1595 do id=1,ndim
1596 if(id==idim) cycle
1597 ixamax^d=ixcmax^d+kr(id,^d);
1598 ixamin^d=ixcmin^d+kr(id,^d);
1599 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)))
1600 ixamax^d=ixcmax^d-kr(id,^d);
1601 ixamin^d=ixcmin^d-kr(id,^d);
1602 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)))
1603 end do
1604
1605 do id=1,ndim
1606 if(id==idim) cycle
1607 ixamax^d=jxcmax^d+kr(id,^d);
1608 ixamin^d=jxcmin^d+kr(id,^d);
1609 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)))
1610 ixamax^d=jxcmax^d-kr(id,^d);
1611 ixamin^d=jxcmin^d-kr(id,^d);
1612 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)))
1613 end do
1614 deallocate(tmp)
1615
1616 end subroutine rmhd_get_h_speed
1617
1618 !> Estimating bounds for the minimum and maximum signal velocities without split
1619 subroutine rmhd_get_cbounds(wLC,wRC,wLp,wRp,x,ixI^L,ixO^L,idim,Hspeed,cmax,cmin)
1621 integer, intent(in) :: ixi^l, ixo^l, idim
1622 double precision, intent(in) :: wlc(ixi^s, nw), wrc(ixi^s, nw)
1623 double precision, intent(in) :: wlp(ixi^s, nw), wrp(ixi^s, nw)
1624 double precision, intent(in) :: x(ixi^s,1:ndim)
1625 double precision, intent(inout) :: cmax(ixi^s,1:number_species)
1626 double precision, intent(inout), optional :: cmin(ixi^s,1:number_species)
1627 double precision, intent(in) :: hspeed(ixi^s,1:number_species)
1628
1629 double precision :: wmean(ixi^s,nw), csoundl(ixo^s), csoundr(ixo^s)
1630 double precision :: umean, dmean, tmp1, tmp2, tmp3
1631 integer :: ix^d
1632
1633 select case (boundspeed)
1634 case (1)
1635 ! This implements formula (10.52) from "Riemann Solvers and Numerical
1636 ! Methods for Fluid Dynamics" by Toro.
1637 call rmhd_get_csound_prim(wlp,x,ixi^l,ixo^l,idim,csoundl)
1638 call rmhd_get_csound_prim(wrp,x,ixi^l,ixo^l,idim,csoundr)
1639 if(present(cmin)) then
1640 {do ix^db=ixomin^db,ixomax^db\}
1641 tmp1=sqrt(wlp(ix^d,rho_))
1642 tmp2=sqrt(wrp(ix^d,rho_))
1643 tmp3=1.d0/(tmp1+tmp2)
1644 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
1645 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
1646 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
1647 cmin(ix^d,1)=umean-dmean
1648 cmax(ix^d,1)=umean+dmean
1649 {end do\}
1650 if(h_correction) then
1651 {do ix^db=ixomin^db,ixomax^db\}
1652 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
1653 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
1654 {end do\}
1655 end if
1656 else
1657 {do ix^db=ixomin^db,ixomax^db\}
1658 tmp1=sqrt(wlp(ix^d,rho_))
1659 tmp2=sqrt(wrp(ix^d,rho_))
1660 tmp3=1.d0/(tmp1+tmp2)
1661 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
1662 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
1663 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
1664 cmax(ix^d,1)=abs(umean)+dmean
1665 {end do\}
1666 end if
1667 case (2)
1668 wmean(ixo^s,1:nwflux)=0.5d0*(wlp(ixo^s,1:nwflux)+wrp(ixo^s,1:nwflux))
1669 call rmhd_get_csound_prim(wmean,x,ixi^l,ixo^l,idim,csoundr)
1670 if(present(cmin)) then
1671 {do ix^db=ixomin^db,ixomax^db\}
1672 cmax(ix^d,1)=max(wmean(ix^d,mom(idim))+csoundr(ix^d),zero)
1673 cmin(ix^d,1)=min(wmean(ix^d,mom(idim))-csoundr(ix^d),zero)
1674 {end do\}
1675 if(h_correction) then
1676 {do ix^db=ixomin^db,ixomax^db\}
1677 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
1678 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
1679 {end do\}
1680 end if
1681 else
1682 cmax(ixo^s,1)=abs(wmean(ixo^s,mom(idim)))+csoundr(ixo^s)
1683 end if
1684 case (3)
1685 ! Miyoshi 2005 JCP 208, 315 equation (67)
1686 call rmhd_get_csound_prim(wlp,x,ixi^l,ixo^l,idim,csoundl)
1687 call rmhd_get_csound_prim(wrp,x,ixi^l,ixo^l,idim,csoundr)
1688 if(present(cmin)) then
1689 {do ix^db=ixomin^db,ixomax^db\}
1690 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
1691 cmin(ix^d,1)=min(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))-csoundl(ix^d)
1692 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
1693 {end do\}
1694 if(h_correction) then
1695 {do ix^db=ixomin^db,ixomax^db\}
1696 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
1697 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
1698 {end do\}
1699 end if
1700 else
1701 {do ix^db=ixomin^db,ixomax^db\}
1702 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
1703 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
1704 {end do\}
1705 end if
1706 end select
1707 end subroutine rmhd_get_cbounds
1708
1709 !> Estimating bounds for the minimum and maximum signal velocities with rho split
1710 subroutine rmhd_get_cbounds_split_rho(wLC,wRC,wLp,wRp,x,ixI^L,ixO^L,idim,Hspeed,cmax,cmin)
1712 integer, intent(in) :: ixi^l, ixo^l, idim
1713 double precision, intent(in) :: wlc(ixi^s, nw), wrc(ixi^s, nw)
1714 double precision, intent(in) :: wlp(ixi^s, nw), wrp(ixi^s, nw)
1715 double precision, intent(in) :: x(ixi^s,1:ndim)
1716 double precision, intent(inout) :: cmax(ixi^s,1:number_species)
1717 double precision, intent(inout), optional :: cmin(ixi^s,1:number_species)
1718 double precision, intent(in) :: hspeed(ixi^s,1:number_species)
1719 double precision :: wmean(ixi^s,nw), csoundl(ixo^s), csoundr(ixo^s)
1720 double precision :: umean, dmean, tmp1, tmp2, tmp3
1721 integer :: ix^d
1722
1723 select case (boundspeed)
1724 case (1)
1725 ! This implements formula (10.52) from "Riemann Solvers and Numerical
1726 ! Methods for Fluid Dynamics" by Toro.
1727 call rmhd_get_csound_prim_split(wlp,x,ixi^l,ixo^l,idim,csoundl)
1728 call rmhd_get_csound_prim_split(wrp,x,ixi^l,ixo^l,idim,csoundr)
1729 if(present(cmin)) then
1730 {do ix^db=ixomin^db,ixomax^db\}
1731 tmp1=sqrt(wlp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1732 tmp2=sqrt(wrp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1733 tmp3=1.d0/(tmp1+tmp2)
1734 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
1735 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
1736 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
1737 cmin(ix^d,1)=umean-dmean
1738 cmax(ix^d,1)=umean+dmean
1739 {end do\}
1740 if(h_correction) then
1741 {do ix^db=ixomin^db,ixomax^db\}
1742 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
1743 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
1744 {end do\}
1745 end if
1746 else
1747 {do ix^db=ixomin^db,ixomax^db\}
1748 tmp1=sqrt(wlp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1749 tmp2=sqrt(wrp(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1750 tmp3=1.d0/(tmp1+tmp2)
1751 umean=(wlp(ix^d,mom(idim))*tmp1+wrp(ix^d,mom(idim))*tmp2)*tmp3
1752 dmean=sqrt((tmp1*csoundl(ix^d)**2+tmp2*csoundr(ix^d)**2)*tmp3+&
1753 half*tmp1*tmp2*tmp3**2*(wrp(ix^d,mom(idim))-wlp(ix^d,mom(idim)))**2)
1754 cmax(ix^d,1)=abs(umean)+dmean
1755 {end do\}
1756 end if
1757 case (2)
1758 wmean(ixo^s,1:nwflux)=0.5d0*(wlp(ixo^s,1:nwflux)+wrp(ixo^s,1:nwflux))
1759 call rmhd_get_csound_prim_split(wmean,x,ixi^l,ixo^l,idim,csoundr)
1760 if(present(cmin)) then
1761 {do ix^db=ixomin^db,ixomax^db\}
1762 cmax(ix^d,1)=max(wmean(ix^d,mom(idim))+csoundr(ix^d),zero)
1763 cmin(ix^d,1)=min(wmean(ix^d,mom(idim))-csoundr(ix^d),zero)
1764 {end do\}
1765 if(h_correction) then
1766 {do ix^db=ixomin^db,ixomax^db\}
1767 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
1768 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
1769 {end do\}
1770 end if
1771 else
1772 cmax(ixo^s,1)=abs(wmean(ixo^s,mom(idim)))+csoundr(ixo^s)
1773 end if
1774 case (3)
1775 ! Miyoshi 2005 JCP 208, 315 equation (67)
1776 call rmhd_get_csound_prim_split(wlp,x,ixi^l,ixo^l,idim,csoundl)
1777 call rmhd_get_csound_prim_split(wrp,x,ixi^l,ixo^l,idim,csoundr)
1778 if(present(cmin)) then
1779 {do ix^db=ixomin^db,ixomax^db\}
1780 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
1781 cmin(ix^d,1)=min(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))-csoundl(ix^d)
1782 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
1783 {end do\}
1784 if(h_correction) then
1785 {do ix^db=ixomin^db,ixomax^db\}
1786 cmin(ix^d,1)=sign(one,cmin(ix^d,1))*max(abs(cmin(ix^d,1)),hspeed(ix^d,1))
1787 cmax(ix^d,1)=sign(one,cmax(ix^d,1))*max(abs(cmax(ix^d,1)),hspeed(ix^d,1))
1788 {end do\}
1789 end if
1790 else
1791 {do ix^db=ixomin^db,ixomax^db\}
1792 csoundl(ix^d)=max(csoundl(ix^d),csoundr(ix^d))
1793 cmax(ix^d,1)=max(wlp(ix^d,mom(idim)),wrp(ix^d,mom(idim)))+csoundl(ix^d)
1794 {end do\}
1795 end if
1796 end select
1797 end subroutine rmhd_get_cbounds_split_rho
1798
1799 !> prepare velocities for ct methods
1800 subroutine rmhd_get_ct_velocity(vcts,wLp,wRp,ixI^L,ixO^L,idim,cmax,cmin)
1802 integer, intent(in) :: ixi^l, ixo^l, idim
1803 double precision, intent(in) :: wlp(ixi^s, nw), wrp(ixi^s, nw)
1804 double precision, intent(in) :: cmax(ixi^s)
1805 double precision, intent(in), optional :: cmin(ixi^s)
1806 type(ct_velocity), intent(inout) :: vcts
1807 integer :: idime,idimn
1808
1809 ! calculate velocities related to different UCT schemes
1810 select case(type_ct)
1811 case('average')
1812 case('uct_contact')
1813 if(.not.allocated(vcts%vnorm)) allocate(vcts%vnorm(ixi^s,1:ndim))
1814 ! get average normal velocity at cell faces
1815 vcts%vnorm(ixo^s,idim)=0.5d0*(wlp(ixo^s,mom(idim))+wrp(ixo^s,mom(idim)))
1816 case('uct_hll')
1817 if(.not.allocated(vcts%vbarC)) then
1818 allocate(vcts%vbarC(ixi^s,1:ndir,2),vcts%vbarLC(ixi^s,1:ndir,2),vcts%vbarRC(ixi^s,1:ndir,2))
1819 allocate(vcts%cbarmin(ixi^s,1:ndim),vcts%cbarmax(ixi^s,1:ndim))
1820 end if
1821 ! Store magnitude of characteristics
1822 if(present(cmin)) then
1823 vcts%cbarmin(ixo^s,idim)=max(-cmin(ixo^s),zero)
1824 vcts%cbarmax(ixo^s,idim)=max( cmax(ixo^s),zero)
1825 else
1826 vcts%cbarmax(ixo^s,idim)=max( cmax(ixo^s),zero)
1827 vcts%cbarmin(ixo^s,idim)=vcts%cbarmax(ixo^s,idim)
1828 end if
1829
1830 idimn=mod(idim,ndir)+1 ! 'Next' direction
1831 idime=mod(idim+1,ndir)+1 ! Electric field direction
1832 ! Store velocities
1833 vcts%vbarLC(ixo^s,idim,1)=wlp(ixo^s,mom(idimn))
1834 vcts%vbarRC(ixo^s,idim,1)=wrp(ixo^s,mom(idimn))
1835 vcts%vbarC(ixo^s,idim,1)=(vcts%cbarmax(ixo^s,idim)*vcts%vbarLC(ixo^s,idim,1) &
1836 +vcts%cbarmin(ixo^s,idim)*vcts%vbarRC(ixo^s,idim,1))&
1837 /(vcts%cbarmax(ixo^s,idim)+vcts%cbarmin(ixo^s,idim))
1838 vcts%vbarLC(ixo^s,idim,2)=wlp(ixo^s,mom(idime))
1839 vcts%vbarRC(ixo^s,idim,2)=wrp(ixo^s,mom(idime))
1840 vcts%vbarC(ixo^s,idim,2)=(vcts%cbarmax(ixo^s,idim)*vcts%vbarLC(ixo^s,idim,2) &
1841 +vcts%cbarmin(ixo^s,idim)*vcts%vbarRC(ixo^s,idim,1))&
1842 /(vcts%cbarmax(ixo^s,idim)+vcts%cbarmin(ixo^s,idim))
1843 case default
1844 call mpistop('choose average, uct_contact,or uct_hll for type_ct!')
1845 end select
1846 end subroutine rmhd_get_ct_velocity
1847
1848 !> Calculate fast magnetosonic wave speed
1849 subroutine rmhd_get_csound_prim(w,x,ixI^L,ixO^L,idim,csound)
1851 integer, intent(in) :: ixi^l, ixo^l, idim
1852 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
1853 double precision, intent(out):: csound(ixo^s)
1854 double precision :: inv_rho, cfast2, avmincs2, b2, kmax
1855 double precision :: prad_tensor(ixo^s, 1:ndim, 1:ndim)
1856 double precision :: prad_max(ixo^s)
1857 integer :: ix^d
1858
1859 call rmhd_get_pradiation(w, x, ixi^l, ixo^l, prad_tensor, nghostcells-1)
1860 !> filter cmax
1861 if(radio_acoustic_filter) then
1862 call rmhd_radio_acoustic_filter(x, ixi^l, ixo^l, prad_max)
1863 endif
1864 ! store |B|^2 in v
1865 if(b0field) then
1866 {do ix^db=ixomin^db,ixomax^db \}
1867 inv_rho=1.d0/w(ix^d,rho_)
1868 prad_max(ix^d) = maxval(prad_tensor(ix^d,:,:))
1869 if(rmhd_energy) then
1870 csound(ix^d)=max(rmhd_gamma,4.d0/3.d0)*(w(ix^d,p_)+prad_max(ix^d))*inv_rho
1871 else
1872 csound(ix^d)=rmhd_gamma*rmhd_adiab*w(ix^d,rho_)**gamma_1
1873 end if
1874 b2=(^c&(w(ix^d,b^c_)+block%B0(ix^d,^c,b0i))**2+)
1875 cfast2=b2*inv_rho+csound(ix^d)
1876 avmincs2=cfast2**2-4.0d0*csound(ix^d)*(w(ix^d,mag(idim))+&
1877 block%B0(ix^d,idim,b0i))**2*inv_rho
1878 if(avmincs2<zero) avmincs2=zero
1879 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
1880 {end do\}
1881 else
1882 {do ix^db=ixomin^db,ixomax^db \}
1883 inv_rho=1.d0/w(ix^d,rho_)
1884 prad_max(ix^d)=maxval(prad_tensor(ix^d,:,:))
1885 if(rmhd_energy) then
1886 csound(ix^d)=max(rmhd_gamma,4.d0/3.d0)*(w(ix^d,p_)+prad_max(ix^d))*inv_rho
1887 else
1888 csound(ix^d)=rmhd_gamma*rmhd_adiab*w(ix^d,rho_)**gamma_1
1889 end if
1890 b2=(^c&w(ix^d,b^c_)**2+)
1891 cfast2=b2*inv_rho+csound(ix^d)
1892 avmincs2=cfast2**2-4.0d0*csound(ix^d)*w(ix^d,mag(idim))**2*inv_rho
1893 if(avmincs2<zero) avmincs2=zero
1894 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
1895 {end do\}
1896 end if
1897 end subroutine rmhd_get_csound_prim
1898
1899 !> Calculate fast magnetosonic wave speed
1900 subroutine rmhd_get_csound_prim_split(w,x,ixI^L,ixO^L,idim,csound)
1902 integer, intent(in) :: ixi^l, ixo^l, idim
1903 double precision, intent(in) :: w(ixi^s, nw), x(ixi^s,1:ndim)
1904 double precision, intent(out):: csound(ixo^s)
1905 double precision :: rho, inv_rho, cfast2, avmincs2, b2, kmax
1906 double precision :: prad_tensor(ixo^s, 1:ndim, 1:ndim)
1907 double precision :: prad_max(ixo^s)
1908 integer :: ix^d
1909
1910 call rmhd_get_pradiation(w, x, ixi^l, ixo^l, prad_tensor, nghostcells-1)
1911 !> filter cmax
1912 if (radio_acoustic_filter) then
1913 call rmhd_radio_acoustic_filter(x, ixi^l, ixo^l, prad_max)
1914 endif
1915
1916 ! store |B|^2 in v
1917 if(b0field) then
1918 {do ix^db=ixomin^db,ixomax^db \}
1919 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1920 inv_rho=1.d0/rho
1921 prad_max(ix^d) = maxval(prad_tensor(ix^d,:,:))
1922 if(has_equi_pe0) then
1923 csound(ix^d)=max(rmhd_gamma,4.d0/3.d0)*(w(ix^d,p_)+block%equi_vars(ix^d,equi_pe0_,b0i)+prad_max(ix^d))*inv_rho
1924 end if
1925 b2=(^c&(w(ix^d,b^c_)+block%B0(ix^d,^c,b0i))**2+)
1926 cfast2=b2*inv_rho+csound(ix^d)
1927 avmincs2=cfast2**2-4.0d0*csound(ix^d)*(w(ix^d,mag(idim))+&
1928 block%B0(ix^d,idim,b0i))**2*inv_rho
1929 if(avmincs2<zero) avmincs2=zero
1930 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
1931 {end do\}
1932 else
1933 {do ix^db=ixomin^db,ixomax^db \}
1934 rho=(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
1935 inv_rho=1.d0/rho
1936 prad_max(ix^d) = maxval(prad_tensor(ix^d,:,:))
1937 if(has_equi_pe0) then
1938 csound(ix^d)=max(rmhd_gamma,4.d0/3.d0)*(w(ix^d,p_)+block%equi_vars(ix^d,equi_pe0_,b0i)+prad_max(ix^d))*inv_rho
1939 end if
1940 b2=(^c&w(ix^d,b^c_)**2+)
1941 cfast2=b2*inv_rho+csound(ix^d)
1942 avmincs2=cfast2**2-4.0d0*csound(ix^d)*w(ix^d,mag(idim))**2*inv_rho
1943 if(avmincs2<zero) avmincs2=zero
1944 csound(ix^d)=sqrt(half*(cfast2+sqrt(avmincs2)))
1945 {end do\}
1946 end if
1947 end subroutine rmhd_get_csound_prim_split
1948
1949 !> Calculate thermal pressure=(gamma-1)*(e-0.5*m**2/rho-b**2/2) within ixO^L
1950 subroutine rmhd_get_pthermal_origin(w,x,ixI^L,ixO^L,pth)
1953
1954 integer, intent(in) :: ixi^l, ixo^l
1955 double precision, intent(in) :: w(ixi^s,nw)
1956 double precision, intent(in) :: x(ixi^s,1:ndim)
1957 double precision, intent(out):: pth(ixi^s)
1958
1959 integer :: iw, ix^d
1960
1961 {do ix^db=ixomin^db,ixomax^db\}
1962 if(has_equi_rho0) then
1963 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))&
1964 +(^c&w(ix^d,b^c_)**2+)))+block%equi_vars(ix^d,equi_pe0_,0)
1965 else
1966 pth(ix^d)=gamma_1*(w(ix^d,e_)-half*((^c&w(ix^d,m^c_)**2+)/w(ix^d,rho_)&
1967 +(^c&w(ix^d,b^c_)**2+)))
1968 end if
1969 if(fix_small_values.and.pth(ix^d)<small_pressure) pth(ix^d)=small_pressure
1970 {end do\}
1971
1972 if(check_small_values.and..not.fix_small_values) then
1973 {do ix^db=ixomin^db,ixomax^db\}
1974 if(pth(ix^d)<small_pressure) then
1975 write(*,*) "Error: small value of gas pressure",pth(ix^d),&
1976 " encountered when call rmhd_get_pthermal"
1977 write(*,*) "Iteration: ", it, " Time: ", global_time
1978 write(*,*) "Location: ", x(ix^d,:)
1979 write(*,*) "Cell number: ", ix^d
1980 do iw=1,nw
1981 write(*,*) trim(cons_wnames(iw)),": ",w(ix^d,iw)
1982 end do
1983 ! use erroneous arithmetic operation to crash the run
1984 if(trace_small_values) write(*,*) sqrt(pth(ix^d)-bigdouble)
1985 write(*,*) "Saving status at the previous time step"
1986 crash=.true.
1987 end if
1988 {end do\}
1989 end if
1990 end subroutine rmhd_get_pthermal_origin
1991
1992 !> copy temperature from stored Te variable
1993 subroutine rmhd_get_temperature_from_te(w, x, ixI^L, ixO^L, res)
1995 integer, intent(in) :: ixi^l, ixo^l
1996 double precision, intent(in) :: w(ixi^s, 1:nw)
1997 double precision, intent(in) :: x(ixi^s, 1:ndim)
1998 double precision, intent(out):: res(ixi^s)
1999 res(ixo^s) = w(ixo^s, te_)
2000 end subroutine rmhd_get_temperature_from_te
2001
2002 !> Calculate temperature=p/rho when in e_ the internal energy is stored
2003 subroutine rmhd_get_temperature_from_eint(w, x, ixI^L, ixO^L, res)
2005 integer, intent(in) :: ixi^l, ixo^l
2006 double precision, intent(in) :: w(ixi^s, 1:nw)
2007 double precision, intent(in) :: x(ixi^s, 1:ndim)
2008 double precision, intent(out):: res(ixi^s)
2009 double precision :: r(ixi^s)
2010
2011 call rmhd_get_rfactor(w,x,ixi^l,ixo^l,r)
2012 res(ixo^s) = gamma_1 * w(ixo^s, e_)/(w(ixo^s,rho_)*r(ixo^s))
2013 end subroutine rmhd_get_temperature_from_eint
2014
2015 !> Calculate temperature=p/rho when in e_ the total energy is stored
2016 subroutine rmhd_get_temperature_from_etot(w, x, ixI^L, ixO^L, res)
2018 integer, intent(in) :: ixi^l, ixo^l
2019 double precision, intent(in) :: w(ixi^s, 1:nw)
2020 double precision, intent(in) :: x(ixi^s, 1:ndim)
2021 double precision, intent(out):: res(ixi^s)
2022 double precision :: r(ixi^s)
2023
2024 call rmhd_get_rfactor(w,x,ixi^l,ixo^l,r)
2025 call rmhd_get_pthermal(w,x,ixi^l,ixo^l,res)
2026 res(ixo^s)=res(ixo^s)/(r(ixo^s)*w(ixo^s,rho_))
2027 end subroutine rmhd_get_temperature_from_etot
2028
2029 subroutine rmhd_get_temperature_from_etot_with_equi(w, x, ixI^L, ixO^L, res)
2031 integer, intent(in) :: ixi^l, ixo^l
2032 double precision, intent(in) :: w(ixi^s, 1:nw)
2033 double precision, intent(in) :: x(ixi^s, 1:ndim)
2034 double precision, intent(out):: res(ixi^s)
2035 double precision :: r(ixi^s)
2036
2037 call rmhd_get_rfactor(w,x,ixi^l,ixo^l,r)
2038 call rmhd_get_pthermal(w,x,ixi^l,ixo^l,res)
2039 res(ixo^s)=res(ixo^s)/(r(ixo^s)*(w(ixo^s,rho_)+block%equi_vars(ixo^s,equi_rho0_,b0i)))
2040 end subroutine rmhd_get_temperature_from_etot_with_equi
2041
2042 subroutine rmhd_get_temperature_from_eint_with_equi(w, x, ixI^L, ixO^L, res)
2044 integer, intent(in) :: ixi^l, ixo^l
2045 double precision, intent(in) :: w(ixi^s, 1:nw)
2046 double precision, intent(in) :: x(ixi^s, 1:ndim)
2047 double precision, intent(out):: res(ixi^s)
2048 double precision :: r(ixi^s)
2049
2050 call rmhd_get_rfactor(w,x,ixi^l,ixo^l,r)
2051 res(ixo^s) = (gamma_1 * w(ixo^s, e_) + block%equi_vars(ixo^s,equi_pe0_,b0i)) /&
2052 ((w(ixo^s,rho_) +block%equi_vars(ixo^s,equi_rho0_,b0i))*r(ixo^s))
2053 end subroutine rmhd_get_temperature_from_eint_with_equi
2054
2055 subroutine rmhd_get_temperature_equi(w,x, ixI^L, ixO^L, res)
2057 integer, intent(in) :: ixi^l, ixo^l
2058 double precision, intent(in) :: w(ixi^s, 1:nw)
2059 double precision, intent(in) :: x(ixi^s, 1:ndim)
2060 double precision, intent(out):: res(ixi^s)
2061 double precision :: r(ixi^s)
2062
2063 call rmhd_get_rfactor(w,x,ixi^l,ixo^l,r)
2064 res(ixo^s)= block%equi_vars(ixo^s,equi_pe0_,b0i)/(block%equi_vars(ixo^s,equi_rho0_,b0i)*r(ixo^s))
2065 end subroutine rmhd_get_temperature_equi
2066
2067 subroutine rmhd_get_rho_equi(w, x, ixI^L, ixO^L, res)
2069 integer, intent(in) :: ixi^l, ixo^l
2070 double precision, intent(in) :: w(ixi^s, 1:nw)
2071 double precision, intent(in) :: x(ixi^s, 1:ndim)
2072 double precision, intent(out):: res(ixi^s)
2073 res(ixo^s) = block%equi_vars(ixo^s,equi_rho0_,b0i)
2074 end subroutine rmhd_get_rho_equi
2075
2076 subroutine rmhd_get_pe_equi(w,x, ixI^L, ixO^L, res)
2078 integer, intent(in) :: ixi^l, ixo^l
2079 double precision, intent(in) :: w(ixi^s, 1:nw)
2080 double precision, intent(in) :: x(ixi^s, 1:ndim)
2081 double precision, intent(out):: res(ixi^s)
2082 res(ixo^s) = block%equi_vars(ixo^s,equi_pe0_,b0i)
2083 end subroutine rmhd_get_pe_equi
2084
2085 !> Calculate total pressure within ixO^L including magnetic pressure
2086 subroutine rmhd_get_p_total(w,x,ixI^L,ixO^L,p)
2088 integer, intent(in) :: ixi^l, ixo^l
2089 double precision, intent(in) :: w(ixi^s,nw)
2090 double precision, intent(in) :: x(ixi^s,1:ndim)
2091 double precision, intent(out) :: p(ixi^s)
2092
2093 call rmhd_get_pthermal(w,x,ixi^l,ixo^l,p)
2094 p(ixo^s) = p(ixo^s) + 0.5d0 * sum(w(ixo^s, mag(:))**2, dim=ndim+1)
2095 end subroutine rmhd_get_p_total
2096
2097 !> Calculate radiation pressure within ixO^L
2098 subroutine rmhd_get_pradiation(w, x, ixI^L, ixO^L, prad, nth)
2100 use mod_fld
2101 use mod_afld
2102 integer, intent(in) :: ixi^l, ixo^l, nth
2103 double precision, intent(in) :: w(ixi^s, 1:nw)
2104 double precision, intent(in) :: x(ixi^s, 1:ndim)
2105 double precision, intent(out):: prad(ixo^s, 1:ndim, 1:ndim)
2106
2107 select case (rmhd_radiation_formalism)
2108 case('fld')
2109 call fld_get_radpress(w, x, ixi^l, ixo^l, prad, nth)
2110 case('afld')
2111 call afld_get_radpress(w, x, ixi^l, ixo^l, prad, nth)
2112 case default
2113 call mpistop('Radiation formalism unknown')
2114 end select
2115 end subroutine rmhd_get_pradiation
2116
2117 !> Calculates the sum of the gas pressure and the max Prad tensor element
2118 subroutine rmhd_get_pthermal_plus_pradiation(w, x, ixI^L, ixO^L, pth_plus_prad)
2120 integer, intent(in) :: ixi^l, ixo^l
2121 double precision, intent(in) :: w(ixi^s, 1:nw)
2122 double precision, intent(in) :: x(ixi^s, 1:ndim)
2123 double precision :: pth(ixi^s)
2124 double precision :: prad_tensor(ixo^s, 1:ndim, 1:ndim)
2125 double precision :: prad_max(ixo^s)
2126 double precision, intent(out) :: pth_plus_prad(ixi^s)
2127 integer :: ix^d
2128
2129 call rmhd_get_pthermal(w, x, ixi^l, ixo^l, pth)
2130 call rmhd_get_pradiation(w, x, ixi^l, ixo^l, prad_tensor, nghostcells)
2131 {do ix^d = ixomin^d,ixomax^d\}
2132 prad_max(ix^d) = maxval(prad_tensor(ix^d,:,:))
2133 {enddo\}
2134 !> filter cmax
2135 if (radio_acoustic_filter) then
2136 call rmhd_radio_acoustic_filter(x, ixi^l, ixo^l, prad_max)
2137 endif
2138 pth_plus_prad(ixo^s) = pth(ixo^s) + prad_max(ixo^s)
2140
2141 !> Filter peaks in cmax due to radiation energy density, used for debugging
2142 subroutine rmhd_radio_acoustic_filter(x, ixI^L, ixO^L, prad_max)
2144 integer, intent(in) :: ixi^l, ixo^l
2145 double precision, intent(in) :: x(ixi^s, 1:ndim)
2146 double precision, intent(inout) :: prad_max(ixo^s)
2147 double precision :: tmp_prad(ixi^s)
2148 integer :: ix^d, filter, idim
2149
2150 if (size_ra_filter .lt. 1) call mpistop("ra filter of size < 1 makes no sense")
2151 if (size_ra_filter .gt. nghostcells) call mpistop("ra filter of size < nghostcells makes no sense")
2152
2153 tmp_prad(ixi^s) = zero
2154 tmp_prad(ixo^s) = prad_max(ixo^s)
2155 do filter = 1,size_ra_filter
2156 do idim = 1,ndim
2157 ! {do ix^D = ixOmin^D+filter,ixOmax^D-filter\}
2158 {do ix^d = ixomin^d,ixomax^d\}
2159 prad_max(ix^d) = min(tmp_prad(ix^d),tmp_prad(ix^d+filter*kr(idim,^d)))
2160 prad_max(ix^d) = min(tmp_prad(ix^d),tmp_prad(ix^d-filter*kr(idim,^d)))
2161 {enddo\}
2162 enddo
2163 enddo
2164 end subroutine rmhd_radio_acoustic_filter
2165
2166 !> Calculates gas temperature
2167 subroutine rmhd_get_tgas(w, x, ixI^L, ixO^L, tgas)
2169 integer, intent(in) :: ixi^l, ixo^l
2170 double precision, intent(in) :: w(ixi^s, 1:nw)
2171 double precision, intent(in) :: x(ixi^s, 1:ndim)
2172 double precision :: pth(ixi^s)
2173 double precision, intent(out):: tgas(ixi^s)
2174
2175 call rmhd_get_pthermal(w, x, ixi^l, ixo^l, pth)
2176 tgas(ixi^s) = pth(ixi^s)/w(ixi^s,rho_)
2177 end subroutine rmhd_get_tgas
2178
2179 !> Calculates radiation temperature
2180 subroutine rmhd_get_trad(w, x, ixI^L, ixO^L, trad)
2182 use mod_constants
2183
2184 integer, intent(in) :: ixi^l, ixo^l
2185 double precision, intent(in) :: w(ixi^s, 1:nw)
2186 double precision, intent(in) :: x(ixi^s, 1:ndim)
2187 double precision, intent(out):: trad(ixi^s)
2188
2189 trad(ixi^s) = (w(ixi^s,r_e)*unit_pressure&
2190 /const_rad_a)**(1.d0/4.d0)/unit_temperature
2191 end subroutine rmhd_get_trad
2192
2193 !> Calculate fluxes within ixO^L without any splitting
2194 subroutine rmhd_get_flux(wC,w,x,ixI^L,ixO^L,idim,f)
2196 use mod_geometry
2197
2198 integer, intent(in) :: ixi^l, ixo^l, idim
2199 ! conservative w
2200 double precision, intent(in) :: wc(ixi^s,nw)
2201 ! primitive w
2202 double precision, intent(in) :: w(ixi^s,nw)
2203 double precision, intent(in) :: x(ixi^s,1:ndim)
2204 double precision,intent(out) :: f(ixi^s,nwflux)
2205 double precision :: vhall(ixi^s,1:ndir)
2206 double precision :: ptotal
2207 integer :: iw, ix^d
2208
2209 {do ix^db=ixomin^db,ixomax^db\}
2210 ! Get flux of density
2211 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
2212 ! f_i[m_k]=v_i*m_k-b_k*b_i
2213 ^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_)\
2214 ptotal=w(ix^d,p_)+half*(^c&w(ix^d,b^c_)**2+)
2215 ! normal one includes total pressure
2216 f(ix^d,mom(idim))=f(ix^d,mom(idim))+ptotal
2217 ! Get flux of total energy
2218 ! f_i[e]=v_i*e+v_i*ptotal-b_i*(b_k*v_k)
2219 f(ix^d,e_)=w(ix^d,mom(idim))*(wc(ix^d,e_)+ptotal)&
2220 -w(ix^d,mag(idim))*(^c&w(ix^d,b^c_)*w(ix^d,m^c_)+)
2221 ! f_i[b_k]=v_i*b_k-v_k*b_i
2222 ^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_)\
2223 {end do\}
2224 if(rmhd_glm) then
2225 {do ix^db=ixomin^db,ixomax^db\}
2226 f(ix^d,mag(idim))=w(ix^d,psi_)
2227 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
2228 f(ix^d,psi_)=cmax_global**2*w(ix^d,mag(idim))
2229 {end do\}
2230 end if
2232 {do ix^db=ixomin^db,ixomax^db\}
2233 f(ix^d,r_e)=w(ix^d,mom(idim))*wc(ix^d,r_e)
2234 {end do\}
2235 else
2236 f(ixo^s,r_e)=zero
2237 endif
2238 ! Get flux of tracer
2239 do iw=1,rmhd_n_tracer
2240 {do ix^db=ixomin^db,ixomax^db\}
2241 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
2242 {end do\}
2243 end do
2245 {do ix^db=ixomin^db,ixomax^db\}
2246 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)
2247 f(ix^d,q_)=zero
2248 {end do\}
2249 end if
2250 end subroutine rmhd_get_flux
2251
2252 !> Calculate fluxes within ixO^L with possible splitting
2253 subroutine rmhd_get_flux_split(wC,w,x,ixI^L,ixO^L,idim,f)
2255 use mod_geometry
2256 integer, intent(in) :: ixi^l, ixo^l, idim
2257 ! conservative w
2258 double precision, intent(in) :: wc(ixi^s,nw)
2259 ! primitive w
2260 double precision, intent(in) :: w(ixi^s,nw)
2261 double precision, intent(in) :: x(ixi^s,1:ndim)
2262 double precision,intent(out) :: f(ixi^s,nwflux)
2263 double precision :: vhall(ixi^s,1:ndir)
2264 double precision :: ptotal, btotal(ixo^s,1:ndir)
2265 integer :: iw, ix^d
2266
2267 {do ix^db=ixomin^db,ixomax^db\}
2268 ! Get flux of density
2269 if(has_equi_rho0) then
2270 f(ix^d,rho_)=w(ix^d,mom(idim))*(w(ix^d,rho_)+block%equi_vars(ix^d,equi_rho0_,b0i))
2271 else
2272 f(ix^d,rho_)=w(ix^d,mom(idim))*w(ix^d,rho_)
2273 endif
2274 if(rmhd_energy) then
2275 ptotal=w(ix^d,p_)+half*(^c&w(ix^d,b^c_)**2+)
2276 else
2277 ptotal=rmhd_adiab*w(ix^d,rho_)**rmhd_gamma+half*(^c&w(ix^d,b^c_)**2+)
2278 if(has_equi_pe0) then
2279 ptotal=ptotal-block%equi_vars(ix^d,equi_pe0_,b0i)
2280 end if
2281 end if
2282 if(b0field) then
2283 ^c&btotal(ix^d,^c)=w(ix^d,b^c_)+block%B0(ix^d,^c,idim)\
2284 ptotal=ptotal+(^c&w(ix^d,b^c_)*block%B0(ix^d,^c,idim)+)
2285 ! Get flux of momentum and magnetic field
2286 ! f_i[m_k]=v_i*m_k-b_k*b_i
2287 ^c&f(ix^d,m^c_)=wc(ix^d,mom(idim))*w(ix^d,m^c_)-&
2288 btotal(ix^d,idim)*w(ix^d,b^c_)-w(ix^d,mag(idim))*block%B0(ix^d,^c,idim)\
2289 f(ix^d,mom(idim))=f(ix^d,mom(idim))+ptotal
2290 else
2291 ^c&btotal(ix^d,^c)=w(ix^d,b^c_)\
2292 ! Get flux of momentum and magnetic field
2293 ! f_i[m_k]=v_i*m_k-b_k*b_i
2294 ^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_)\
2295 f(ix^d,mom(idim))=f(ix^d,mom(idim))+ptotal
2296 end if
2297 ! f_i[b_k]=v_i*b_k-v_k*b_i
2298 ^c&f(ix^d,b^c_)=w(ix^d,mom(idim))*btotal(ix^d,^c)-btotal(ix^d,idim)*w(ix^d,m^c_)\
2299 ! Get flux of energy
2300 ! f_i[e]=v_i*e+v_i*ptotal-b_i*(b_k*v_k)
2301 if(rmhd_energy) then
2302 f(ix^d,e_)=w(ix^d,mom(idim))*(wc(ix^d,e_)+ptotal)&
2303 -btotal(ix^d,idim)*(^c&w(ix^d,b^c_)*w(ix^d,m^c_)+)
2304 end if
2305 {end do\}
2306 if(rmhd_glm) then
2307 {do ix^db=ixomin^db,ixomax^db\}
2308 f(ix^d,mag(idim))=w(ix^d,psi_)
2309 !f_i[psi]=Ch^2*b_{i} Eq. 24e and Eq. 38c Dedner et al 2002 JCP, 175, 645
2310 f(ix^d,psi_) = cmax_global**2*w(ix^d,mag(idim))
2311 {end do\}
2312 end if
2314 {do ix^db=ixomin^db,ixomax^db\}
2315 f(ix^d,r_e)=w(ix^d,mom(idim))*wc(ix^d,r_e)
2316 {end do\}
2317 else
2318 f(ixo^s,r_e)=zero
2319 endif
2320 ! Get flux of tracer
2321 do iw=1,rmhd_n_tracer
2322 {do ix^db=ixomin^db,ixomax^db\}
2323 f(ix^d,tracer(iw))=w(ix^d,mom(idim))*w(ix^d,tracer(iw))
2324 {end do\}
2325 end do
2327 {do ix^db=ixomin^db,ixomax^db\}
2328 f(ix^d,e_)=f(ix^d,e_)+w(ix^d,q_)*btotal(ix^d,idim)/(dsqrt(^c&btotal(ix^d,^c)**2+)+smalldouble)
2329 f(ix^d,q_)=zero
2330 {end do\}
2331 end if
2332 end subroutine rmhd_get_flux_split
2333
2334 !> use cell-center flux to get cell-face flux
2335 !> and get the source term as the divergence of the flux
2336 subroutine get_flux_on_cell_face(ixI^L,ixO^L,ff,src)
2338
2339 integer, intent(in) :: ixi^l, ixo^l
2340 double precision, dimension(:^D&,:), intent(inout) :: ff
2341 double precision, intent(out) :: src(ixi^s)
2342
2343 double precision :: ffc(ixi^s,1:ndim)
2344 double precision :: dxinv(ndim)
2345 integer :: idims, ix^d, ixa^l, ixb^l, ixc^l
2346
2347 ixa^l=ixo^l^ladd1;
2348 dxinv=1.d0/dxlevel
2349 ! cell corner flux in ffc
2350 ffc=0.d0
2351 ixcmax^d=ixomax^d; ixcmin^d=ixomin^d-1;
2352 {do ix^db=0,1\}
2353 ixbmin^d=ixcmin^d+ix^d;
2354 ixbmax^d=ixcmax^d+ix^d;
2355 ffc(ixc^s,1:ndim)=ffc(ixc^s,1:ndim)+ff(ixb^s,1:ndim)
2356 {end do\}
2357 ffc(ixc^s,1:ndim)=0.5d0**ndim*ffc(ixc^s,1:ndim)
2358 ! flux at cell face
2359 ff(ixi^s,1:ndim)=0.d0
2360 do idims=1,ndim
2361 ixb^l=ixo^l-kr(idims,^d);
2362 ixcmax^d=ixomax^d; ixcmin^d=ixbmin^d;
2363 {do ix^db=0,1 \}
2364 if({ ix^d==0 .and. ^d==idims | .or.}) then
2365 ixbmin^d=ixcmin^d-ix^d;
2366 ixbmax^d=ixcmax^d-ix^d;
2367 ff(ixc^s,idims)=ff(ixc^s,idims)+ffc(ixb^s,idims)
2368 end if
2369 {end do\}
2370 ff(ixc^s,idims)=ff(ixc^s,idims)*0.5d0**(ndim-1)
2371 end do
2372 src=0.d0
2373 if(slab_uniform) then
2374 do idims=1,ndim
2375 ff(ixa^s,idims)=dxinv(idims)*ff(ixa^s,idims)
2376 ixb^l=ixo^l-kr(idims,^d);
2377 src(ixo^s)=src(ixo^s)+ff(ixo^s,idims)-ff(ixb^s,idims)
2378 end do
2379 else
2380 do idims=1,ndim
2381 ff(ixa^s,idims)=ff(ixa^s,idims)*block%surfaceC(ixa^s,idims)
2382 ixb^l=ixo^l-kr(idims,^d);
2383 src(ixo^s)=src(ixo^s)+ff(ixo^s,idims)-ff(ixb^s,idims)
2384 end do
2385 src(ixo^s)=src(ixo^s)/block%dvolume(ixo^s)
2386 end if
2387 end subroutine get_flux_on_cell_face
2388
2389 !> w[iws]=w[iws]+qdt*S[iws,wCT] where S is the source based on wCT within ixO
2390 subroutine rmhd_add_source(qdt,dtfactor,ixI^L,ixO^L,wCT,wCTprim,w,x,qsourcesplit,active)
2394 use mod_cak_force, only: cak_add_source
2395
2396 integer, intent(in) :: ixi^l, ixo^l
2397 double precision, intent(in) :: qdt,dtfactor
2398 double precision, intent(in) :: wct(ixi^s,1:nw),wctprim(ixi^s,1:nw), x(ixi^s,1:ndim)
2399 double precision, intent(inout) :: w(ixi^s,1:nw)
2400 logical, intent(in) :: qsourcesplit
2401 logical, intent(inout) :: active
2402
2403 ! TODO local_timestep support is only added for splitting
2404 ! but not for other nonideal terms such gravity, RC, viscosity,..
2405 ! it will also only work for divbfix 'linde', which does not require
2406 ! modification as it does not use dt in the update
2407 if (.not. qsourcesplit) then
2408 if(has_equi_pe0) then
2409 active = .true.
2410 call add_pe0_divv(qdt,dtfactor,ixi^l,ixo^l,wctprim,w,x)
2411 end if
2413 call add_hypertc_source(qdt,ixi^l,ixo^l,wct,w,x,wctprim)
2414 end if
2415 ! Source for B0 splitting
2416 if (b0field) then
2417 active = .true.
2418 call add_source_b0split(qdt,dtfactor,ixi^l,ixo^l,wctprim,w,x)
2419 end if
2420 ! Sources for resistivity in eqs. for e, B1, B2 and B3
2421 if (abs(rmhd_eta)>smalldouble)then
2422 active = .true.
2423 call add_source_res2(qdt,ixi^l,ixo^l,wct,w,x)
2424 end if
2425 if (rmhd_eta_hyper>0.d0)then
2426 active = .true.
2427 call add_source_hyperres(qdt,ixi^l,ixo^l,wct,w,x)
2428 end if
2429 end if
2430 {^nooned
2431 if(source_split_divb .eqv. qsourcesplit) then
2432 ! Sources related to div B
2433 select case (type_divb)
2434 case (divb_ct)
2435 continue ! Do nothing
2436 case (divb_linde)
2437 active = .true.
2438 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
2439 case (divb_glm)
2440 active = .true.
2441 call add_source_glm(qdt,ixi^l,ixo^l,wct,w,x)
2442 case (divb_powel)
2443 active = .true.
2444 call add_source_powel(qdt,ixi^l,ixo^l,wctprim,w,x)
2445 case (divb_janhunen)
2446 active = .true.
2447 call add_source_janhunen(qdt,ixi^l,ixo^l,wctprim,w,x)
2448 case (divb_lindejanhunen)
2449 active = .true.
2450 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
2451 call add_source_janhunen(qdt,ixi^l,ixo^l,wctprim,w,x)
2452 case (divb_lindepowel)
2453 active = .true.
2454 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
2455 call add_source_powel(qdt,ixi^l,ixo^l,wctprim,w,x)
2456 case (divb_lindeglm)
2457 active = .true.
2458 call add_source_linde(qdt,ixi^l,ixo^l,wct,w,x)
2459 call add_source_glm(qdt,ixi^l,ixo^l,wct,w,x)
2460 case (divb_multigrid)
2461 continue ! Do nothing
2462 case (divb_none)
2463 ! Do nothing
2464 case default
2465 call mpistop('Unknown divB fix')
2466 end select
2467 end if
2468 }
2469 if(rmhd_viscosity) then
2470 call viscosity_add_source(qdt,ixi^l,ixo^l,wct,&
2471 w,x,rmhd_energy,qsourcesplit,active)
2472 end if
2473 if(rmhd_gravity) then
2474 call gravity_add_source(qdt,ixi^l,ixo^l,wct,wctprim,&
2475 w,x,gravity_energy,gravity_rhov,qsourcesplit,active)
2476 end if
2477 if (rmhd_cak_force) then
2478 call cak_add_source(qdt,ixi^l,ixo^l,wct,w,x,rmhd_energy,qsourcesplit,active)
2479 end if
2480 !> This is where the radiation force and heating/cooling are added
2481 call rmhd_add_radiation_source(qdt,ixi^l,ixo^l,wct,w,x,qsourcesplit,active)
2482 ! update temperature from new pressure, density, and old ionization degree
2484 if(.not.qsourcesplit) then
2485 active = .true.
2486 call rmhd_update_temperature(ixi^l,ixo^l,wct,w,x)
2487 end if
2488 end if
2489 end subroutine rmhd_add_source
2490
2491 subroutine rmhd_add_radiation_source(qdt,ixI^L,ixO^L,wCT,w,x,qsourcesplit,active)
2492 use mod_constants
2494 use mod_usr_methods
2495 use mod_fld
2496 use mod_afld
2497 integer, intent(in) :: ixi^l, ixo^l
2498 double precision, intent(in) :: qdt, x(ixi^s,1:ndim)
2499 double precision, intent(in) :: wct(ixi^s,1:nw)
2500 double precision, intent(inout) :: w(ixi^s,1:nw)
2501 logical, intent(in) :: qsourcesplit
2502 logical, intent(inout) :: active
2503 double precision :: cmax(ixi^s)
2504
2505 select case(rmhd_radiation_formalism)
2506 case('fld')
2507 if(fld_diff_scheme .eq. 'mg') call fld_get_diffcoef_central(w, wct, x, ixi^l, ixo^l)
2508 !> radiation force
2509 if(rmhd_radiation_force) call get_fld_rad_force(qdt,ixi^l,ixo^l,wct,w,x,rmhd_energy,qsourcesplit,active)
2510 call rmhd_handle_small_values(.true., w, x, ixi^l, ixo^l, 'fld_e_interact')
2511 case('afld')
2512 if(fld_diff_scheme .eq. 'mg') call afld_get_diffcoef_central(w, wct, x, ixi^l, ixo^l)
2513 !> radiation force
2514 if(rmhd_radiation_force) call get_afld_rad_force(qdt,ixi^l,ixo^l,wct,w,x,rmhd_energy,qsourcesplit,active)
2515 call rmhd_handle_small_values(.true., w, x, ixi^l, ixo^l, 'fld_e_interact')
2516 !> photon tiring, heating and cooling
2517 if(rmhd_energy) then
2518 if (rmhd_energy_interact) call get_afld_energy_interact(qdt,ixi^l,ixo^l,wct,w,x,rmhd_energy,qsourcesplit,active)
2519 endif
2520 case default
2521 call mpistop('Radiation formalism unknown')
2522 end select
2523 end subroutine rmhd_add_radiation_source
2524
2525 subroutine add_pe0_divv(qdt,dtfactor,ixI^L,ixO^L,wCT,w,x)
2527 use mod_geometry
2528 integer, intent(in) :: ixi^l, ixo^l
2529 double precision, intent(in) :: qdt,dtfactor
2530 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
2531 double precision, intent(inout) :: w(ixi^s,1:nw)
2532 double precision :: divv(ixi^s)
2533
2534 if(slab_uniform) then
2535 if(nghostcells .gt. 2) then
2536 call divvector(wct(ixi^s,mom(1:ndir)),ixi^l,ixo^l,divv,3)
2537 else
2538 call divvector(wct(ixi^s,mom(1:ndir)),ixi^l,ixo^l,divv,2)
2539 end if
2540 else
2541 call divvector(wct(ixi^s,mom(1:ndir)),ixi^l,ixo^l,divv)
2542 end if
2543 if(local_timestep) then
2544 w(ixo^s,e_)=w(ixo^s,e_)-dtfactor*block%dt(ixo^s)*block%equi_vars(ixo^s,equi_pe0_,0)*divv(ixo^s)
2545 else
2546 w(ixo^s,e_)=w(ixo^s,e_)-qdt*block%equi_vars(ixo^s,equi_pe0_,0)*divv(ixo^s)
2547 end if
2548 end subroutine add_pe0_divv
2549
2550 subroutine get_tau(ixI^L,ixO^L,w,Te,tau,sigT5)
2552 integer, intent(in) :: ixi^l, ixo^l
2553 double precision, dimension(ixI^S,1:nw), intent(in) :: w
2554 double precision, dimension(ixI^S), intent(in) :: te
2555 double precision, dimension(ixI^S), intent(out) :: tau,sigt5
2556 double precision :: dxmin,taumin
2557 double precision, dimension(ixI^S) :: sigt7,eint
2558 integer :: ix^d
2559
2560 taumin=4.d0
2561 !> w supposed to be wCTprim here
2562 if(rmhd_trac) then
2563 where(te(ixo^s) .lt. block%wextra(ixo^s,tcoff_))
2564 sigt5(ixo^s)=hypertc_kappa*sqrt(block%wextra(ixo^s,tcoff_)**5)
2565 sigt7(ixo^s)=sigt5(ixo^s)*block%wextra(ixo^s,tcoff_)
2566 else where
2567 sigt5(ixo^s)=hypertc_kappa*sqrt(te(ixo^s)**5)
2568 sigt7(ixo^s)=sigt5(ixo^s)*te(ixo^s)
2569 end where
2570 else
2571 sigt5(ixo^s)=hypertc_kappa*sqrt(te(ixo^s)**5)
2572 sigt7(ixo^s)=sigt5(ixo^s)*te(ixo^s)
2573 end if
2574 eint(ixo^s)=w(ixo^s,p_)/(rmhd_gamma-one)
2575 tau(ixo^s)=max(taumin*dt,sigt7(ixo^s)/eint(ixo^s)/cmax_global**2)
2576 end subroutine get_tau
2577
2578 subroutine add_hypertc_source(qdt,ixI^L,ixO^L,wCT,w,x,wCTprim)
2580 integer, intent(in) :: ixi^l,ixo^l
2581 double precision, intent(in) :: qdt
2582 double precision, dimension(ixI^S,1:ndim), intent(in) :: x
2583 double precision, dimension(ixI^S,1:nw), intent(in) :: wct,wctprim
2584 double precision, dimension(ixI^S,1:nw), intent(inout) :: w
2585 double precision :: invdx
2586 double precision, dimension(ixI^S) :: te,tau,sigt,htc_qsrc,tface,r
2587 double precision, dimension(ixI^S) :: htc_esrc,bsum,bunit
2588 double precision, dimension(ixI^S,1:ndim) :: btot
2589 integer :: idims
2590 integer :: hxc^l,hxo^l,ixc^l,jxc^l,jxo^l,kxc^l
2591
2592 call rmhd_get_rfactor(wctprim,x,ixi^l,ixi^l,r)
2593 !Te(ixI^S)=wCTprim(ixI^S,p_)/wCT(ixI^S,rho_)
2594 te(ixi^s)=wctprim(ixi^s,p_)/(r(ixi^s)*w(ixi^s,rho_))
2595 call get_tau(ixi^l,ixo^l,wctprim,te,tau,sigt)
2596 htc_qsrc=zero
2597 do idims=1,ndim
2598 if(b0field) then
2599 btot(ixo^s,idims)=wct(ixo^s,mag(idims))+block%B0(ixo^s,idims,0)
2600 else
2601 btot(ixo^s,idims)=wct(ixo^s,mag(idims))
2602 endif
2603 enddo
2604 bsum(ixo^s)=sqrt(sum(btot(ixo^s,:)**2,dim=ndim+1))+smalldouble
2605 do idims=1,ndim
2606 invdx=1.d0/dxlevel(idims)
2607 ixc^l=ixo^l;
2608 ixcmin^d=ixomin^d-kr(idims,^d);ixcmax^d=ixomax^d;
2609 jxc^l=ixc^l+kr(idims,^d);
2610 kxc^l=jxc^l+kr(idims,^d);
2611 hxc^l=ixc^l-kr(idims,^d);
2612 hxo^l=ixo^l-kr(idims,^d);
2613 tface(ixc^s)=(7.d0*(te(ixc^s)+te(jxc^s))-(te(hxc^s)+te(kxc^s)))/12.d0
2614 bunit(ixo^s)=btot(ixo^s,idims)/bsum(ixo^s)
2615 htc_qsrc(ixo^s)=htc_qsrc(ixo^s)+sigt(ixo^s)*bunit(ixo^s)*(tface(ixo^s)-tface(hxo^s))*invdx
2616 end do
2617 htc_qsrc(ixo^s)=(htc_qsrc(ixo^s)+wct(ixo^s,q_))/tau(ixo^s)
2618 w(ixo^s,q_)=w(ixo^s,q_)-qdt*htc_qsrc(ixo^s)
2619 end subroutine add_hypertc_source
2620
2621 !> Compute the Lorentz force (JxB)
2622 subroutine get_lorentz_force(ixI^L,ixO^L,w,JxB)
2624 integer, intent(in) :: ixi^l, ixo^l
2625 double precision, intent(in) :: w(ixi^s,1:nw)
2626 double precision, intent(inout) :: jxb(ixi^s,3)
2627 double precision :: a(ixi^s,3), b(ixi^s,3)
2628 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
2629 double precision :: current(ixi^s,7-2*ndir:3)
2630 integer :: idir, idirmin
2631
2632 b=0.0d0
2633 if(b0field) then
2634 do idir = 1, ndir
2635 b(ixo^s, idir) = w(ixo^s,mag(idir))+block%B0(ixo^s,idir,0)
2636 end do
2637 else
2638 do idir = 1, ndir
2639 b(ixo^s, idir) = w(ixo^s,mag(idir))
2640 end do
2641 end if
2642 ! store J current in a
2643 call get_current(w,ixi^l,ixo^l,idirmin,current)
2644 a=0.0d0
2645 do idir=7-2*ndir,3
2646 a(ixo^s,idir)=current(ixo^s,idir)
2647 end do
2648 call cross_product(ixi^l,ixo^l,a,b,jxb)
2649 end subroutine get_lorentz_force
2650
2651 !> Compute 1/(1+v_A^2/c^2) for semirelativistic MHD, where v_A is the Alfven
2652 !> velocity
2653 subroutine rmhd_gamma2_alfven(ixI^L, ixO^L, w, gamma_A2)
2655 integer, intent(in) :: ixi^l, ixo^l
2656 double precision, intent(in) :: w(ixi^s, nw)
2657 double precision, intent(out) :: gamma_a2(ixo^s)
2658 double precision :: rho(ixi^s)
2659
2660 ! rmhd_get_rho cannot be used as x is not a param
2661 if(has_equi_rho0) then
2662 rho(ixo^s) = w(ixo^s,rho_) + block%equi_vars(ixo^s,equi_rho0_,b0i)
2663 else
2664 rho(ixo^s) = w(ixo^s,rho_)
2665 endif
2666 ! Compute the inverse of 1 + B^2/(rho * c^2)
2667 gamma_a2(ixo^s) = 1.0d0/(1.0d0+rmhd_mag_en_all(w, ixi^l, ixo^l)/rho(ixo^s)*inv_squared_c)
2668 end subroutine rmhd_gamma2_alfven
2669
2670 !> Compute 1/sqrt(1+v_A^2/c^2) for semirelativisitic MHD, where v_A is the
2671 !> Alfven velocity
2672 function rmhd_gamma_alfven(w, ixI^L, ixO^L) result(gamma_A)
2674 integer, intent(in) :: ixi^l, ixo^l
2675 double precision, intent(in) :: w(ixi^s, nw)
2676 double precision :: gamma_a(ixo^s)
2677
2678 call rmhd_gamma2_alfven(ixi^l, ixo^l, w, gamma_a)
2679 gamma_a = sqrt(gamma_a)
2680 end function rmhd_gamma_alfven
2681
2682 subroutine rmhd_get_rho(w,x,ixI^L,ixO^L,rho)
2684 integer, intent(in) :: ixi^l, ixo^l
2685 double precision, intent(in) :: w(ixi^s,1:nw),x(ixi^s,1:ndim)
2686 double precision, intent(out) :: rho(ixi^s)
2687
2688 if(has_equi_rho0) then
2689 rho(ixo^s) = w(ixo^s,rho_) + block%equi_vars(ixo^s,equi_rho0_,b0i)
2690 else
2691 rho(ixo^s) = w(ixo^s,rho_)
2692 endif
2693 end subroutine rmhd_get_rho
2694
2695 !> handle small or negative internal energy
2696 subroutine rmhd_handle_small_ei(w, x, ixI^L, ixO^L, ie, subname)
2699 integer, intent(in) :: ixi^l,ixo^l, ie
2700 double precision, intent(inout) :: w(ixi^s,1:nw)
2701 double precision, intent(in) :: x(ixi^s,1:ndim)
2702 character(len=*), intent(in) :: subname
2703 double precision :: rho(ixi^s)
2704 integer :: idir
2705 logical :: flag(ixi^s,1:nw)
2706
2707 flag=.false.
2708 if(has_equi_pe0) then
2709 where(w(ixo^s,ie)+block%equi_vars(ixo^s,equi_pe0_,0)*inv_gamma_1<small_e)&
2710 flag(ixo^s,ie)=.true.
2711 else
2712 where(w(ixo^s,ie)<small_e) flag(ixo^s,ie)=.true.
2713 endif
2714 if(any(flag(ixo^s,ie))) then
2715 select case (small_values_method)
2716 case ("replace")
2717 if(has_equi_pe0) then
2718 where(flag(ixo^s,ie)) w(ixo^s,ie)=small_e - &
2719 block%equi_vars(ixo^s,equi_pe0_,0)*inv_gamma_1
2720 else
2721 where(flag(ixo^s,ie)) w(ixo^s,ie)=small_e
2722 endif
2723 case ("average")
2724 call small_values_average(ixi^l, ixo^l, w, x, flag, ie)
2725 case default
2726 ! small values error shows primitive variables
2727 w(ixo^s,e_)=w(ixo^s,e_)*gamma_1
2728 call rmhd_get_rho(w,x,ixi^l,ixo^l,rho)
2729 do idir = 1, ndir
2730 w(ixo^s, mom(idir)) = w(ixo^s, mom(idir))/rho(ixo^s)
2731 end do
2732 call small_values_error(w, x, ixi^l, ixo^l, flag, subname)
2733 end select
2734 end if
2735 end subroutine rmhd_handle_small_ei
2736
2737 subroutine rmhd_update_temperature(ixI^L,ixO^L,wCT,w,x)
2740
2741 integer, intent(in) :: ixi^l, ixo^l
2742 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
2743 double precision, intent(inout) :: w(ixi^s,1:nw)
2744
2745 double precision :: iz_h(ixo^s),iz_he(ixo^s), pth(ixi^s)
2746
2747 call ionization_degree_from_temperature(ixi^l,ixo^l,wct(ixi^s,te_),iz_h,iz_he)
2748
2749 call rmhd_get_pthermal(w,x,ixi^l,ixo^l,pth)
2750
2751 w(ixo^s,te_)=(2.d0+3.d0*he_abundance)*pth(ixo^s)/(w(ixo^s,rho_)*(1.d0+iz_h(ixo^s)+&
2752 he_abundance*(iz_he(ixo^s)*(iz_he(ixo^s)+1.d0)+1.d0)))
2753 end subroutine rmhd_update_temperature
2754
2755 !> Source terms after split off time-independent magnetic field
2756 subroutine add_source_b0split(qdt,dtfactor,ixI^L,ixO^L,wCT,w,x)
2758 integer, intent(in) :: ixi^l, ixo^l
2759 double precision, intent(in) :: qdt, dtfactor,wct(ixi^s,1:nw), x(ixi^s,1:ndim)
2760 double precision, intent(inout) :: w(ixi^s,1:nw)
2761 double precision :: a(ixi^s,3), b(ixi^s,3), axb(ixi^s,3)
2762 integer :: idir
2763
2764 a=0.d0
2765 b=0.d0
2766 ! for force-free field J0xB0 =0
2767 if(.not.b0field_forcefree) then
2768 ! store B0 magnetic field in b
2769 b(ixo^s,1:ndir)=block%B0(ixo^s,1:ndir,0)
2770 ! store J0 current in a
2771 do idir=7-2*ndir,3
2772 a(ixo^s,idir)=block%J0(ixo^s,idir)
2773 end do
2774 call cross_product(ixi^l,ixo^l,a,b,axb)
2775 if(local_timestep) then
2776 do idir=1,3
2777 axb(ixo^s,idir)=axb(ixo^s,idir)*block%dt(ixo^s)*dtfactor
2778 enddo
2779 else
2780 axb(ixo^s,:)=axb(ixo^s,:)*qdt
2781 endif
2782 ! add J0xB0 source term in momentum equations
2783 w(ixo^s,mom(1:ndir))=w(ixo^s,mom(1:ndir))+axb(ixo^s,1:ndir)
2784 end if
2785 if(total_energy) then
2786 a=0.d0
2787 ! for free-free field -(vxB0) dot J0 =0
2788 b(ixo^s,:)=wct(ixo^s,mag(:))
2789 ! store full magnetic field B0+B1 in b
2790 if(.not.b0field_forcefree) b(ixo^s,:)=b(ixo^s,:)+block%B0(ixo^s,:,0)
2791 ! store velocity in a
2792 a(ixi^s,1:ndir)=wct(ixi^s,mom(1:ndir))
2793 ! -E = a x b
2794 call cross_product(ixi^l,ixo^l,a,b,axb)
2795 if(local_timestep) then
2796 do idir=1,3
2797 axb(ixo^s,idir)=axb(ixo^s,idir)*block%dt(ixo^s)*dtfactor
2798 enddo
2799 else
2800 axb(ixo^s,:)=axb(ixo^s,:)*qdt
2801 endif
2802 ! add -(vxB) dot J0 source term in energy equation
2803 do idir=7-2*ndir,3
2804 w(ixo^s,e_)=w(ixo^s,e_)-axb(ixo^s,idir)*block%J0(ixo^s,idir)
2805 end do
2806 end if
2807 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_B0')
2808 end subroutine add_source_b0split
2809
2810 !> Add resistive source to w within ixO Uses 3 point stencil (1 neighbour) in
2811 !> each direction, non-conservative. If the fourthorder precompiler flag is
2812 !> set, uses fourth order central difference for the laplacian. Then the
2813 !> stencil is 5 (2 neighbours).
2814 subroutine add_source_res1(qdt,ixI^L,ixO^L,wCT,w,x)
2816 use mod_usr_methods
2817 use mod_geometry
2818 integer, intent(in) :: ixi^l, ixo^l
2819 double precision, intent(in) :: qdt
2820 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
2821 double precision, intent(inout) :: w(ixi^s,1:nw)
2822 integer :: ixa^l,idir,jdir,kdir,idirmin,idim,jxo^l,hxo^l,ix
2823 integer :: lxo^l, kxo^l
2824 double precision :: tmp(ixi^s),tmp2(ixi^s)
2825 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
2826 double precision :: current(ixi^s,7-2*ndir:3),eta(ixi^s)
2827 double precision :: gradeta(ixi^s,1:ndim), bf(ixi^s,1:ndir)
2828
2829 ! Calculating resistive sources involve one extra layer
2830 if (rmhd_4th_order) then
2831 ixa^l=ixo^l^ladd2;
2832 else
2833 ixa^l=ixo^l^ladd1;
2834 end if
2835 if (iximin^d>ixamin^d.or.iximax^d<ixamax^d|.or.) &
2836 call mpistop("Error in add_source_res1: Non-conforming input limits")
2837 ! Calculate current density and idirmin
2838 call get_current(wct,ixi^l,ixo^l,idirmin,current)
2839 if (rmhd_eta>zero)then
2840 eta(ixa^s)=rmhd_eta
2841 gradeta(ixo^s,1:ndim)=zero
2842 else
2843 call usr_special_resistivity(wct,ixi^l,ixa^l,idirmin,x,current,eta)
2844 ! assumes that eta is not function of current?
2845 do idim=1,ndim
2846 call gradient(eta,ixi^l,ixo^l,idim,tmp)
2847 gradeta(ixo^s,idim)=tmp(ixo^s)
2848 end do
2849 end if
2850 if(b0field) then
2851 bf(ixi^s,1:ndir)=wct(ixi^s,mag(1:ndir))+block%B0(ixi^s,1:ndir,0)
2852 else
2853 bf(ixi^s,1:ndir)=wct(ixi^s,mag(1:ndir))
2854 end if
2855 do idir=1,ndir
2856 ! Put B_idir into tmp2 and eta*Laplace B_idir into tmp
2857 if (rmhd_4th_order) then
2858 tmp(ixo^s)=zero
2859 tmp2(ixi^s)=bf(ixi^s,idir)
2860 do idim=1,ndim
2861 lxo^l=ixo^l+2*kr(idim,^d);
2862 jxo^l=ixo^l+kr(idim,^d);
2863 hxo^l=ixo^l-kr(idim,^d);
2864 kxo^l=ixo^l-2*kr(idim,^d);
2865 tmp(ixo^s)=tmp(ixo^s)+&
2866 (-tmp2(lxo^s)+16.0d0*tmp2(jxo^s)-30.0d0*tmp2(ixo^s)+16.0d0*tmp2(hxo^s)-tmp2(kxo^s)) &
2867 /(12.0d0 * dxlevel(idim)**2)
2868 end do
2869 else
2870 tmp(ixo^s)=zero
2871 tmp2(ixi^s)=bf(ixi^s,idir)
2872 do idim=1,ndim
2873 jxo^l=ixo^l+kr(idim,^d);
2874 hxo^l=ixo^l-kr(idim,^d);
2875 tmp(ixo^s)=tmp(ixo^s)+&
2876 (tmp2(jxo^s)-2.0d0*tmp2(ixo^s)+tmp2(hxo^s))/dxlevel(idim)**2
2877 end do
2878 end if
2879 ! Multiply by eta
2880 tmp(ixo^s)=tmp(ixo^s)*eta(ixo^s)
2881 ! Subtract grad(eta) x J = eps_ijk d_j eta J_k if eta is non-constant
2882 if (rmhd_eta<zero)then
2883 do jdir=1,ndim; do kdir=idirmin,3
2884 if (lvc(idir,jdir,kdir)/=0)then
2885 if (lvc(idir,jdir,kdir)==1)then
2886 tmp(ixo^s)=tmp(ixo^s)-gradeta(ixo^s,jdir)*current(ixo^s,kdir)
2887 else
2888 tmp(ixo^s)=tmp(ixo^s)+gradeta(ixo^s,jdir)*current(ixo^s,kdir)
2889 end if
2890 end if
2891 end do; end do
2892 end if
2893 ! Add sources related to eta*laplB-grad(eta) x J to B and e
2894 w(ixo^s,mag(idir))=w(ixo^s,mag(idir))+qdt*tmp(ixo^s)
2895 if(total_energy) then
2896 w(ixo^s,e_)=w(ixo^s,e_)+qdt*tmp(ixo^s)*bf(ixo^s,idir)
2897 end if
2898 end do ! idir
2899 if(rmhd_energy) then
2900 ! de/dt+=eta*J**2
2901 w(ixo^s,e_)=w(ixo^s,e_)+qdt*eta(ixo^s)*sum(current(ixo^s,:)**2,dim=ndim+1)
2902 end if
2903 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_res1')
2904 end subroutine add_source_res1
2905
2906 !> Add resistive source to w within ixO
2907 !> Uses 5 point stencil (2 neighbours) in each direction, conservative
2908 subroutine add_source_res2(qdt,ixI^L,ixO^L,wCT,w,x)
2910 use mod_usr_methods
2911 use mod_geometry
2912 integer, intent(in) :: ixi^l, ixo^l
2913 double precision, intent(in) :: qdt
2914 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
2915 double precision, intent(inout) :: w(ixi^s,1:nw)
2916 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
2917 double precision :: current(ixi^s,7-2*ndir:3),eta(ixi^s),curlj(ixi^s,1:3)
2918 double precision :: tmpvec(ixi^s,1:3),tmp(ixo^s)
2919 integer :: ixa^l,idir,idirmin,idirmin1
2920
2921 ixa^l=ixo^l^ladd2;
2922 if (iximin^d>ixamin^d.or.iximax^d<ixamax^d|.or.) &
2923 call mpistop("Error in add_source_res2: Non-conforming input limits")
2924 ixa^l=ixo^l^ladd1;
2925 ! Calculate current density within ixL: J=curl B, thus J_i=eps_ijk*d_j B_k
2926 ! Determine exact value of idirmin while doing the loop.
2927 call get_current(wct,ixi^l,ixa^l,idirmin,current)
2928 tmpvec=zero
2929 if(rmhd_eta>zero)then
2930 do idir=idirmin,3
2931 tmpvec(ixa^s,idir)=current(ixa^s,idir)*rmhd_eta
2932 end do
2933 else
2934 call usr_special_resistivity(wct,ixi^l,ixa^l,idirmin,x,current,eta)
2935 do idir=idirmin,3
2936 tmpvec(ixa^s,idir)=current(ixa^s,idir)*eta(ixa^s)
2937 end do
2938 end if
2939 ! dB/dt= -curl(J*eta), thus B_i=B_i-eps_ijk d_j Jeta_k
2940 call curlvector(tmpvec,ixi^l,ixo^l,curlj,idirmin1,1,3)
2941 if(stagger_grid) then
2942 if(ndim==2.and.ndir==3) then
2943 ! if 2.5D
2944 w(ixo^s,mag(ndir)) = w(ixo^s,mag(ndir))-qdt*curlj(ixo^s,ndir)
2945 end if
2946 else
2947 w(ixo^s,mag(1:ndir)) = w(ixo^s,mag(1:ndir))-qdt*curlj(ixo^s,1:ndir)
2948 end if
2949 if(rmhd_energy) then
2950 if(rmhd_eta>zero)then
2951 tmp(ixo^s)=qdt*rmhd_eta*sum(current(ixo^s,:)**2,dim=ndim+1)
2952 else
2953 tmp(ixo^s)=qdt*eta(ixo^s)*sum(current(ixo^s,:)**2,dim=ndim+1)
2954 end if
2955 if(total_energy) then
2956 ! de/dt= +div(B x Jeta) = eta J^2 - B dot curl(eta J)
2957 ! de1/dt= eta J^2 - B1 dot curl(eta J)
2958 w(ixo^s,e_)=w(ixo^s,e_)+tmp(ixo^s)-&
2959 qdt*sum(wct(ixo^s,mag(1:ndir))*curlj(ixo^s,1:ndir),dim=ndim+1)
2960 else
2961 ! add eta*J**2 source term in the internal energy equation
2962 w(ixo^s,e_)=w(ixo^s,e_)+tmp(ixo^s)
2963 end if
2964 end if
2965 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_res2')
2966 end subroutine add_source_res2
2967
2968 !> Add Hyper-resistive source to w within ixO
2969 !> Uses 9 point stencil (4 neighbours) in each direction.
2970 subroutine add_source_hyperres(qdt,ixI^L,ixO^L,wCT,w,x)
2972 use mod_geometry
2973 integer, intent(in) :: ixi^l, ixo^l
2974 double precision, intent(in) :: qdt
2975 double precision, intent(in) :: wct(ixi^s,1:nw), x(ixi^s,1:ndim)
2976 double precision, intent(inout) :: w(ixi^s,1:nw)
2977 !.. local ..
2978 double precision :: current(ixi^s,7-2*ndir:3)
2979 double precision :: tmpvec(ixi^s,1:3),tmpvec2(ixi^s,1:3),tmp(ixi^s),ehyper(ixi^s,1:3)
2980 integer :: ixa^l,idir,jdir,kdir,idirmin,idirmin1
2981
2982 ixa^l=ixo^l^ladd3;
2983 if (iximin^d>ixamin^d.or.iximax^d<ixamax^d|.or.) &
2984 call mpistop("Error in add_source_hyperres: Non-conforming input limits")
2985 call get_current(wct,ixi^l,ixa^l,idirmin,current)
2986 tmpvec(ixa^s,1:ndir)=zero
2987 do jdir=idirmin,3
2988 tmpvec(ixa^s,jdir)=current(ixa^s,jdir)
2989 end do
2990 ixa^l=ixo^l^ladd2;
2991 call curlvector(tmpvec,ixi^l,ixa^l,tmpvec2,idirmin1,1,3)
2992 ixa^l=ixo^l^ladd1;
2993 tmpvec(ixa^s,1:ndir)=zero
2994 call curlvector(tmpvec2,ixi^l,ixa^l,tmpvec,idirmin1,1,3)
2995 ehyper(ixa^s,1:ndir) = - tmpvec(ixa^s,1:ndir)*rmhd_eta_hyper
2996 ixa^l=ixo^l;
2997 tmpvec2(ixa^s,1:ndir)=zero
2998 call curlvector(ehyper,ixi^l,ixa^l,tmpvec2,idirmin1,1,3)
2999 do idir=1,ndir
3000 w(ixo^s,mag(idir)) = w(ixo^s,mag(idir))-tmpvec2(ixo^s,idir)*qdt
3001 end do
3002 if(total_energy) then
3003 ! de/dt= +div(B x Ehyper)
3004 ixa^l=ixo^l^ladd1;
3005 tmpvec2(ixa^s,1:ndir)=zero
3006 do idir=1,ndir; do jdir=1,ndir; do kdir=idirmin,3
3007 tmpvec2(ixa^s,idir) = tmpvec(ixa^s,idir)&
3008 + lvc(idir,jdir,kdir)*wct(ixa^s,mag(jdir))*ehyper(ixa^s,kdir)
3009 end do; end do; end do
3010 tmp(ixo^s)=zero
3011 call divvector(tmpvec2,ixi^l,ixo^l,tmp)
3012 w(ixo^s,e_)=w(ixo^s,e_)+tmp(ixo^s)*qdt
3013 end if
3014 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_hyperres')
3015 end subroutine add_source_hyperres
3016
3017 subroutine add_source_glm(qdt,ixI^L,ixO^L,wCT,w,x)
3018 ! Add divB related sources to w within ixO
3019 ! corresponding to Dedner JCP 2002, 175, 645 _equation 24_
3020 ! giving the EGLM-MHD scheme or GLM-MHD scheme
3022 use mod_geometry
3023 integer, intent(in) :: ixi^l, ixo^l
3024 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
3025 double precision, intent(inout) :: w(ixi^s,1:nw)
3026 double precision:: divb(ixi^s), gradpsi(ixi^s), ba(ixo^s,1:ndir)
3027 integer :: idir
3028
3029 ! dPsi/dt = - Ch^2/Cp^2 Psi
3030 if (rmhd_glm_alpha < zero) then
3031 w(ixo^s,psi_) = abs(rmhd_glm_alpha)*wct(ixo^s,psi_)
3032 else
3033 ! implicit update of Psi variable
3034 ! equation (27) in Mignone 2010 J. Com. Phys. 229, 2117
3035 if(slab_uniform) then
3036 w(ixo^s,psi_) = dexp(-qdt*cmax_global*rmhd_glm_alpha/minval(dxlevel(:)))*w(ixo^s,psi_)
3037 else
3038 w(ixo^s,psi_) = dexp(-qdt*cmax_global*rmhd_glm_alpha/minval(block%ds(ixo^s,:),dim=ndim+1))*w(ixo^s,psi_)
3039 end if
3040 end if
3041 if(rmhd_glm_extended) then
3042 if(b0field) then
3043 ba(ixo^s,1:ndir)=wct(ixo^s,mag(1:ndir))+block%B0(ixo^s,1:ndir,0)
3044 else
3045 ba(ixo^s,1:ndir)=wct(ixo^s,mag(1:ndir))
3046 end if
3047 ! gradient of Psi
3048 if(total_energy) then
3049 do idir=1,ndim
3050 select case(typegrad)
3051 case("central")
3052 call gradient(wct(ixi^s,psi_),ixi^l,ixo^l,idir,gradpsi)
3053 case("limited")
3054 call gradientl(wct(ixi^s,psi_),ixi^l,ixo^l,idir,gradpsi)
3055 end select
3056 ! e = e -qdt (b . grad(Psi))
3057 w(ixo^s,e_) = w(ixo^s,e_)-qdt*ba(ixo^s,idir)*gradpsi(ixo^s)
3058 end do
3059 end if
3060 ! We calculate now div B
3061 call get_divb(wct,ixi^l,ixo^l,divb,rmhd_divb_nth)
3062 ! m = m - qdt b div b
3063 do idir=1,ndir
3064 w(ixo^s,mom(idir))=w(ixo^s,mom(idir))-qdt*ba(ixo^s,idir)*divb(ixo^s)
3065 end do
3066 end if
3067 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_glm')
3068 end subroutine add_source_glm
3069
3070 !> Add divB related sources to w within ixO corresponding to Powel
3071 subroutine add_source_powel(qdt,ixI^L,ixO^L,wCT,w,x)
3073 integer, intent(in) :: ixi^l, ixo^l
3074 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
3075 double precision, intent(inout) :: w(ixi^s,1:nw)
3076 double precision :: divb(ixi^s), ba(1:ndir)
3077 integer :: idir, ix^d
3078
3079 ! calculate div B
3080 call get_divb(wct,ixi^l,ixo^l,divb,rmhd_divb_nth)
3081 if(b0field) then
3082 {do ix^db=ixomin^db,ixomax^db\}
3083 ! b = b - qdt v * div b
3084 ^c&w(ix^d,b^c_)=w(ix^d,b^c_)-qdt*wct(ix^d,m^c_)*divb(ix^d)\
3085 ! m = m - qdt b div b
3086 ^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)\
3087 if (total_energy) then
3088 ! e = e - qdt (v . b) * div b
3089 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)
3090 end if
3091 {end do\}
3092 else
3093 {do ix^db=ixomin^db,ixomax^db\}
3094 ! b = b - qdt v * div b
3095 ^c&w(ix^d,b^c_)=w(ix^d,b^c_)-qdt*wct(ix^d,m^c_)*divb(ix^d)\
3096 ! m = m - qdt b div b
3097 ^c&w(ix^d,m^c_)=w(ix^d,m^c_)-qdt*wct(ix^d,b^c_)*divb(ix^d)\
3098 if (total_energy) then
3099 ! e = e - qdt (v . b) * div b
3100 w(ix^d,e_)=w(ix^d,e_)-qdt*(^c&wct(ix^d,m^c_)*wct(ix^d,b^c_)+)*divb(ix^d)
3101 end if
3102 {end do\}
3103 end if
3104 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_powel')
3105 end subroutine add_source_powel
3106
3107 subroutine add_source_janhunen(qdt,ixI^L,ixO^L,wCT,w,x)
3108 ! Add divB related sources to w within ixO
3109 ! corresponding to Janhunen, just the term in the induction equation.
3111 integer, intent(in) :: ixi^l, ixo^l
3112 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
3113 double precision, intent(inout) :: w(ixi^s,1:nw)
3114 double precision :: divb(ixi^s)
3115 integer :: idir, ix^d
3116
3117 ! calculate div B
3118 call get_divb(wct,ixi^l,ixo^l,divb,rmhd_divb_nth)
3119 {do ix^db=ixomin^db,ixomax^db\}
3120 ! b = b - qdt v * div b
3121 ^c&w(ix^d,b^c_)=w(ix^d,b^c_)-qdt*wct(ix^d,m^c_)*divb(ix^d)\
3122 {end do\}
3123 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_janhunen')
3124 end subroutine add_source_janhunen
3125
3126 subroutine add_source_linde(qdt,ixI^L,ixO^L,wCT,w,x)
3127 ! Add Linde's divB related sources to wnew within ixO
3129 use mod_geometry
3130 integer, intent(in) :: ixi^l, ixo^l
3131 double precision, intent(in) :: qdt, wct(ixi^s,1:nw), x(ixi^s,1:ndim)
3132 double precision, intent(inout) :: w(ixi^s,1:nw)
3133 double precision :: divb(ixi^s),graddivb(ixi^s)
3134 integer :: idim, idir, ixp^l, i^d, iside
3135 logical, dimension(-1:1^D&) :: leveljump
3136
3137 ! Calculate div B
3138 ixp^l=ixo^l^ladd1;
3139 call get_divb(wct,ixi^l,ixp^l,divb,rmhd_divb_nth)
3140 ! for AMR stability, retreat one cell layer from the boarders of level jump
3141 {do i^db=-1,1\}
3142 if(i^d==0|.and.) cycle
3143 if(neighbor_type(i^d,block%igrid)==2 .or. neighbor_type(i^d,block%igrid)==4) then
3144 leveljump(i^d)=.true.
3145 else
3146 leveljump(i^d)=.false.
3147 end if
3148 {end do\}
3149 ixp^l=ixo^l;
3150 do idim=1,ndim
3151 select case(idim)
3152 {case(^d)
3153 do iside=1,2
3154 i^dd=kr(^dd,^d)*(2*iside-3);
3155 if (leveljump(i^dd)) then
3156 if (iside==1) then
3157 ixpmin^d=ixomin^d-i^d
3158 else
3159 ixpmax^d=ixomax^d-i^d
3160 end if
3161 end if
3162 end do
3163 \}
3164 end select
3165 end do
3166 ! Add Linde's diffusive terms
3167 do idim=1,ndim
3168 ! Calculate grad_idim(divb)
3169 select case(typegrad)
3170 case("central")
3171 call gradient(divb,ixi^l,ixp^l,idim,graddivb)
3172 case("limited")
3173 call gradientl(divb,ixi^l,ixp^l,idim,graddivb)
3174 end select
3175 ! Multiply by Linde's eta*dt = divbdiff*(c_max*dx)*dt = divbdiff*dx**2
3176 if (slab_uniform) then
3177 graddivb(ixp^s)=graddivb(ixp^s)*divbdiff/(^d&1.0d0/dxlevel(^d)**2+)
3178 else
3179 graddivb(ixp^s)=graddivb(ixp^s)*divbdiff &
3180 /(^d&1.0d0/block%ds(ixp^s,^d)**2+)
3181 end if
3182 w(ixp^s,mag(idim))=w(ixp^s,mag(idim))+graddivb(ixp^s)
3183
3184 if (typedivbdiff=='all' .and. total_energy) then
3185 ! e += B_idim*eta*grad_idim(divb)
3186 w(ixp^s,e_)=w(ixp^s,e_)+wct(ixp^s,mag(idim))*graddivb(ixp^s)
3187 end if
3188 end do
3189 if (fix_small_values) call rmhd_handle_small_values(.false.,w,x,ixi^l,ixo^l,'add_source_linde')
3190 end subroutine add_source_linde
3191
3192 !> get dimensionless div B = |divB| * volume / area / |B|
3193 subroutine get_normalized_divb(w,ixI^L,ixO^L,divb)
3195 integer, intent(in) :: ixi^l, ixo^l
3196 double precision, intent(in) :: w(ixi^s,1:nw)
3197 double precision :: divb(ixi^s), dsurface(ixi^s)
3198 double precision :: invb(ixo^s)
3199 integer :: ixa^l,idims
3200
3201 call get_divb(w,ixi^l,ixo^l,divb)
3202 invb(ixo^s)=sqrt(rmhd_mag_en_all(w,ixi^l,ixo^l))
3203 where(invb(ixo^s)/=0.d0)
3204 invb(ixo^s)=1.d0/invb(ixo^s)
3205 end where
3206 if(slab_uniform) then
3207 divb(ixo^s)=0.5d0*abs(divb(ixo^s))*invb(ixo^s)/sum(1.d0/dxlevel(:))
3208 else
3209 ixamin^d=ixomin^d-1;
3210 ixamax^d=ixomax^d-1;
3211 dsurface(ixo^s)= sum(block%surfaceC(ixo^s,:),dim=ndim+1)
3212 do idims=1,ndim
3213 ixa^l=ixo^l-kr(idims,^d);
3214 dsurface(ixo^s)=dsurface(ixo^s)+block%surfaceC(ixa^s,idims)
3215 end do
3216 divb(ixo^s)=abs(divb(ixo^s))*invb(ixo^s)*&
3217 block%dvolume(ixo^s)/dsurface(ixo^s)
3218 end if
3219 end subroutine get_normalized_divb
3220
3221 !> Calculate idirmin and the idirmin:3 components of the common current array
3222 !> make sure that dxlevel(^D) is set correctly.
3223 subroutine get_current(w,ixI^L,ixO^L,idirmin,current)
3225 use mod_geometry
3226 integer, intent(in) :: ixo^l, ixi^l
3227 double precision, intent(in) :: w(ixi^s,1:nw)
3228 integer, intent(out) :: idirmin
3229 ! For ndir=2 only 3rd component of J can exist, ndir=1 is impossible for MHD
3230 double precision :: current(ixi^s,7-2*ndir:3)
3231 integer :: idir, idirmin0
3232
3233 idirmin0 = 7-2*ndir
3234 call curlvector(w(ixi^s,mag(1:ndir)),ixi^l,ixo^l,current,idirmin,idirmin0,ndir)
3235 if(b0field) current(ixo^s,idirmin0:3)=current(ixo^s,idirmin0:3)+&
3236 block%J0(ixo^s,idirmin0:3)
3237 end subroutine get_current
3238
3239 !> If resistivity is not zero, check diffusion time limit for dt
3240 subroutine rmhd_get_dt(w,ixI^L,ixO^L,dtnew,dx^D,x)
3242 use mod_usr_methods
3244 use mod_gravity, only: gravity_get_dt
3245 use mod_cak_force, only: cak_get_dt
3246 use mod_fld, only: fld_radforce_get_dt
3248 integer, intent(in) :: ixi^l, ixo^l
3249 double precision, intent(inout) :: dtnew
3250 double precision, intent(in) :: dx^d
3251 double precision, intent(in) :: w(ixi^s,1:nw)
3252 double precision, intent(in) :: x(ixi^s,1:ndim)
3253 double precision :: dxarr(ndim)
3254 double precision :: current(ixi^s,7-2*ndir:3),eta(ixi^s)
3255 integer :: idirmin,idim
3256
3257 dtnew = bigdouble
3258
3259 if (.not. dt_c) then
3260 ^d&dxarr(^d)=dx^d;
3261 if (rmhd_eta>zero)then
3262 dtnew=dtdiffpar*minval(dxarr(1:ndim))**2/rmhd_eta
3263 else if (rmhd_eta<zero)then
3264 call get_current(w,ixi^l,ixo^l,idirmin,current)
3265 call usr_special_resistivity(w,ixi^l,ixo^l,idirmin,x,current,eta)
3266 dtnew=bigdouble
3267 do idim=1,ndim
3268 if(slab_uniform) then
3269 dtnew=min(dtnew,&
3270 dtdiffpar/(smalldouble+maxval(eta(ixo^s)/dxarr(idim)**2)))
3271 else
3272 dtnew=min(dtnew,&
3273 dtdiffpar/(smalldouble+maxval(eta(ixo^s)/block%ds(ixo^s,idim)**2)))
3274 end if
3275 end do
3276 end if
3277 if(rmhd_eta_hyper>zero) then
3278 if(slab_uniform) then
3279 dtnew=min(dtdiffpar*minval(dxarr(1:ndim))**4/rmhd_eta_hyper,dtnew)
3280 else
3281 dtnew=min(dtdiffpar*minval(block%ds(ixo^s,1:ndim))**4/rmhd_eta_hyper,dtnew)
3282 end if
3283 end if
3284 if(rmhd_radiation_force) then
3285 select case(rmhd_radiation_formalism)
3286 case('fld')
3287 call fld_radforce_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
3288 case('afld')
3289 call afld_radforce_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
3290 case default
3291 call mpistop('Radiation formalism unknown')
3292 end select
3293 endif
3294 if(rmhd_viscosity) then
3295 call viscosity_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
3296 end if
3297 if(rmhd_gravity) then
3298 call gravity_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
3299 end if
3300 if (rmhd_cak_force) then
3301 call cak_get_dt(w,ixi^l,ixo^l,dtnew,dx^d,x)
3302 end if
3303 else
3304 {^ifoned dtnew = dx1*unit_velocity/const_c}
3305 {^nooned dtnew = min(dx^d*unit_velocity/const_c)}
3306 endif
3307 end subroutine rmhd_get_dt
3308
3309 ! Add geometrical source terms to w
3310 subroutine rmhd_add_source_geom(qdt,dtfactor,ixI^L,ixO^L,wCT,wprim,w,x)
3312 use mod_geometry
3313 integer, intent(in) :: ixi^l, ixo^l
3314 double precision, intent(in) :: qdt, dtfactor,x(ixi^s,1:ndim)
3315 double precision, intent(inout) :: wct(ixi^s,1:nw),wprim(ixi^s,1:nw),w(ixi^s,1:nw)
3316 double precision :: tmp,tmp1,invr,cot
3317 integer :: ix^d
3318 integer :: mr_,mphi_ ! Polar var. names
3319 integer :: br_,bphi_
3320
3321 mr_=mom(1); mphi_=mom(1)-1+phi_ ! Polar var. names
3322 br_=mag(1); bphi_=mag(1)-1+phi_
3323 select case (coordinate)
3324 case (cylindrical)
3325 {do ix^db=ixomin^db,ixomax^db\}
3326 ! include dt in invr, invr is always used with qdt
3327 if(local_timestep) then
3328 invr=block%dt(ix^d) * dtfactor/x(ix^d,1)
3329 else
3330 invr=qdt/x(ix^d,1)
3331 end if
3332 if(rmhd_energy) then
3333 tmp=wprim(ix^d,p_)+half*(^c&wprim(ix^d,b^c_)**2+)
3334 else
3335 tmp=rmhd_adiab*wprim(ix^d,rho_)**rmhd_gamma+half*(^c&wprim(ix^d,b^c_)**2+)
3336 end if
3337 if(phi_>0) then
3338 w(ix^d,mr_)=w(ix^d,mr_)+invr*(tmp-&
3339 wprim(ix^d,bphi_)**2+wprim(ix^d,mphi_)*wct(ix^d,mphi_))
3340 w(ix^d,mphi_)=w(ix^d,mphi_)+invr*(&
3341 -wct(ix^d,mphi_)*wprim(ix^d,mr_) &
3342 +wprim(ix^d,bphi_)*wprim(ix^d,br_))
3343 if(.not.stagger_grid) then
3344 w(ix^d,bphi_)=w(ix^d,bphi_)+invr*&
3345 (wprim(ix^d,bphi_)*wprim(ix^d,mr_) &
3346 -wprim(ix^d,br_)*wprim(ix^d,mphi_))
3347 end if
3348 else
3349 w(ix^d,mr_)=w(ix^d,mr_)+invr*tmp
3350 end if
3351 if(rmhd_glm) w(ix^d,br_)=w(ix^d,br_)+wprim(ix^d,psi_)*invr
3352 {end do\}
3353 case (spherical)
3354 {do ix^db=ixomin^db,ixomax^db\}
3355 ! include dt in invr, invr is always used with qdt
3356 if(local_timestep) then
3357 invr=block%dt(ix^d) * dtfactor/x(ix^d,1)
3358 else
3359 invr=qdt/x(ix^d,1)
3360 end if
3361 if(rmhd_energy) then
3362 tmp1=wprim(ix^d,p_)+half*(^c&wprim(ix^d,b^c_)**2+)
3363 else
3364 tmp1=rmhd_adiab*wprim(ix^d,rho_)**rmhd_gamma+half*(^c&wprim(ix^d,b^c_)**2+)
3365 end if
3366 ! m1
3367 {^ifonec
3368 w(ix^d,mom(1))=w(ix^d,mom(1))+two*tmp1*invr
3369 }
3370 {^noonec
3371 w(ix^d,mom(1))=w(ix^d,mom(1))+invr*&
3372 (two*tmp1+(^ce&wprim(ix^d,m^ce_)*wct(ix^d,m^ce_)-wprim(ix^d,b^ce_)**2+))
3373 }
3374 ! b1
3375 if(rmhd_glm) then
3376 w(ix^d,mag(1))=w(ix^d,mag(1))+invr*2.0d0*wprim(ix^d,psi_)
3377 end if
3378 {^ifoned
3379 cot=0.d0
3380 }
3381 {^nooned
3382 cot=1.d0/tan(x(ix^d,2))
3383 }
3384 {^iftwoc
3385 ! m2
3386 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*(tmp1*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
3387 +wprim(ix^d,b1_)*wprim(ix^d,b2_))
3388 ! b2
3389 if(.not.stagger_grid) then
3390 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
3391 if(rmhd_glm) then
3392 tmp=tmp+wprim(ix^d,psi_)*cot
3393 end if
3394 w(ix^d,mag(2))=w(ix^d,mag(2))+tmp*invr
3395 end if
3396 }
3397 {^ifthreec
3398 ! m2
3399 w(ix^d,mom(2))=w(ix^d,mom(2))+invr*(tmp1*cot-wprim(ix^d,m1_)*wct(ix^d,m2_)&
3400 +wprim(ix^d,b1_)*wprim(ix^d,b2_)&
3401 +(wprim(ix^d,m3_)*wct(ix^d,m3_)-wprim(ix^d,b3_)**2)*cot)
3402 ! b2
3403 if(.not.stagger_grid) then
3404 tmp=wprim(ix^d,m1_)*wprim(ix^d,b2_)-wprim(ix^d,m2_)*wprim(ix^d,b1_)
3405 if(rmhd_glm) then
3406 tmp=tmp+wprim(ix^d,psi_)*cot
3407 end if
3408 w(ix^d,mag(2))=w(ix^d,mag(2))+tmp*invr
3409 end if
3410 ! m3
3411 w(ix^d,mom(3))=w(ix^d,mom(3))-invr*&
3412 (wprim(ix^d,m3_)*wct(ix^d,m1_) &
3413 -wprim(ix^d,b3_)*wprim(ix^d,b1_) &
3414 +(wprim(ix^d,m2_)*wct(ix^d,m3_) &
3415 -wprim(ix^d,b2_)*wprim(ix^d,b3_))*cot)
3416 ! b3
3417 if(.not.stagger_grid) then
3418 w(ix^d,mag(3))=w(ix^d,mag(3))+invr*&
3419 (wprim(ix^d,m1_)*wprim(ix^d,b3_) &
3420 -wprim(ix^d,m3_)*wprim(ix^d,b1_) &
3421 -(wprim(ix^d,m3_)*wprim(ix^d,b2_) &
3422 -wprim(ix^d,m2_)*wprim(ix^d,b3_))*cot)
3423 end if
3424 }
3425 {end do\}
3426 end select
3427 end subroutine rmhd_add_source_geom
3428
3429 ! Add geometrical source terms to w
3430 subroutine rmhd_add_source_geom_split(qdt,dtfactor, ixI^L,ixO^L,wCT,wprim,w,x)
3432 use mod_geometry
3433 integer, intent(in) :: ixi^l, ixo^l
3434 double precision, intent(in) :: qdt, dtfactor, x(ixi^s,1:ndim)
3435 double precision, intent(inout) :: wct(ixi^s,1:nw), wprim(ixi^s,1:nw),w(ixi^s,1:nw)
3436 double precision :: tmp(ixi^s),tmp1(ixi^s),tmp2(ixi^s),invrho(ixo^s),invr(ixo^s)
3437 integer :: iw,idir, h1x^l{^nooned, h2x^l}
3438 integer :: mr_,mphi_ ! Polar var. names
3439 integer :: br_,bphi_
3440
3441 mr_=mom(1); mphi_=mom(1)-1+phi_ ! Polar var. names
3442 br_=mag(1); bphi_=mag(1)-1+phi_
3443 if(has_equi_rho0) then
3444 invrho(ixo^s) = 1d0/(wct(ixo^s,rho_) + block%equi_vars(ixo^s,equi_rho0_,b0i))
3445 else
3446 invrho(ixo^s) = 1d0/wct(ixo^s,rho_)
3447 end if
3448 ! include dt in invr, invr is always used with qdt
3449 if(local_timestep) then
3450 invr(ixo^s) = block%dt(ixo^s) * dtfactor/x(ixo^s,1)
3451 else
3452 invr(ixo^s) = qdt/x(ixo^s,1)
3453 end if
3454
3455 select case (coordinate)
3456 case (cylindrical)
3457 call rmhd_get_p_total(wct,x,ixi^l,ixo^l,tmp)
3458 if(phi_>0) then
3459 w(ixo^s,mr_)=w(ixo^s,mr_)+invr(ixo^s)*(tmp(ixo^s)-&
3460 wct(ixo^s,bphi_)**2+wct(ixo^s,mphi_)**2*invrho(ixo^s))
3461 w(ixo^s,mphi_)=w(ixo^s,mphi_)+qdt*invr(ixo^s)*(&
3462 -wct(ixo^s,mphi_)*wct(ixo^s,mr_)*invrho(ixo^s) &
3463 +wct(ixo^s,bphi_)*wct(ixo^s,br_))
3464 if(.not.stagger_grid) then
3465 w(ixo^s,bphi_)=w(ixo^s,bphi_)+invr(ixo^s)*&
3466 (wct(ixo^s,bphi_)*wct(ixo^s,mr_) &
3467 -wct(ixo^s,br_)*wct(ixo^s,mphi_)) &
3468 *invrho(ixo^s)
3469 end if
3470 else
3471 w(ixo^s,mr_)=w(ixo^s,mr_)+invr(ixo^s)*tmp(ixo^s)
3472 end if
3473 if(rmhd_glm) w(ixo^s,br_)=w(ixo^s,br_)+wct(ixo^s,psi_)*invr(ixo^s)
3474 case (spherical)
3475 h1x^l=ixo^l-kr(1,^d); {^nooned h2x^l=ixo^l-kr(2,^d);}
3476 call rmhd_get_p_total(wct,x,ixi^l,ixo^l,tmp1)
3477 tmp(ixo^s)=tmp1(ixo^s)
3478 if(b0field) then
3479 tmp2(ixo^s)=sum(block%B0(ixo^s,:,0)*wct(ixo^s,mag(:)),dim=ndim+1)
3480 tmp(ixo^s)=tmp(ixo^s)+tmp2(ixo^s)
3481 end if
3482 ! m1
3483 tmp(ixo^s)=tmp(ixo^s)*x(ixo^s,1) &
3484 *(block%surfaceC(ixo^s,1)-block%surfaceC(h1x^s,1))/block%dvolume(ixo^s)
3485 if(ndir>1) then
3486 do idir=2,ndir
3487 tmp(ixo^s)=tmp(ixo^s)+wct(ixo^s,mom(idir))**2*invrho(ixo^s)-wct(ixo^s,mag(idir))**2
3488 if(b0field) tmp(ixo^s)=tmp(ixo^s)-2.0d0*block%B0(ixo^s,idir,0)*wct(ixo^s,mag(idir))
3489 end do
3490 end if
3491 w(ixo^s,mom(1))=w(ixo^s,mom(1))+tmp(ixo^s)*invr(ixo^s)
3492 ! b1
3493 if(rmhd_glm) then
3494 w(ixo^s,mag(1))=w(ixo^s,mag(1))+invr(ixo^s)*2.0d0*wct(ixo^s,psi_)
3495 end if
3496 {^nooned
3497 ! m2
3498 tmp(ixo^s)=tmp1(ixo^s)
3499 if(b0field) then
3500 tmp(ixo^s)=tmp(ixo^s)+tmp2(ixo^s)
3501 end if
3502 if(local_timestep) then
3503 tmp1(ixo^s) = block%dt(ixo^s) * tmp(ixo^s)
3504 else
3505 tmp1(ixo^s) = qdt * tmp(ixo^s)
3506 endif
3507 ! This will make hydrostatic p=const an exact solution
3508 w(ixo^s,mom(2))=w(ixo^s,mom(2))+tmp1(ixo^s) &
3509 *(block%surfaceC(ixo^s,2)-block%surfaceC(h2x^s,2)) &
3510 /block%dvolume(ixo^s)
3511 tmp(ixo^s)=-(wct(ixo^s,mom(1))*wct(ixo^s,mom(2))*invrho(ixo^s) &
3512 -wct(ixo^s,mag(1))*wct(ixo^s,mag(2)))
3513 if (b0field) then
3514 tmp(ixo^s)=tmp(ixo^s)+block%B0(ixo^s,1,0)*wct(ixo^s,mag(2)) &
3515 +wct(ixo^s,mag(1))*block%B0(ixo^s,2,0)
3516 end if
3517 if(ndir==3) then
3518 tmp(ixo^s)=tmp(ixo^s)+(wct(ixo^s,mom(3))**2*invrho(ixo^s) &
3519 -wct(ixo^s,mag(3))**2)*dcos(x(ixo^s,2))/dsin(x(ixo^s,2))
3520 if (b0field) then
3521 tmp(ixo^s)=tmp(ixo^s)-2.0d0*block%B0(ixo^s,3,0)*wct(ixo^s,mag(3))&
3522 *dcos(x(ixo^s,2))/dsin(x(ixo^s,2))
3523 end if
3524 end if
3525 w(ixo^s,mom(2))=w(ixo^s,mom(2))+tmp(ixo^s)*invr(ixo^s)
3526 ! b2
3527 if(.not.stagger_grid) then
3528 tmp(ixo^s)=(wct(ixo^s,mom(1))*wct(ixo^s,mag(2)) &
3529 -wct(ixo^s,mom(2))*wct(ixo^s,mag(1)))*invrho(ixo^s)
3530 if(b0field) then
3531 tmp(ixo^s)=tmp(ixo^s)+(wct(ixo^s,mom(1))*block%B0(ixo^s,2,0) &
3532 -wct(ixo^s,mom(2))*block%B0(ixo^s,1,0))*invrho(ixo^s)
3533 end if
3534 if(rmhd_glm) then
3535 tmp(ixo^s)=tmp(ixo^s) &
3536 + dcos(x(ixo^s,2))/dsin(x(ixo^s,2))*wct(ixo^s,psi_)
3537 end if
3538 w(ixo^s,mag(2))=w(ixo^s,mag(2))+tmp(ixo^s)*invr(ixo^s)
3539 end if
3540 }
3541 if(ndir==3) then
3542 ! m3
3543 tmp(ixo^s)=-(wct(ixo^s,mom(3))*wct(ixo^s,mom(1))*invrho(ixo^s) &
3544 -wct(ixo^s,mag(3))*wct(ixo^s,mag(1))) {^nooned &
3545 -(wct(ixo^s,mom(2))*wct(ixo^s,mom(3))*invrho(ixo^s) &
3546 -wct(ixo^s,mag(2))*wct(ixo^s,mag(3))) &
3547 *dcos(x(ixo^s,2))/dsin(x(ixo^s,2)) }
3548 if (b0field) then
3549 tmp(ixo^s)=tmp(ixo^s)+block%B0(ixo^s,1,0)*wct(ixo^s,mag(3)) &
3550 +wct(ixo^s,mag(1))*block%B0(ixo^s,3,0) {^nooned &
3551 +(block%B0(ixo^s,2,0)*wct(ixo^s,mag(3)) &
3552 +wct(ixo^s,mag(2))*block%B0(ixo^s,3,0)) &
3553 *dcos(x(ixo^s,2))/dsin(x(ixo^s,2)) }
3554 end if
3555 w(ixo^s,mom(3))=w(ixo^s,mom(3))+tmp(ixo^s)*invr(ixo^s)
3556 ! b3
3557 if(.not.stagger_grid) then
3558 tmp(ixo^s)=(wct(ixo^s,mom(1))*wct(ixo^s,mag(3)) &
3559 -wct(ixo^s,mom(3))*wct(ixo^s,mag(1)))*invrho(ixo^s) {^nooned &
3560 -(wct(ixo^s,mom(3))*wct(ixo^s,mag(2)) &
3561 -wct(ixo^s,mom(2))*wct(ixo^s,mag(3)))*dcos(x(ixo^s,2)) &
3562 *invrho(ixo^s)/dsin(x(ixo^s,2)) }
3563 if (b0field) then
3564 tmp(ixo^s)=tmp(ixo^s)+(wct(ixo^s,mom(1))*block%B0(ixo^s,3,0) &
3565 -wct(ixo^s,mom(3))*block%B0(ixo^s,1,0))*invrho(ixo^s){^nooned &
3566 -(wct(ixo^s,mom(3))*block%B0(ixo^s,2,0) &
3567 -wct(ixo^s,mom(2))*block%B0(ixo^s,3,0))*dcos(x(ixo^s,2)) &
3568 *invrho(ixo^s)/dsin(x(ixo^s,2)) }
3569 end if
3570 w(ixo^s,mag(3))=w(ixo^s,mag(3))+tmp(ixo^s)*invr(ixo^s)
3571 end if
3572 end if
3573 end select
3574 end subroutine rmhd_add_source_geom_split
3575
3576 !> Compute 2 times total magnetic energy
3577 function rmhd_mag_en_all(w, ixI^L, ixO^L) result(mge)
3579 integer, intent(in) :: ixi^l, ixo^l
3580 double precision, intent(in) :: w(ixi^s, nw)
3581 double precision :: mge(ixo^s)
3582
3583 if (b0field) then
3584 mge = sum((w(ixo^s, mag(:))+block%B0(ixo^s,:,b0i))**2, dim=ndim+1)
3585 else
3586 mge = sum(w(ixo^s, mag(:))**2, dim=ndim+1)
3587 end if
3588 end function rmhd_mag_en_all
3589
3590 subroutine rmhd_modify_wlr(ixI^L,ixO^L,qt,wLC,wRC,wLp,wRp,s,idir)
3592 use mod_usr_methods
3593 integer, intent(in) :: ixi^l, ixo^l, idir
3594 double precision, intent(in) :: qt
3595 double precision, intent(inout) :: wlc(ixi^s,1:nw), wrc(ixi^s,1:nw)
3596 double precision, intent(inout) :: wlp(ixi^s,1:nw), wrp(ixi^s,1:nw)
3597 type(state) :: s
3598 double precision :: db(ixo^s), dpsi(ixo^s)
3599 integer :: ix^d
3600
3601 if(stagger_grid) then
3602 {do ix^db=ixomin^db,ixomax^db\}
3603 wlc(ix^d,mag(idir))=s%ws(ix^d,idir)
3604 wrc(ix^d,mag(idir))=s%ws(ix^d,idir)
3605 wlp(ix^d,mag(idir))=s%ws(ix^d,idir)
3606 wrp(ix^d,mag(idir))=s%ws(ix^d,idir)
3607 {end do\}
3608 else
3609 ! Solve the Riemann problem for the linear 2x2 system for normal
3610 ! B-field and GLM_Psi according to Dedner 2002:
3611 ! This implements eq. (42) in Dedner et al. 2002 JcP 175
3612 ! Gives the Riemann solution on the interface
3613 ! for the normal B component and Psi in the GLM-MHD system.
3614 ! 23/04/2013 Oliver Porth
3615 {do ix^db=ixomin^db,ixomax^db\}
3616 db(ix^d)=wrp(ix^d,mag(idir))-wlp(ix^d,mag(idir))
3617 dpsi(ix^d)=wrp(ix^d,psi_)-wlp(ix^d,psi_)
3618 wlp(ix^d,mag(idir))=half*(wrp(ix^d,mag(idir))+wlp(ix^d,mag(idir))-dpsi(ix^d)/cmax_global)
3619 wlp(ix^d,psi_)=half*(wrp(ix^d,psi_)+wlp(ix^d,psi_)-db(ix^d)*cmax_global)
3620 wrp(ix^d,mag(idir))=wlp(ix^d,mag(idir))
3621 wrp(ix^d,psi_)=wlp(ix^d,psi_)
3622 if(total_energy) then
3623 wrc(ix^d,e_)=wrc(ix^d,e_)-half*wrc(ix^d,mag(idir))**2
3624 wlc(ix^d,e_)=wlc(ix^d,e_)-half*wlc(ix^d,mag(idir))**2
3625 end if
3626 wrc(ix^d,mag(idir))=wlp(ix^d,mag(idir))
3627 wrc(ix^d,psi_)=wlp(ix^d,psi_)
3628 wlc(ix^d,mag(idir))=wlp(ix^d,mag(idir))
3629 wlc(ix^d,psi_)=wlp(ix^d,psi_)
3630 ! modify total energy according to the change of magnetic field
3631 if(total_energy) then
3632 wrc(ix^d,e_)=wrc(ix^d,e_)+half*wrc(ix^d,mag(idir))**2
3633 wlc(ix^d,e_)=wlc(ix^d,e_)+half*wlc(ix^d,mag(idir))**2
3634 end if
3635 {end do\}
3636 end if
3637 if(associated(usr_set_wlr)) call usr_set_wlr(ixi^l,ixo^l,qt,wlc,wrc,wlp,wrp,s,idir)
3638 end subroutine rmhd_modify_wlr
3639
3640 subroutine rmhd_boundary_adjust(igrid,psb)
3642 integer, intent(in) :: igrid
3643 type(state), target :: psb(max_blocks)
3644 integer :: ib, idims, iside, ixo^l, i^d
3645
3646 block=>ps(igrid)
3647 ^d&dxlevel(^d)=rnode(rpdx^d_,igrid);
3648 do idims=1,ndim
3649 ! to avoid using as yet unknown corner info in more than 1D, we
3650 ! fill only interior mesh ranges of the ghost cell ranges at first,
3651 ! and progressively enlarge the ranges to include corners later
3652 do iside=1,2
3653 i^d=kr(^d,idims)*(2*iside-3);
3654 if (neighbor_type(i^d,igrid)/=1) cycle
3655 ib=(idims-1)*2+iside
3656 if(.not.boundary_divbfix(ib)) cycle
3657 if(any(typeboundary(:,ib)==bc_special)) then
3658 ! MF nonlinear force-free B field extrapolation and data driven
3659 ! require normal B of the first ghost cell layer to be untouched by
3660 ! fixdivB=0 process, set boundary_divbfix_skip(iB)=1 in par file
3661 select case (idims)
3662 {case (^d)
3663 if (iside==2) then
3664 ! maximal boundary
3665 ixomin^dd=ixghi^d+1-nghostcells+boundary_divbfix_skip(2*^d)^d%ixOmin^dd=ixglo^dd;
3666 ixomax^dd=ixghi^dd;
3667 else
3668 ! minimal boundary
3669 ixomin^dd=ixglo^dd;
3670 ixomax^dd=ixglo^d-1+nghostcells-boundary_divbfix_skip(2*^d-1)^d%ixOmax^dd=ixghi^dd;
3671 end if \}
3672 end select
3673 call fixdivb_boundary(ixg^ll,ixo^l,psb(igrid)%w,psb(igrid)%x,ib)
3674 end if
3675 end do
3676 end do
3677 end subroutine rmhd_boundary_adjust
3678
3679 subroutine fixdivb_boundary(ixG^L,ixO^L,w,x,iB)
3681 integer, intent(in) :: ixg^l,ixo^l,ib
3682 double precision, intent(inout) :: w(ixg^s,1:nw)
3683 double precision, intent(in) :: x(ixg^s,1:ndim)
3684 double precision :: dx1x2,dx1x3,dx2x1,dx2x3,dx3x1,dx3x2
3685 integer :: ix^d,ixf^l
3686
3687 select case(ib)
3688 case(1)
3689 ! 2nd order CD for divB=0 to set normal B component better
3690 if(total_energy) call rmhd_to_primitive(ixg^l,ixo^l,w,x)
3691 {^iftwod
3692 ixfmin1=ixomin1+1
3693 ixfmax1=ixomax1+1
3694 ixfmin2=ixomin2+1
3695 ixfmax2=ixomax2-1
3696 if(slab_uniform) then
3697 dx1x2=dxlevel(1)/dxlevel(2)
3698 do ix1=ixfmax1,ixfmin1,-1
3699 w(ix1-1,ixfmin2:ixfmax2,mag(1))=w(ix1+1,ixfmin2:ixfmax2,mag(1)) &
3700 +dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))-&
3701 w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))
3702 enddo
3703 else
3704 do ix1=ixfmax1,ixfmin1,-1
3705 w(ix1-1,ixfmin2:ixfmax2,mag(1))=( (w(ix1+1,ixfmin2:ixfmax2,mag(1))+&
3706 w(ix1,ixfmin2:ixfmax2,mag(1)))*block%surfaceC(ix1,ixfmin2:ixfmax2,1)&
3707 +(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))+w(ix1,ixfmin2:ixfmax2,mag(2)))*&
3708 block%surfaceC(ix1,ixfmin2:ixfmax2,2)&
3709 -(w(ix1,ixfmin2:ixfmax2,mag(2))+w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))*&
3710 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,2) )&
3711 /block%surfaceC(ix1-1,ixfmin2:ixfmax2,1)-w(ix1,ixfmin2:ixfmax2,mag(1))
3712 end do
3713 end if
3714 }
3715 {^ifthreed
3716 ixfmin1=ixomin1+1
3717 ixfmax1=ixomax1+1
3718 ixfmin2=ixomin2+1
3719 ixfmax2=ixomax2-1
3720 ixfmin3=ixomin3+1
3721 ixfmax3=ixomax3-1
3722 if(slab_uniform) then
3723 dx1x2=dxlevel(1)/dxlevel(2)
3724 dx1x3=dxlevel(1)/dxlevel(3)
3725 do ix1=ixfmax1,ixfmin1,-1
3726 w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
3727 w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)) &
3728 +dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))-&
3729 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2))) &
3730 +dx1x3*(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))-&
3731 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))
3732 end do
3733 else
3734 do ix1=ixfmax1,ixfmin1,-1
3735 w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
3736 ( (w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))+&
3737 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)))*&
3738 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)&
3739 +(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))+&
3740 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2)))*&
3741 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,2)&
3742 -(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2))+&
3743 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2)))*&
3744 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,2)&
3745 +(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))+&
3746 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3)))*&
3747 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,3)&
3748 -(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3))+&
3749 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))*&
3750 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,3) )&
3751 /block%surfaceC(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)-&
3752 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))
3753 end do
3754 end if
3755 }
3756 if(total_energy) call rmhd_to_conserved(ixg^l,ixo^l,w,x)
3757 case(2)
3758 if(total_energy) call rmhd_to_primitive(ixg^l,ixo^l,w,x)
3759 {^iftwod
3760 ixfmin1=ixomin1-1
3761 ixfmax1=ixomax1-1
3762 ixfmin2=ixomin2+1
3763 ixfmax2=ixomax2-1
3764 if(slab_uniform) then
3765 dx1x2=dxlevel(1)/dxlevel(2)
3766 do ix1=ixfmin1,ixfmax1
3767 w(ix1+1,ixfmin2:ixfmax2,mag(1))=w(ix1-1,ixfmin2:ixfmax2,mag(1)) &
3768 -dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))-&
3769 w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))
3770 enddo
3771 else
3772 do ix1=ixfmin1,ixfmax1
3773 w(ix1+1,ixfmin2:ixfmax2,mag(1))=( (w(ix1-1,ixfmin2:ixfmax2,mag(1))+&
3774 w(ix1,ixfmin2:ixfmax2,mag(1)))*block%surfaceC(ix1-1,ixfmin2:ixfmax2,1)&
3775 -(w(ix1,ixfmin2+1:ixfmax2+1,mag(2))+w(ix1,ixfmin2:ixfmax2,mag(2)))*&
3776 block%surfaceC(ix1,ixfmin2:ixfmax2,2)&
3777 +(w(ix1,ixfmin2:ixfmax2,mag(2))+w(ix1,ixfmin2-1:ixfmax2-1,mag(2)))*&
3778 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,2) )&
3779 /block%surfaceC(ix1,ixfmin2:ixfmax2,1)-w(ix1,ixfmin2:ixfmax2,mag(1))
3780 end do
3781 end if
3782 }
3783 {^ifthreed
3784 ixfmin1=ixomin1-1
3785 ixfmax1=ixomax1-1
3786 ixfmin2=ixomin2+1
3787 ixfmax2=ixomax2-1
3788 ixfmin3=ixomin3+1
3789 ixfmax3=ixomax3-1
3790 if(slab_uniform) then
3791 dx1x2=dxlevel(1)/dxlevel(2)
3792 dx1x3=dxlevel(1)/dxlevel(3)
3793 do ix1=ixfmin1,ixfmax1
3794 w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
3795 w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)) &
3796 -dx1x2*(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))-&
3797 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2))) &
3798 -dx1x3*(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))-&
3799 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))
3800 end do
3801 else
3802 do ix1=ixfmin1,ixfmax1
3803 w(ix1+1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))=&
3804 ( (w(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))+&
3805 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1)))*&
3806 block%surfaceC(ix1-1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)&
3807 -(w(ix1,ixfmin2+1:ixfmax2+1,ixfmin3:ixfmax3,mag(2))+&
3808 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2)))*&
3809 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,2)&
3810 +(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(2))+&
3811 w(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,mag(2)))*&
3812 block%surfaceC(ix1,ixfmin2-1:ixfmax2-1,ixfmin3:ixfmax3,2)&
3813 -(w(ix1,ixfmin2:ixfmax2,ixfmin3+1:ixfmax3+1,mag(3))+&
3814 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3)))*&
3815 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,3)&
3816 +(w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(3))+&
3817 w(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,mag(3)))*&
3818 block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3-1:ixfmax3-1,3) )&
3819 /block%surfaceC(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,1)-&
3820 w(ix1,ixfmin2:ixfmax2,ixfmin3:ixfmax3,mag(1))
3821 end do
3822 end if
3823 }
3824 if(total_energy) call rmhd_to_conserved(ixg^l,ixo^l,w,x)
3825 case(3)
3826 if(total_energy) call rmhd_to_primitive(ixg^l,ixo^l,w,x)
3827 {^iftwod
3828 ixfmin1=ixomin1+1
3829 ixfmax1=ixomax1-1
3830 ixfmin2=ixomin2+1
3831 ixfmax2=ixomax2+1
3832 if(slab_uniform) then
3833 dx2x1=dxlevel(2)/dxlevel(1)
3834 do ix2=ixfmax2,ixfmin2,-1
3835 w(ixfmin1:ixfmax1,ix2-1,mag(2))=w(ixfmin1:ixfmax1,ix2+1,mag(2)) &
3836 +dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))-&
3837 w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))
3838 enddo
3839 else
3840 do ix2=ixfmax2,ixfmin2,-1
3841 w(ixfmin1:ixfmax1,ix2-1,mag(2))=( (w(ixfmin1:ixfmax1,ix2+1,mag(2))+&
3842 w(ixfmin1:ixfmax1,ix2,mag(2)))*block%surfaceC(ixfmin1:ixfmax1,ix2,2)&
3843 +(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))+w(ixfmin1:ixfmax1,ix2,mag(1)))*&
3844 block%surfaceC(ixfmin1:ixfmax1,ix2,1)&
3845 -(w(ixfmin1:ixfmax1,ix2,mag(1))+w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))*&
3846 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,1) )&
3847 /block%surfaceC(ixfmin1:ixfmax1,ix2-1,2)-w(ixfmin1:ixfmax1,ix2,mag(2))
3848 end do
3849 end if
3850 }
3851 {^ifthreed
3852 ixfmin1=ixomin1+1
3853 ixfmax1=ixomax1-1
3854 ixfmin3=ixomin3+1
3855 ixfmax3=ixomax3-1
3856 ixfmin2=ixomin2+1
3857 ixfmax2=ixomax2+1
3858 if(slab_uniform) then
3859 dx2x1=dxlevel(2)/dxlevel(1)
3860 dx2x3=dxlevel(2)/dxlevel(3)
3861 do ix2=ixfmax2,ixfmin2,-1
3862 w(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,mag(2))=w(ixfmin1:ixfmax1,&
3863 ix2+1,ixfmin3:ixfmax3,mag(2)) &
3864 +dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))-&
3865 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1))) &
3866 +dx2x3*(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))-&
3867 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))
3868 end do
3869 else
3870 do ix2=ixfmax2,ixfmin2,-1
3871 w(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,mag(2))=&
3872 ( (w(ixfmin1:ixfmax1,ix2+1,ixfmin3:ixfmax3,mag(2))+&
3873 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2)))*&
3874 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,2)&
3875 +(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))+&
3876 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1)))*&
3877 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,1)&
3878 -(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1))+&
3879 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1)))*&
3880 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,1)&
3881 +(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))+&
3882 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3)))*&
3883 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,3)&
3884 -(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3))+&
3885 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))*&
3886 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,3) )&
3887 /block%surfaceC(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,2)-&
3888 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2))
3889 end do
3890 end if
3891 }
3892 if(total_energy) call rmhd_to_conserved(ixg^l,ixo^l,w,x)
3893 case(4)
3894 if(total_energy) call rmhd_to_primitive(ixg^l,ixo^l,w,x)
3895 {^iftwod
3896 ixfmin1=ixomin1+1
3897 ixfmax1=ixomax1-1
3898 ixfmin2=ixomin2-1
3899 ixfmax2=ixomax2-1
3900 if(slab_uniform) then
3901 dx2x1=dxlevel(2)/dxlevel(1)
3902 do ix2=ixfmin2,ixfmax2
3903 w(ixfmin1:ixfmax1,ix2+1,mag(2))=w(ixfmin1:ixfmax1,ix2-1,mag(2)) &
3904 -dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))-&
3905 w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))
3906 end do
3907 else
3908 do ix2=ixfmin2,ixfmax2
3909 w(ixfmin1:ixfmax1,ix2+1,mag(2))=( (w(ixfmin1:ixfmax1,ix2-1,mag(2))+&
3910 w(ixfmin1:ixfmax1,ix2,mag(2)))*block%surfaceC(ixfmin1:ixfmax1,ix2-1,2)&
3911 -(w(ixfmin1+1:ixfmax1+1,ix2,mag(1))+w(ixfmin1:ixfmax1,ix2,mag(1)))*&
3912 block%surfaceC(ixfmin1:ixfmax1,ix2,1)&
3913 +(w(ixfmin1:ixfmax1,ix2,mag(1))+w(ixfmin1-1:ixfmax1-1,ix2,mag(1)))*&
3914 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,1) )&
3915 /block%surfaceC(ixfmin1:ixfmax1,ix2,2)-w(ixfmin1:ixfmax1,ix2,mag(2))
3916 end do
3917 end if
3918 }
3919 {^ifthreed
3920 ixfmin1=ixomin1+1
3921 ixfmax1=ixomax1-1
3922 ixfmin3=ixomin3+1
3923 ixfmax3=ixomax3-1
3924 ixfmin2=ixomin2-1
3925 ixfmax2=ixomax2-1
3926 if(slab_uniform) then
3927 dx2x1=dxlevel(2)/dxlevel(1)
3928 dx2x3=dxlevel(2)/dxlevel(3)
3929 do ix2=ixfmin2,ixfmax2
3930 w(ixfmin1:ixfmax1,ix2+1,ixfmin3:ixfmax3,mag(2))=w(ixfmin1:ixfmax1,&
3931 ix2-1,ixfmin3:ixfmax3,mag(2)) &
3932 -dx2x1*(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))-&
3933 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1))) &
3934 -dx2x3*(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))-&
3935 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))
3936 end do
3937 else
3938 do ix2=ixfmin2,ixfmax2
3939 w(ixfmin1:ixfmax1,ix2+1,ixfmin3:ixfmax3,mag(2))=&
3940 ( (w(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,mag(2))+&
3941 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2)))*&
3942 block%surfaceC(ixfmin1:ixfmax1,ix2-1,ixfmin3:ixfmax3,2)&
3943 -(w(ixfmin1+1:ixfmax1+1,ix2,ixfmin3:ixfmax3,mag(1))+&
3944 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1)))*&
3945 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,1)&
3946 +(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(1))+&
3947 w(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,mag(1)))*&
3948 block%surfaceC(ixfmin1-1:ixfmax1-1,ix2,ixfmin3:ixfmax3,1)&
3949 -(w(ixfmin1:ixfmax1,ix2,ixfmin3+1:ixfmax3+1,mag(3))+&
3950 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3)))*&
3951 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,3)&
3952 +(w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(3))+&
3953 w(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,mag(3)))*&
3954 block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3-1:ixfmax3-1,3) )&
3955 /block%surfaceC(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,2)-&
3956 w(ixfmin1:ixfmax1,ix2,ixfmin3:ixfmax3,mag(2))
3957 end do
3958 end if
3959 }
3960 if(total_energy) call rmhd_to_conserved(ixg^l,ixo^l,w,x)
3961 {^ifthreed
3962 case(5)
3963 if(total_energy) call rmhd_to_primitive(ixg^l,ixo^l,w,x)
3964 ixfmin1=ixomin1+1
3965 ixfmax1=ixomax1-1
3966 ixfmin2=ixomin2+1
3967 ixfmax2=ixomax2-1
3968 ixfmin3=ixomin3+1
3969 ixfmax3=ixomax3+1
3970 if(slab_uniform) then
3971 dx3x1=dxlevel(3)/dxlevel(1)
3972 dx3x2=dxlevel(3)/dxlevel(2)
3973 do ix3=ixfmax3,ixfmin3,-1
3974 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,mag(3))=w(ixfmin1:ixfmax1,&
3975 ixfmin2:ixfmax2,ix3+1,mag(3)) &
3976 +dx3x1*(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))-&
3977 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1))) &
3978 +dx3x2*(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))-&
3979 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))
3980 end do
3981 else
3982 do ix3=ixfmax3,ixfmin3,-1
3983 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,mag(3))=&
3984 ( (w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3+1,mag(3))+&
3985 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3)))*&
3986 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,3)&
3987 +(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))+&
3988 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1)))*&
3989 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,1)&
3990 -(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1))+&
3991 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1)))*&
3992 block%surfaceC(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,1)&
3993 +(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))+&
3994 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2)))*&
3995 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,2)&
3996 -(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2))+&
3997 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))*&
3998 block%surfaceC(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,2) )&
3999 /block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,3)-&
4000 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3))
4001 end do
4002 end if
4003 if(total_energy) call rmhd_to_conserved(ixg^l,ixo^l,w,x)
4004 case(6)
4005 if(total_energy) call rmhd_to_primitive(ixg^l,ixo^l,w,x)
4006 ixfmin1=ixomin1+1
4007 ixfmax1=ixomax1-1
4008 ixfmin2=ixomin2+1
4009 ixfmax2=ixomax2-1
4010 ixfmin3=ixomin3-1
4011 ixfmax3=ixomax3-1
4012 if(slab_uniform) then
4013 dx3x1=dxlevel(3)/dxlevel(1)
4014 dx3x2=dxlevel(3)/dxlevel(2)
4015 do ix3=ixfmin3,ixfmax3
4016 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3+1,mag(3))=w(ixfmin1:ixfmax1,&
4017 ixfmin2:ixfmax2,ix3-1,mag(3)) &
4018 -dx3x1*(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))-&
4019 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1))) &
4020 -dx3x2*(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))-&
4021 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))
4022 end do
4023 else
4024 do ix3=ixfmin3,ixfmax3
4025 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3+1,mag(3))=&
4026 ( (w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,mag(3))+&
4027 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3)))*&
4028 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3-1,3)&
4029 -(w(ixfmin1+1:ixfmax1+1,ixfmin2:ixfmax2,ix3,mag(1))+&
4030 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1)))*&
4031 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,1)&
4032 +(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(1))+&
4033 w(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,mag(1)))*&
4034 block%surfaceC(ixfmin1-1:ixfmax1-1,ixfmin2:ixfmax2,ix3,1)&
4035 -(w(ixfmin1:ixfmax1,ixfmin2+1:ixfmax2+1,ix3,mag(2))+&
4036 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2)))*&
4037 block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,2)&
4038 +(w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(2))+&
4039 w(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,mag(2)))*&
4040 block%surfaceC(ixfmin1:ixfmax1,ixfmin2-1:ixfmax2-1,ix3,2) )&
4041 /block%surfaceC(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,3)-&
4042 w(ixfmin1:ixfmax1,ixfmin2:ixfmax2,ix3,mag(3))
4043 end do
4044 end if
4045 if(total_energy) call rmhd_to_conserved(ixg^l,ixo^l,w,x)
4046 }
4047 case default
4048 call mpistop("Special boundary is not defined for this region")
4049 end select
4050 end subroutine fixdivb_boundary
4051
4052 {^nooned
4053 subroutine rmhd_clean_divb_multigrid(qdt, qt, active)
4054 use mod_forest
4057 use mod_geometry
4058 double precision, intent(in) :: qdt !< Current time step
4059 double precision, intent(in) :: qt !< Current time
4060 logical, intent(inout) :: active !< Output if the source is active
4061 integer :: id
4062 integer, parameter :: max_its = 50
4063 double precision :: residual_it(max_its), max_divb
4064 double precision :: tmp(ixg^t), grad(ixg^t, ndim)
4065 double precision :: res
4066 double precision, parameter :: max_residual = 1d-3
4067 double precision, parameter :: residual_reduction = 1d-10
4068 integer :: iigrid, igrid
4069 integer :: n, nc, lvl, ix^l, ixc^l, idim
4070 type(tree_node), pointer :: pnode
4071
4072 mg%operator_type = mg_laplacian
4073 ! Set boundary conditions
4074 do n = 1, 2*ndim
4075 idim = (n+1)/2
4076 select case (typeboundary(mag(idim), n))
4077 case (bc_symm)
4078 ! d/dx B = 0, take phi = 0
4079 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
4080 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
4081 case (bc_asymm)
4082 ! B = 0, so grad(phi) = 0
4083 mg%bc(n, mg_iphi)%bc_type = mg_bc_neumann
4084 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
4085 case (bc_cont)
4086 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
4087 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
4088 case (bc_special)
4089 ! Assume Dirichlet boundary conditions, derivative zero
4090 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
4091 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
4092 case (bc_periodic)
4093 ! Nothing to do here
4094 case default
4095 write(*,*) "rmhd_clean_divb_multigrid warning: unknown boundary type"
4096 mg%bc(n, mg_iphi)%bc_type = mg_bc_dirichlet
4097 mg%bc(n, mg_iphi)%bc_value = 0.0_dp
4098 end select
4099 end do
4100
4101 ix^l=ixm^ll^ladd1;
4102 max_divb = 0.0d0
4103 ! Store divergence of B as right-hand side
4104 do iigrid = 1, igridstail
4105 igrid = igrids(iigrid);
4106 pnode => igrid_to_node(igrid, mype)%node
4107 id = pnode%id
4108 lvl = mg%boxes(id)%lvl
4109 nc = mg%box_size_lvl(lvl)
4110
4111 ! Geometry subroutines expect this to be set
4112 block => ps(igrid)
4113 ^d&dxlevel(^d)=rnode(rpdx^d_,igrid);
4114
4115 call get_divb(ps(igrid)%w(ixg^t, 1:nw), ixg^ll, ixm^ll, tmp, &
4117 mg%boxes(id)%cc({1:nc}, mg_irhs) = tmp(ixm^t)
4118 max_divb = max(max_divb, maxval(abs(tmp(ixm^t))))
4119 end do
4120
4121 ! Solve laplacian(phi) = divB
4122 if(stagger_grid) then
4123 call mpi_allreduce(mpi_in_place, max_divb, 1, mpi_double_precision, &
4124 mpi_max, icomm, ierrmpi)
4125
4126 if (mype == 0) print *, "Performing multigrid divB cleaning"
4127 if (mype == 0) print *, "iteration vs residual"
4128 ! Solve laplacian(phi) = divB
4129 do n = 1, max_its
4130 call mg_fas_fmg(mg, n>1, max_res=residual_it(n))
4131 if (mype == 0) write(*, "(I4,E11.3)") n, residual_it(n)
4132 if (residual_it(n) < residual_reduction * max_divb) exit
4133 end do
4134 if (mype == 0 .and. n > max_its) then
4135 print *, "divb_multigrid warning: not fully converged"
4136 print *, "current amplitude of divb: ", residual_it(max_its)
4137 print *, "multigrid smallest grid: ", &
4138 mg%domain_size_lvl(:, mg%lowest_lvl)
4139 print *, "note: smallest grid ideally has <= 8 cells"
4140 print *, "multigrid dx/dy/dz ratio: ", mg%dr(:, 1)/mg%dr(1, 1)
4141 print *, "note: dx/dy/dz should be similar"
4142 end if
4143 else
4144 do n = 1, max_its
4145 call mg_fas_vcycle(mg, max_res=res)
4146 if (res < max_residual) exit
4147 end do
4148 if (res > max_residual) call mpistop("divb_multigrid: no convergence")
4149 end if
4150
4151 ! Correct the magnetic field
4152 do iigrid = 1, igridstail
4153 igrid = igrids(iigrid);
4154 pnode => igrid_to_node(igrid, mype)%node
4155 id = pnode%id
4156 ! Geometry subroutines expect this to be set
4157 block => ps(igrid)
4158 ^d&dxlevel(^d)=rnode(rpdx^d_,igrid);
4159 ! Compute the gradient of phi
4160 tmp(ix^s) = mg%boxes(id)%cc({:,}, mg_iphi)
4161 if(stagger_grid) then
4162 do idim =1, ndim
4163 ixcmin^d=ixmlo^d-kr(idim,^d);
4164 ixcmax^d=ixmhi^d;
4165 call gradientf(tmp,ps(igrid)%x,ixg^ll,ixc^l,idim,grad(ixg^t,idim))
4166 ! Apply the correction B* = B - gradient(phi)
4167 ps(igrid)%ws(ixc^s,idim)=ps(igrid)%ws(ixc^s,idim)-grad(ixc^s,idim)
4168 end do
4169 ! store cell-center magnetic energy
4170 tmp(ixm^t) = sum(ps(igrid)%w(ixm^t, mag(1:ndim))**2, dim=ndim+1)
4171 ! change cell-center magnetic field
4172 call rmhd_face_to_center(ixm^ll,ps(igrid))
4173 else
4174 do idim = 1, ndim
4175 call gradient(tmp,ixg^ll,ixm^ll,idim,grad(ixg^t, idim))
4176 end do
4177 ! store cell-center magnetic energy
4178 tmp(ixm^t) = sum(ps(igrid)%w(ixm^t, mag(1:ndim))**2, dim=ndim+1)
4179 ! Apply the correction B* = B - gradient(phi)
4180 ps(igrid)%w(ixm^t, mag(1:ndim)) = &
4181 ps(igrid)%w(ixm^t, mag(1:ndim)) - grad(ixm^t, :)
4182 end if
4183 if(total_energy) then
4184 ! Determine magnetic energy difference
4185 tmp(ixm^t) = 0.5_dp * (sum(ps(igrid)%w(ixm^t, &
4186 mag(1:ndim))**2, dim=ndim+1) - tmp(ixm^t))
4187 ! Keep thermal pressure the same
4188 ps(igrid)%w(ixm^t, e_) = ps(igrid)%w(ixm^t, e_) + tmp(ixm^t)
4189 end if
4190 end do
4191 active = .true.
4192 end subroutine rmhd_clean_divb_multigrid
4193 }
4194
4195 subroutine rmhd_update_faces(ixI^L,ixO^L,qt,qdt,wprim,fC,fE,sCT,s,vcts)
4197 integer, intent(in) :: ixi^l, ixo^l
4198 double precision, intent(in) :: qt,qdt
4199 ! cell-center primitive variables
4200 double precision, intent(in) :: wprim(ixi^s,1:nw)
4201 type(state) :: sct, s
4202 type(ct_velocity) :: vcts
4203 double precision, intent(in) :: fc(ixi^s,1:nwflux,1:ndim)
4204 double precision, intent(inout) :: fe(ixi^s,sdim:3)
4205
4206 select case(type_ct)
4207 case('average')
4208 call update_faces_average(ixi^l,ixo^l,qt,qdt,fc,fe,sct,s)
4209 case('uct_contact')
4210 call update_faces_contact(ixi^l,ixo^l,qt,qdt,wprim,fc,fe,sct,s,vcts)
4211 case('uct_hll')
4212 call update_faces_hll(ixi^l,ixo^l,qt,qdt,fe,sct,s,vcts)
4213 case default
4214 call mpistop('choose average, uct_contact,or uct_hll for type_ct!')
4215 end select
4216 end subroutine rmhd_update_faces
4217
4218 !> get electric field though averaging neighors to update faces in CT
4219 subroutine update_faces_average(ixI^L,ixO^L,qt,qdt,fC,fE,sCT,s)
4221 use mod_usr_methods
4222 integer, intent(in) :: ixi^l, ixo^l
4223 double precision, intent(in) :: qt, qdt
4224 type(state) :: sct, s
4225 double precision, intent(in) :: fc(ixi^s,1:nwflux,1:ndim)
4226 double precision, intent(inout) :: fe(ixi^s,sdim:3)
4227 double precision :: circ(ixi^s,1:ndim)
4228 ! non-ideal electric field on cell edges
4229 double precision, dimension(ixI^S,sdim:3) :: e_resi
4230 integer :: ix^d,ixc^l,ixa^l,i1kr^d,i2kr^d
4231 integer :: idim1,idim2,idir,iwdim1,iwdim2
4232
4233 associate(bfaces=>s%ws,x=>s%x)
4234 ! Calculate contribution to FEM of each edge,
4235 ! that is, estimate value of line integral of
4236 ! electric field in the positive idir direction.
4237 ! if there is resistivity, get eta J
4238 if(rmhd_eta/=zero) call get_resistive_electric_field(ixi^l,ixo^l,sct,s,e_resi)
4239 do idim1=1,ndim
4240 iwdim1 = mag(idim1)
4241 i1kr^d=kr(idim1,^d);
4242 do idim2=1,ndim
4243 iwdim2 = mag(idim2)
4244 i2kr^d=kr(idim2,^d);
4245 do idir=sdim,3! Direction of line integral
4246 ! Allow only even permutations
4247 if (lvc(idim1,idim2,idir)==1) then
4248 ixcmax^d=ixomax^d;
4249 ixcmin^d=ixomin^d+kr(idir,^d)-1;
4250 ! average cell-face electric field to cell edges
4251 {do ix^db=ixcmin^db,ixcmax^db\}
4252 fe(ix^d,idir)=quarter*&
4253 (fc(ix^d,iwdim1,idim2)+fc({ix^d+i1kr^d},iwdim1,idim2)&
4254 -fc(ix^d,iwdim2,idim1)-fc({ix^d+i2kr^d},iwdim2,idim1))
4255 ! add resistive electric field at cell edges E=-vxB+eta J
4256 if(rmhd_eta/=zero) fe(ix^d,idir)=fe(ix^d,idir)+e_resi(ix^d,idir)
4257 ! times time step and edge length
4258 fe(ix^d,idir)=fe(ix^d,idir)*qdt*s%dsC(ix^d,idir)
4259 {end do\}
4260 end if
4261 end do
4262 end do
4263 end do
4264 ! allow user to change inductive electric field, especially for boundary driven applications
4265 if(associated(usr_set_electric_field)) &
4266 call usr_set_electric_field(ixi^l,ixo^l,qt,qdt,fe,sct)
4267 circ(ixi^s,1:ndim)=zero
4268 ! Calculate circulation on each face
4269 do idim1=1,ndim ! Coordinate perpendicular to face
4270 ixcmax^d=ixomax^d;
4271 ixcmin^d=ixomin^d-kr(idim1,^d);
4272 do idim2=1,ndim
4273 ixa^l=ixc^l-kr(idim2,^d);
4274 do idir=sdim,3 ! Direction of line integral
4275 ! Assemble indices
4276 if(lvc(idim1,idim2,idir)==1) then
4277 ! Add line integrals in direction idir
4278 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
4279 +(fe(ixc^s,idir)&
4280 -fe(ixa^s,idir))
4281 else if(lvc(idim1,idim2,idir)==-1) then
4282 ! Add line integrals in direction idir
4283 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
4284 -(fe(ixc^s,idir)&
4285 -fe(ixa^s,idir))
4286 end if
4287 end do
4288 end do
4289 ! Divide by the area of the face to get dB/dt
4290 where(s%surfaceC(ixc^s,idim1) > 1.0d-9*s%dvolume(ixc^s))
4291 circ(ixc^s,idim1)=circ(ixc^s,idim1)/s%surfaceC(ixc^s,idim1)
4292 elsewhere
4293 circ(ixc^s,idim1)=zero
4294 end where
4295 ! Time update cell-face magnetic field component
4296 bfaces(ixc^s,idim1)=bfaces(ixc^s,idim1)-circ(ixc^s,idim1)
4297 end do
4298 end associate
4299 end subroutine update_faces_average
4300
4301 !> update faces using UCT contact mode by Gardiner and Stone 2005 JCP 205, 509
4302 subroutine update_faces_contact(ixI^L,ixO^L,qt,qdt,wp,fC,fE,sCT,s,vcts)
4304 use mod_usr_methods
4305 use mod_geometry
4306 integer, intent(in) :: ixi^l, ixo^l
4307 double precision, intent(in) :: qt, qdt
4308 ! cell-center primitive variables
4309 double precision, intent(in) :: wp(ixi^s,1:nw)
4310 type(state) :: sct, s
4311 type(ct_velocity) :: vcts
4312 double precision, intent(in) :: fc(ixi^s,1:nwflux,1:ndim)
4313 double precision, intent(inout) :: fe(ixi^s,sdim:3)
4314 double precision :: circ(ixi^s,1:ndim)
4315 ! electric field at cell centers
4316 double precision :: ecc(ixi^s,sdim:3)
4317 double precision :: ein(ixi^s,sdim:3)
4318 ! gradient of E at left and right side of a cell face
4319 double precision :: el(ixi^s),er(ixi^s)
4320 ! gradient of E at left and right side of a cell corner
4321 double precision :: elc,erc
4322 ! non-ideal electric field on cell edges
4323 double precision, dimension(ixI^S,sdim:3) :: e_resi
4324 ! current on cell edges
4325 double precision :: jce(ixi^s,sdim:3)
4326 ! location at cell faces
4327 double precision :: xs(ixgs^t,1:ndim)
4328 double precision :: gradi(ixgs^t)
4329 integer :: ixc^l,ixa^l
4330 integer :: idim1,idim2,idir,iwdim1,iwdim2,ix^d,i1kr^d,i2kr^d
4331
4332 associate(bfaces=>s%ws,x=>s%x,w=>s%w,vnorm=>vcts%vnorm,wcts=>sct%ws)
4333 ! if there is resistivity, get eta J
4334 if(rmhd_eta/=zero) call get_resistive_electric_field(ixi^l,ixo^l,sct,s,e_resi)
4335 if(b0field) then
4336 {do ix^db=iximin^db,iximax^db\}
4337 ! Calculate electric field at cell centers
4338 {^ifthreed
4339 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_)
4340 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_)
4341 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_)
4342 }
4343 {^iftwod
4344 ecc(ix^d,3)=wp(ix^d,b1_)*wp(ix^d,m2_)-wp(ix^d,b2_)*wp(ix^d,m1_)
4345 }
4346 {^ifoned
4347 ecc(ix^d,3)=0.d0
4348 }
4349 {end do\}
4350 else
4351 {do ix^db=iximin^db,iximax^db\}
4352 ! Calculate electric field at cell centers
4353 {^ifthreed
4354 ecc(ix^d,1)=wp(ix^d,b2_)*wp(ix^d,m3_)-wp(ix^d,b3_)*wp(ix^d,m2_)
4355 ecc(ix^d,2)=wp(ix^d,b3_)*wp(ix^d,m1_)-wp(ix^d,b1_)*wp(ix^d,m3_)
4356 ecc(ix^d,3)=wp(ix^d,b1_)*wp(ix^d,m2_)-wp(ix^d,b2_)*wp(ix^d,m1_)
4357 }
4358 {^iftwod
4359 ecc(ix^d,3)=wp(ix^d,b1_)*wp(ix^d,m2_)-wp(ix^d,b2_)*wp(ix^d,m1_)
4360 }
4361 {^ifoned
4362 ecc(ix^d,3)=0.d0
4363 }
4364 {end do\}
4365 end if
4366
4367 ! Calculate contribution to FEM of each edge,
4368 ! that is, estimate value of line integral of
4369 ! electric field in the positive idir direction.
4370 ! evaluate electric field along cell edges according to equation (41)
4371 do idim1=1,ndim
4372 iwdim1 = mag(idim1)
4373 i1kr^d=kr(idim1,^d);
4374 do idim2=1,ndim
4375 iwdim2 = mag(idim2)
4376 i2kr^d=kr(idim2,^d);
4377 do idir=sdim,3 ! Direction of line integral
4378 ! Allow only even permutations
4379 if (lvc(idim1,idim2,idir)==1) then
4380 ixcmax^d=ixomax^d;
4381 ixcmin^d=ixomin^d+kr(idir,^d)-1;
4382 ! Assemble indices
4383 ! average cell-face electric field to cell edges
4384 {do ix^db=ixcmin^db,ixcmax^db\}
4385 fe(ix^d,idir)=quarter*&
4386 (fc(ix^d,iwdim1,idim2)+fc({ix^d+i1kr^d},iwdim1,idim2)&
4387 -fc(ix^d,iwdim2,idim1)-fc({ix^d+i2kr^d},iwdim2,idim1))
4388 if(partial_energy) ein(ix^d,idir)=fe(ix^d,idir)
4389 {end do\}
4390 ! add slope in idim2 direction from equation (50)
4391 ixamin^d=ixcmin^d;
4392 ixamax^d=ixcmax^d+i1kr^d;
4393 {do ix^db=ixamin^db,ixamax^db\}
4394 el(ix^d)=fc(ix^d,iwdim1,idim2)-ecc(ix^d,idir)
4395 er(ix^d)=fc(ix^d,iwdim1,idim2)-ecc({ix^d+i2kr^d},idir)
4396 {end do\}
4397 {!dir$ ivdep
4398 do ix^db=ixcmin^db,ixcmax^db\}
4399 if(vnorm(ix^d,idim1)>0.d0) then
4400 elc=el(ix^d)
4401 else if(vnorm(ix^d,idim1)<0.d0) then
4402 elc=el({ix^d+i1kr^d})
4403 else
4404 elc=0.5d0*(el(ix^d)+el({ix^d+i1kr^d}))
4405 end if
4406 if(vnorm({ix^d+i2kr^d},idim1)>0.d0) then
4407 erc=er(ix^d)
4408 else if(vnorm({ix^d+i2kr^d},idim1)<0.d0) then
4409 erc=er({ix^d+i1kr^d})
4410 else
4411 erc=0.5d0*(er(ix^d)+er({ix^d+i1kr^d}))
4412 end if
4413 fe(ix^d,idir)=fe(ix^d,idir)+0.25d0*(elc+erc)
4414 {end do\}
4415 ! add slope in idim1 direction from equation (50)
4416 ixamin^d=ixcmin^d;
4417 ixamax^d=ixcmax^d+i2kr^d;
4418 {do ix^db=ixamin^db,ixamax^db\}
4419 el(ix^d)=-fc(ix^d,iwdim2,idim1)-ecc(ix^d,idir)
4420 er(ix^d)=-fc(ix^d,iwdim2,idim1)-ecc({ix^d+i1kr^d},idir)
4421 {end do\}
4422 {!dir$ ivdep
4423 do ix^db=ixcmin^db,ixcmax^db\}
4424 if(vnorm(ix^d,idim2)>0.d0) then
4425 elc=el(ix^d)
4426 else if(vnorm(ix^d,idim2)<0.d0) then
4427 elc=el({ix^d+i2kr^d})
4428 else
4429 elc=0.5d0*(el(ix^d)+el({ix^d+i2kr^d}))
4430 end if
4431 if(vnorm({ix^d+i1kr^d},idim2)>0.d0) then
4432 erc=er(ix^d)
4433 else if(vnorm({ix^d+i1kr^d},idim2)<0.d0) then
4434 erc=er({ix^d+i2kr^d})
4435 else
4436 erc=0.5d0*(er(ix^d)+er({ix^d+i2kr^d}))
4437 end if
4438 fe(ix^d,idir)=fe(ix^d,idir)+0.25d0*(elc+erc)
4439 ! difference between average and upwind interpolated E
4440 if(partial_energy) ein(ix^d,idir)=fe(ix^d,idir)-ein(ix^d,idir)
4441 ! add resistive electric field at cell edges E=-vxB+eta J
4442 if(rmhd_eta/=zero) fe(ix^d,idir)=fe(ix^d,idir)+e_resi(ix^d,idir)
4443 ! times time step and edge length
4444 fe(ix^d,idir)=fe(ix^d,idir)*qdt*s%dsC(ix^d,idir)
4445 {end do\}
4446 end if
4447 end do
4448 end do
4449 end do
4450 if(partial_energy) then
4451 ! add upwind diffused magnetic energy back to energy
4452 ! calculate current density at cell edges
4453 jce=0.d0
4454 do idim1=1,ndim
4455 do idim2=1,ndim
4456 do idir=sdim,3
4457 if (lvc(idim1,idim2,idir)==0) cycle
4458 ixcmax^d=ixomax^d;
4459 ixcmin^d=ixomin^d+kr(idir,^d)-1;
4460 ixamax^d=ixcmax^d-kr(idir,^d)+1;
4461 ixamin^d=ixcmin^d;
4462 ! current at transverse faces
4463 xs(ixa^s,:)=x(ixa^s,:)
4464 xs(ixa^s,idim2)=x(ixa^s,idim2)+half*s%dx(ixa^s,idim2)
4465 call gradientf(wcts(ixgs^t,idim2),xs,ixgs^ll,ixc^l,idim1,gradi)
4466 if (lvc(idim1,idim2,idir)==1) then
4467 jce(ixc^s,idir)=jce(ixc^s,idir)+gradi(ixc^s)
4468 else
4469 jce(ixc^s,idir)=jce(ixc^s,idir)-gradi(ixc^s)
4470 end if
4471 end do
4472 end do
4473 end do
4474 do idir=sdim,3
4475 ixcmax^d=ixomax^d;
4476 ixcmin^d=ixomin^d+kr(idir,^d)-1;
4477 ! E dot J on cell edges
4478 ein(ixc^s,idir)=ein(ixc^s,idir)*jce(ixc^s,idir)
4479 ! average from cell edge to cell center
4480 {^ifthreed
4481 if(idir==1) then
4482 {do ix^db=ixomin^db,ixomax^db\}
4483 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1,ix2-1,ix3,idir)+ein(ix1,ix2,ix3-1,idir)&
4484 +ein(ix1,ix2-1,ix3-1,idir))
4485 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
4486 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
4487 {end do\}
4488 else if(idir==2) then
4489 {do ix^db=ixomin^db,ixomax^db\}
4490 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1-1,ix2,ix3,idir)+ein(ix1,ix2,ix3-1,idir)&
4491 +ein(ix1-1,ix2,ix3-1,idir))
4492 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
4493 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
4494 {end do\}
4495 else
4496 {do ix^db=ixomin^db,ixomax^db\}
4497 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1-1,ix2,ix3,idir)+ein(ix1,ix2-1,ix3,idir)&
4498 +ein(ix1-1,ix2-1,ix3,idir))
4499 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
4500 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
4501 {end do\}
4502 end if
4503 }
4504 {^iftwod
4505 !idir=3
4506 {do ix^db=ixomin^db,ixomax^db\}
4507 jce(ix^d,idir)=0.25d0*(ein(ix^d,idir)+ein(ix1-1,ix2,idir)+ein(ix1,ix2-1,idir)&
4508 +ein(ix1-1,ix2-1,idir))
4509 if(jce(ix^d,idir)<0.d0) jce(ix^d,idir)=0.d0
4510 w(ix^d,e_)=w(ix^d,e_)+qdt*jce(ix^d,idir)
4511 {end do\}
4512 }
4513 ! save additional numerical resistive heating to an extra variable
4514 if(nwextra>0) then
4515 block%w(ixo^s,nw)=block%w(ixo^s,nw)+jce(ixo^s,idir)
4516 end if
4517 end do
4518 end if
4519 ! allow user to change inductive electric field, especially for boundary driven applications
4520 if(associated(usr_set_electric_field)) &
4521 call usr_set_electric_field(ixi^l,ixo^l,qt,qdt,fe,sct)
4522 circ(ixi^s,1:ndim)=zero
4523 ! Calculate circulation on each face
4524 do idim1=1,ndim ! Coordinate perpendicular to face
4525 ixcmax^d=ixomax^d;
4526 ixcmin^d=ixomin^d-kr(idim1,^d);
4527 do idim2=1,ndim
4528 ixa^l=ixc^l-kr(idim2,^d);
4529 do idir=sdim,3 ! Direction of line integral
4530 ! Assemble indices
4531 if(lvc(idim1,idim2,idir)==1) then
4532 ! Add line integrals in direction idir
4533 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
4534 +(fe(ixc^s,idir)&
4535 -fe(ixa^s,idir))
4536 else if(lvc(idim1,idim2,idir)==-1) then
4537 ! Add line integrals in direction idir
4538 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
4539 -(fe(ixc^s,idir)&
4540 -fe(ixa^s,idir))
4541 end if
4542 end do
4543 end do
4544 ! Divide by the area of the face to get dB/dt
4545 where(s%surfaceC(ixc^s,idim1) > smalldouble)
4546 circ(ixc^s,idim1)=circ(ixc^s,idim1)/s%surfaceC(ixc^s,idim1)
4547 elsewhere
4548 circ(ixc^s,idim1)=zero
4549 end where
4550 ! Time update cell-face magnetic field component
4551 bfaces(ixc^s,idim1)=bfaces(ixc^s,idim1)-circ(ixc^s,idim1)
4552 end do
4553 end associate
4554 end subroutine update_faces_contact
4555
4556 !> update faces
4557 subroutine update_faces_hll(ixI^L,ixO^L,qt,qdt,fE,sCT,s,vcts)
4560 use mod_usr_methods
4561 integer, intent(in) :: ixi^l, ixo^l
4562 double precision, intent(in) :: qt, qdt
4563 double precision, intent(inout) :: fe(ixi^s,sdim:3)
4564 type(state) :: sct, s
4565 type(ct_velocity) :: vcts
4566 double precision :: vtill(ixi^s,2)
4567 double precision :: vtilr(ixi^s,2)
4568 double precision :: bfacetot(ixi^s,ndim)
4569 double precision :: btill(ixi^s,ndim)
4570 double precision :: btilr(ixi^s,ndim)
4571 double precision :: cp(ixi^s,2)
4572 double precision :: cm(ixi^s,2)
4573 double precision :: circ(ixi^s,1:ndim)
4574 ! non-ideal electric field on cell edges
4575 double precision, dimension(ixI^S,sdim:3) :: e_resi
4576 integer :: hxc^l,ixc^l,ixcp^l,jxc^l,ixcm^l
4577 integer :: idim1,idim2,idir
4578
4579 associate(bfaces=>s%ws,bfacesct=>sct%ws,x=>s%x,vbarc=>vcts%vbarC,cbarmin=>vcts%cbarmin,&
4580 cbarmax=>vcts%cbarmax)
4581 ! Calculate contribution to FEM of each edge,
4582 ! that is, estimate value of line integral of
4583 ! electric field in the positive idir direction.
4584
4585 ! Loop over components of electric field
4586
4587 ! idir: electric field component we need to calculate
4588 ! idim1: directions in which we already performed the reconstruction
4589 ! idim2: directions in which we perform the reconstruction
4590
4591 ! if there is resistivity, get eta J
4592 if(rmhd_eta/=zero) call get_resistive_electric_field(ixi^l,ixo^l,sct,s,e_resi)
4593
4594 do idir=sdim,3
4595 ! Indices
4596 ! idir: electric field component
4597 ! idim1: one surface
4598 ! idim2: the other surface
4599 ! cyclic permutation: idim1,idim2,idir=1,2,3
4600 ! Velocity components on the surface
4601 ! follow cyclic premutations:
4602 ! Sx(1),Sx(2)=y,z ; Sy(1),Sy(2)=z,x ; Sz(1),Sz(2)=x,y
4603 ixcmax^d=ixomax^d;
4604 ixcmin^d=ixomin^d-1+kr(idir,^d);
4605 ! Set indices and directions
4606 idim1=mod(idir,3)+1
4607 idim2=mod(idir+1,3)+1
4608 jxc^l=ixc^l+kr(idim1,^d);
4609 ixcp^l=ixc^l+kr(idim2,^d);
4610 ! Reconstruct transverse transport velocities
4611 call reconstruct(ixi^l,ixc^l,idim2,vbarc(ixi^s,idim1,1),&
4612 vtill(ixi^s,2),vtilr(ixi^s,2))
4613 call reconstruct(ixi^l,ixc^l,idim1,vbarc(ixi^s,idim2,2),&
4614 vtill(ixi^s,1),vtilr(ixi^s,1))
4615 ! Reconstruct magnetic fields
4616 ! Eventhough the arrays are larger, reconstruct works with
4617 ! the limits ixG.
4618 if(b0field) then
4619 bfacetot(ixi^s,idim1)=bfacesct(ixi^s,idim1)+block%B0(ixi^s,idim1,idim1)
4620 bfacetot(ixi^s,idim2)=bfacesct(ixi^s,idim2)+block%B0(ixi^s,idim2,idim2)
4621 else
4622 bfacetot(ixi^s,idim1)=bfacesct(ixi^s,idim1)
4623 bfacetot(ixi^s,idim2)=bfacesct(ixi^s,idim2)
4624 end if
4625 call reconstruct(ixi^l,ixc^l,idim2,bfacetot(ixi^s,idim1),&
4626 btill(ixi^s,idim1),btilr(ixi^s,idim1))
4627 call reconstruct(ixi^l,ixc^l,idim1,bfacetot(ixi^s,idim2),&
4628 btill(ixi^s,idim2),btilr(ixi^s,idim2))
4629 ! Take the maximum characteristic
4630 cm(ixc^s,1)=max(cbarmin(ixcp^s,idim1),cbarmin(ixc^s,idim1))
4631 cp(ixc^s,1)=max(cbarmax(ixcp^s,idim1),cbarmax(ixc^s,idim1))
4632 cm(ixc^s,2)=max(cbarmin(jxc^s,idim2),cbarmin(ixc^s,idim2))
4633 cp(ixc^s,2)=max(cbarmax(jxc^s,idim2),cbarmax(ixc^s,idim2))
4634 ! Calculate eletric field
4635 fe(ixc^s,idir)=-(cp(ixc^s,1)*vtill(ixc^s,1)*btill(ixc^s,idim2) &
4636 + cm(ixc^s,1)*vtilr(ixc^s,1)*btilr(ixc^s,idim2) &
4637 - cp(ixc^s,1)*cm(ixc^s,1)*(btilr(ixc^s,idim2)-btill(ixc^s,idim2)))&
4638 /(cp(ixc^s,1)+cm(ixc^s,1)) &
4639 +(cp(ixc^s,2)*vtill(ixc^s,2)*btill(ixc^s,idim1) &
4640 + cm(ixc^s,2)*vtilr(ixc^s,2)*btilr(ixc^s,idim1) &
4641 - cp(ixc^s,2)*cm(ixc^s,2)*(btilr(ixc^s,idim1)-btill(ixc^s,idim1)))&
4642 /(cp(ixc^s,2)+cm(ixc^s,2))
4643 ! add resistive electric field at cell edges E=-vxB+eta J
4644 if(rmhd_eta/=zero) fe(ixc^s,idir)=fe(ixc^s,idir)+e_resi(ixc^s,idir)
4645 fe(ixc^s,idir)=qdt*s%dsC(ixc^s,idir)*fe(ixc^s,idir)
4646 if (.not.slab) then
4647 where(abs(x(ixc^s,r_)+half*dxlevel(r_)).lt.1.0d-9)
4648 fe(ixc^s,idir)=zero
4649 end where
4650 end if
4651 end do
4652 ! allow user to change inductive electric field, especially for boundary driven applications
4653 if(associated(usr_set_electric_field)) &
4654 call usr_set_electric_field(ixi^l,ixo^l,qt,qdt,fe,sct)
4655 circ(ixi^s,1:ndim)=zero
4656 ! Calculate circulation on each face: interal(fE dot dl)
4657 do idim1=1,ndim ! Coordinate perpendicular to face
4658 ixcmax^d=ixomax^d;
4659 ixcmin^d=ixomin^d-kr(idim1,^d);
4660 do idim2=1,ndim
4661 do idir=sdim,3 ! Direction of line integral
4662 ! Assemble indices
4663 if(lvc(idim1,idim2,idir)/=0) then
4664 hxc^l=ixc^l-kr(idim2,^d);
4665 ! Add line integrals in direction idir
4666 circ(ixc^s,idim1)=circ(ixc^s,idim1)&
4667 +lvc(idim1,idim2,idir)&
4668 *(fe(ixc^s,idir)&
4669 -fe(hxc^s,idir))
4670 end if
4671 end do
4672 end do
4673 ! Divide by the area of the face to get dB/dt
4674 where(s%surfaceC(ixc^s,idim1) > 1.0d-9*s%dvolume(ixc^s))
4675 circ(ixc^s,idim1)=circ(ixc^s,idim1)/s%surfaceC(ixc^s,idim1)
4676 elsewhere
4677 circ(ixc^s,idim1)=zero
4678 end where
4679 ! Time update cell-face magnetic field component
4680 bfaces(ixc^s,idim1)=bfaces(ixc^s,idim1)-circ(ixc^s,idim1)
4681 end do
4682 end associate
4683 end subroutine update_faces_hll
4684
4685 !> calculate eta J at cell edges
4686 subroutine get_resistive_electric_field(ixI^L,ixO^L,sCT,s,jce)
4688 use mod_usr_methods
4689 use mod_geometry
4690 integer, intent(in) :: ixi^l, ixo^l
4691 type(state), intent(in) :: sct, s
4692 ! current on cell edges
4693 double precision :: jce(ixi^s,sdim:3)
4694 ! current on cell centers
4695 double precision :: jcc(ixi^s,7-2*ndir:3)
4696 ! location at cell faces
4697 double precision :: xs(ixgs^t,1:ndim)
4698 ! resistivity
4699 double precision :: eta(ixi^s)
4700 double precision :: gradi(ixgs^t)
4701 integer :: ix^d,ixc^l,ixa^l,ixb^l,idir,idirmin,idim1,idim2
4702
4703 associate(x=>s%x,dx=>s%dx,w=>s%w,wct=>sct%w,wcts=>sct%ws)
4704 ! calculate current density at cell edges
4705 jce=0.d0
4706 do idim1=1,ndim
4707 do idim2=1,ndim
4708 do idir=sdim,3
4709 if (lvc(idim1,idim2,idir)==0) cycle
4710 ixcmax^d=ixomax^d;
4711 ixcmin^d=ixomin^d+kr(idir,^d)-1;
4712 ixbmax^d=ixcmax^d-kr(idir,^d)+1;
4713 ixbmin^d=ixcmin^d;
4714 ! current at transverse faces
4715 xs(ixb^s,:)=x(ixb^s,:)
4716 xs(ixb^s,idim2)=x(ixb^s,idim2)+half*dx(ixb^s,idim2)
4717 call gradientf(wcts(ixgs^t,idim2),xs,ixgs^ll,ixc^l,idim1,gradi,2)
4718 if (lvc(idim1,idim2,idir)==1) then
4719 jce(ixc^s,idir)=jce(ixc^s,idir)+gradi(ixc^s)
4720 else
4721 jce(ixc^s,idir)=jce(ixc^s,idir)-gradi(ixc^s)
4722 end if
4723 end do
4724 end do
4725 end do
4726 ! get resistivity
4727 if(rmhd_eta>zero)then
4728 jce(ixi^s,:)=jce(ixi^s,:)*rmhd_eta
4729 else
4730 ixa^l=ixo^l^ladd1;
4731 call get_current(wct,ixi^l,ixa^l,idirmin,jcc)
4732 call usr_special_resistivity(wct,ixi^l,ixa^l,idirmin,x,jcc,eta)
4733 ! calcuate eta on cell edges
4734 do idir=sdim,3
4735 ixcmax^d=ixomax^d;
4736 ixcmin^d=ixomin^d+kr(idir,^d)-1;
4737 jcc(ixc^s,idir)=0.d0
4738 {do ix^db=0,1\}
4739 if({ ix^d==1 .and. ^d==idir | .or.}) cycle
4740 ixamin^d=ixcmin^d+ix^d;
4741 ixamax^d=ixcmax^d+ix^d;
4742 jcc(ixc^s,idir)=jcc(ixc^s,idir)+eta(ixa^s)
4743 {end do\}
4744 jcc(ixc^s,idir)=jcc(ixc^s,idir)*0.25d0
4745 jce(ixc^s,idir)=jce(ixc^s,idir)*jcc(ixc^s,idir)
4746 end do
4747 end if
4748 end associate
4749 end subroutine get_resistive_electric_field
4750
4751 !> calculate cell-center values from face-center values
4752 subroutine rmhd_face_to_center(ixO^L,s)
4754 ! Non-staggered interpolation range
4755 integer, intent(in) :: ixo^l
4756 type(state) :: s
4757 integer :: ix^d
4758
4759 ! calculate cell-center values from face-center values in 2nd order
4760 ! because the staggered arrays have an additional place to the left.
4761 ! Interpolate to cell barycentre using arithmetic average
4762 ! This might be done better later, to make the method less diffusive.
4763 {!dir$ ivdep
4764 do ix^db=ixomin^db,ixomax^db\}
4765 {^ifthreed
4766 s%w(ix^d,b1_)=half/s%surface(ix^d,1)*(s%ws(ix^d,1)*s%surfaceC(ix^d,1)&
4767 +s%ws(ix1-1,ix2,ix3,1)*s%surfaceC(ix1-1,ix2,ix3,1))
4768 s%w(ix^d,b2_)=half/s%surface(ix^d,2)*(s%ws(ix^d,2)*s%surfaceC(ix^d,2)&
4769 +s%ws(ix1,ix2-1,ix3,2)*s%surfaceC(ix1,ix2-1,ix3,2))
4770 s%w(ix^d,b3_)=half/s%surface(ix^d,3)*(s%ws(ix^d,3)*s%surfaceC(ix^d,3)&
4771 +s%ws(ix1,ix2,ix3-1,3)*s%surfaceC(ix1,ix2,ix3-1,3))
4772 }
4773 {^iftwod
4774 s%w(ix^d,b1_)=half/s%surface(ix^d,1)*(s%ws(ix^d,1)*s%surfaceC(ix^d,1)&
4775 +s%ws(ix1-1,ix2,1)*s%surfaceC(ix1-1,ix2,1))
4776 s%w(ix^d,b2_)=half/s%surface(ix^d,2)*(s%ws(ix^d,2)*s%surfaceC(ix^d,2)&
4777 +s%ws(ix1,ix2-1,2)*s%surfaceC(ix1,ix2-1,2))
4778 }
4779 {end do\}
4780 ! calculate cell-center values from face-center values in 4th order
4781 !do idim=1,ndim
4782 ! gxO^L=ixO^L-2*kr(idim,^D);
4783 ! hxO^L=ixO^L-kr(idim,^D);
4784 ! jxO^L=ixO^L+kr(idim,^D);
4785
4786 ! ! Interpolate to cell barycentre using fourth order central formula
4787 ! w(ixO^S,mag(idim))=(0.0625d0/s%surface(ixO^S,idim))*&
4788 ! ( -ws(gxO^S,idim)*s%surfaceC(gxO^S,idim) &
4789 ! +9.0d0*ws(hxO^S,idim)*s%surfaceC(hxO^S,idim) &
4790 ! +9.0d0*ws(ixO^S,idim)*s%surfaceC(ixO^S,idim) &
4791 ! -ws(jxO^S,idim)*s%surfaceC(jxO^S,idim) )
4792 !end do
4793
4794 ! calculate cell-center values from face-center values in 6th order
4795 !do idim=1,ndim
4796 ! fxO^L=ixO^L-3*kr(idim,^D);
4797 ! gxO^L=ixO^L-2*kr(idim,^D);
4798 ! hxO^L=ixO^L-kr(idim,^D);
4799 ! jxO^L=ixO^L+kr(idim,^D);
4800 ! kxO^L=ixO^L+2*kr(idim,^D);
4801
4802 ! ! Interpolate to cell barycentre using sixth order central formula
4803 ! w(ixO^S,mag(idim))=(0.00390625d0/s%surface(ixO^S,idim))* &
4804 ! ( +3.0d0*ws(fxO^S,idim)*s%surfaceC(fxO^S,idim) &
4805 ! -25.0d0*ws(gxO^S,idim)*s%surfaceC(gxO^S,idim) &
4806 ! +150.0d0*ws(hxO^S,idim)*s%surfaceC(hxO^S,idim) &
4807 ! +150.0d0*ws(ixO^S,idim)*s%surfaceC(ixO^S,idim) &
4808 ! -25.0d0*ws(jxO^S,idim)*s%surfaceC(jxO^S,idim) &
4809 ! +3.0d0*ws(kxO^S,idim)*s%surfaceC(kxO^S,idim) )
4810 !end do
4811 end subroutine rmhd_face_to_center
4812
4813 !> calculate magnetic field from vector potential
4814 subroutine b_from_vector_potential(ixIs^L, ixI^L, ixO^L, ws, x)
4817 integer, intent(in) :: ixis^l, ixi^l, ixo^l
4818 double precision, intent(inout) :: ws(ixis^s,1:nws)
4819 double precision, intent(in) :: x(ixi^s,1:ndim)
4820 double precision :: adummy(ixis^s,1:3)
4821
4822 call b_from_vector_potentiala(ixis^l, ixi^l, ixo^l, ws, x, adummy)
4823 end subroutine b_from_vector_potential
4824
4825 subroutine rfactor_from_temperature_ionization(w,x,ixI^L,ixO^L,Rfactor)
4828 integer, intent(in) :: ixi^l, ixo^l
4829 double precision, intent(in) :: w(ixi^s,1:nw)
4830 double precision, intent(in) :: x(ixi^s,1:ndim)
4831 double precision, intent(out):: rfactor(ixi^s)
4832 double precision :: iz_h(ixo^s),iz_he(ixo^s)
4833
4834 call ionization_degree_from_temperature(ixi^l,ixo^l,w(ixi^s,te_),iz_h,iz_he)
4835 ! assume the first and second ionization of Helium have the same degree
4836 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)
4837 end subroutine rfactor_from_temperature_ionization
4838
4839 subroutine rfactor_from_constant_ionization(w,x,ixI^L,ixO^L,Rfactor)
4841 integer, intent(in) :: ixi^l, ixo^l
4842 double precision, intent(in) :: w(ixi^s,1:nw)
4843 double precision, intent(in) :: x(ixi^s,1:ndim)
4844 double precision, intent(out):: rfactor(ixi^s)
4845
4846 rfactor(ixo^s)=rr
4847 end subroutine rfactor_from_constant_ionization
4848end module mod_rmhd_phys
Module for including anisotropic flux limited diffusion (AFLD)-approximation in Radiation-hydrodynami...
Definition mod_afld.t:8
subroutine afld_get_diffcoef_central(w, wct, x, ixil, ixol)
Calculates cell-centered diffusion coefficient to be used in multigrid.
Definition mod_afld.t:684
subroutine, public get_afld_rad_force(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 This subroutine handles th...
Definition mod_afld.t:141
subroutine, public afld_init(he_abundance, rhd_radiation_diffusion, afld_gamma)
Initialising FLD-module: Read opacities Initialise Multigrid adimensionalise kappa Add extra variable...
Definition mod_afld.t:93
subroutine, public afld_radforce_get_dt(w, ixil, ixol, dtnew, dxd, x)
Definition mod_afld.t:217
subroutine, public afld_get_radpress(w, x, ixil, ixol, rad_pressure, nth)
Calculate Radiation Pressure Returns Radiation Pressure as tensor.
Definition mod_afld.t:518
subroutine, public get_afld_energy_interact(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 This subroutine handles th...
Definition mod_afld.t:244
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 const_rad_a
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.
Nicolas Moens Module for including flux limited diffusion (FLD)-approximation in Radiation-hydrodynam...
Definition mod_fld.t:9
subroutine, public get_fld_rad_force(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 This subroutine handles th...
Definition mod_fld.t:146
subroutine, public fld_get_radpress(w, x, ixil, ixol, rad_pressure, nth)
Calculate Radiation Pressure Returns Radiation Pressure as tensor.
Definition mod_fld.t:456
subroutine, public fld_init(he_abundance, radiation_diffusion, energy_interact, r_gamma)
Initialising FLD-module: Read opacities Initialise Multigrid adimensionalise kappa Add extra variable...
Definition mod_fld.t:94
subroutine fld_get_diffcoef_central(w, wct, x, ixil, ixol)
Calculates cell-centered diffusion coefficient to be used in multigrid.
Definition mod_fld.t:719
character(len=8) fld_diff_scheme
Which method to solve diffusion part.
Definition mod_fld.t:35
subroutine, public fld_radforce_get_dt(w, ixil, ixol, dtnew, dxd, x)
Definition mod_fld.t:181
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 spherical
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, parameter bc_noinflow
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.
double precision unit_opacity
Physical scaling factor for Opacity.
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.
double precision unit_radflux
Physical scaling factor for radiation flux.
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 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
Radiation-magneto-hydrodynamics module.
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)...
integer, public, protected rmhd_trac_type
Which TRAC method is used.
character(len=8), public rmhd_pressure
In the case of no rmhd_energy, how to compute pressure.
subroutine, public rmhd_phys_init()
logical, public, protected rmhd_thermal_conduction
Whether thermal conduction is used.
double precision, public rmhd_gamma
The adiabatic index.
character(len=8), public rmhd_radiation_formalism
Formalism to treat radiation.
logical, public divbwave
Add divB wave in Roe solver.
integer, public, protected rmhd_trac_finegrid
Distance between two adjacent traced magnetic field lines (in finest cell size)
double precision, public, protected h_ion_fr
Ionization fraction of H H_ion_fr = H+/(H+ + H)
integer, dimension(2 *^nd), public, protected boundary_divbfix_skip
To skip * layer of ghost cells during divB=0 fix for boundary.
logical, public, protected rmhd_hyperbolic_thermal_conduction
Whether thermal conduction is used.
double precision, public, protected rr
logical, public rmhd_equi_thermal
double precision, public rmhd_etah
Hall resistivity.
logical, public, protected rmhd_radiation_diffusion
Treat radiation energy diffusion.
subroutine, public rmhd_face_to_center(ixol, s)
calculate cell-center values from face-center values
procedure(sub_get_pthermal), pointer, public rmhd_get_pthermal
integer, public, protected psi_
Indices of the GLM psi.
type(tc_fluid), allocatable, public tc_fl
type of fluid for thermal conduction
integer, public, protected c
Indices of the momentum density for the form of better vectorization.
subroutine, public b_from_vector_potential(ixisl, ixil, ixol, ws, x)
calculate magnetic field from vector potential
logical, public, protected rmhd_cak_force
Whether CAK radiation line force is activated.
logical, public, protected rmhd_radiation_force
Treat radiation fld_Rad_force.
logical, public, protected rmhd_glm
Whether GLM-MHD is used to control div B.
double precision, public, protected small_r_e
The smallest allowed radiation energy.
double precision, public rmhd_eta_hyper
The MHD hyper-resistivity.
logical, public clean_initial_divb
clean initial divB
integer, public, protected rmhd_n_tracer
Number of tracer species.
logical, public, protected rmhd_particles
Whether particles module is added.
integer, public, protected b
double precision, public kbmpmua4
kb/(m_p mu)* 1/a_rad**4,
integer, public, protected m
subroutine, public rmhd_get_trad(w, x, ixil, ixol, trad)
Calculates radiation temperature.
integer, public equi_rho0_
equi vars indices in the stateequi_vars array
double precision, public rmhd_adiab
The adiabatic constant.
subroutine, public rmhd_get_pthermal_plus_pradiation(w, x, ixil, ixol, pth_plus_prad)
Calculates the sum of the gas pressure and the max Prad tensor element.
integer, public, protected q_
Index of the heat flux q.
integer, public, protected tweight_
logical, public has_equi_rho0
whether split off equilibrium density
double precision, public rmhd_eta
The MHD resistivity.
integer, public, protected p_
Index of the gas pressure (-1 if not present) should equal e_.
subroutine, public get_normalized_divb(w, ixil, ixol, divb)
get dimensionless div B = |divB| * volume / area / |B|
integer, public, protected rho_
Index of the density (in the w array)
integer, public, protected c_
double precision function, dimension(ixo^s), public rmhd_mag_en_all(w, ixil, ixol)
Compute 2 times total magnetic energy.
type(te_fluid), allocatable, public te_fl_rmhd
type of fluid for thermal emission synthesis
logical, public, protected rmhd_gravity
Whether gravity is added.
integer, dimension(:), allocatable, public, protected mom
Indices of the momentum density.
logical, public, protected rmhd_glm_extended
Whether extended GLM-MHD is used with additional sources.
logical, public, protected rmhd_viscosity
Whether viscosity is added.
logical, public, protected rmhd_partial_ionization
Whether plasma is partially ionized.
integer, public, protected tcoff_
Index of the cutoff temperature for the TRAC method.
integer, public, protected e_
Index of the energy density (-1 if not present)
logical, public, protected rmhd_radiation_advection
Treat radiation advection.
double precision, public, protected he_ion_fr2
Ratio of number He2+ / number He+ + He2+ He_ion_fr2 = He2+/(He2+ + He+)
subroutine, public rmhd_get_rho(w, x, ixil, ixol, rho)
integer, dimension(:), allocatable, public, protected tracer
Indices of the tracers.
logical, public, protected rmhd_energy_interact
Treat radiation-gas energy interaction.
subroutine, public rmhd_get_tgas(w, x, ixil, ixol, tgas)
Calculates gas temperature.
character(len=std_len), public, protected type_ct
Method type of constrained transport.
procedure(sub_convert), pointer, public rmhd_to_conserved
double precision, public, protected he_abundance
Helium abundance over Hydrogen.
logical, public partial_energy
Whether an internal or hydrodynamic energy equation is used.
procedure(sub_convert), pointer, public rmhd_to_primitive
logical, public, protected rmhd_dump_full_vars
whether dump full variables (when splitting is used) in a separate dat file
logical, public, protected rmhd_trac
Whether TRAC method is used.
subroutine, public rmhd_clean_divb_multigrid(qdt, qt, active)
subroutine, public rmhd_set_mg_bounds
Set the boundaries for the diffusion of E.
subroutine, public rmhd_get_v(w, x, ixil, ixol, v)
Calculate v vector.
double precision, public hypertc_kappa
The thermal conductivity kappa in hyperbolic thermal conduction.
logical, public has_equi_pe0
whether split off equilibrium thermal pressure
subroutine, public rmhd_get_pradiation(w, x, ixil, ixol, prad, nth)
Calculate radiation pressure within ixO^L.
integer, public, protected te_
Indices of temperature.
logical, public, protected source_split_divb
Whether divB cleaning sources are added splitting from fluid solver.
integer, public, protected r_e
Index of the radiation energy.
procedure(sub_get_pthermal), pointer, public rmhd_get_temperature
character(len=std_len), public, protected typedivbfix
Method type to clean divergence of B.
logical, public, protected b0field_forcefree
B0 field is force-free.
double precision, public rmhd_glm_alpha
GLM-MHD parameter: ratio of the diffusive and advective time scales for div b taking values within [0...
integer, public, protected rmhd_divb_nth
Whether divB is computed with a fourth order approximation.
subroutine, public rmhd_ei_to_e(ixil, ixol, w, x)
Transform internal energy to total energy.
integer, public equi_pe0_
double precision, public, protected he_ion_fr
Ionization fraction of He He_ion_fr = (He2+ + He+)/(He2+ + He+ + He)
logical, public, protected rmhd_energy
Whether an energy equation is used.
logical, dimension(2 *^nd), public, protected boundary_divbfix
To control divB=0 fix for boundary.
double precision, public, protected rmhd_trac_mask
Height of the mask used in the TRAC method.
logical, public, protected eq_state_units
subroutine, public rmhd_e_to_ei(ixil, ixol, w, x)
Transform total energy to internal energy.
logical, public, protected rmhd_4th_order
MHD fourth order.
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(set_equi_vars), pointer usr_set_equi_vars
procedure(special_mg_bc), pointer usr_special_mg_bc
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