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