-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathoutx.f90
executable file
·94 lines (75 loc) · 2.45 KB
/
outx.f90
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
subroutine outx
!*** OUTPUT: grid-based fields ***!
!----------------------------------------------------!
! ORIGINAL MODEL: F. Califano, 2006 !
! M. Faganello, 2008 !
! !
! Faganello et al., New J. Phys. 11, 063008 (2009) !
! !
! ================================================ !
! EXTENDED MODEL: S. S. Cerri, 2011 !
! !
! Cerri et al., Phys. Plasmas 20, 112112 (2013) !
! !
!--------------------------------------------------- !
!**************************************************!
! MPI PARALLEL VERSION: VALENTINI-FAGANELLO 2009 !
! 3D PARALLEL VERSION: FAGANELLO 2010 !
! 3D ANISOTROPIC/FLR H-MHD/TF: CERRI 2011 !
!**************************************************!
use parameter_mod
use box_mod
use fields_UJ_mod
use fields_DP_mod
use fields_EB_mod
use dom_distr_mod
use parallel_mod
IMPLICIT NONE
integer :: ix, iy, iz
write(l_U_me, 821) ixlg, ixlg+nxl-1, tempo
write(l_EB_me, 821) ixlg, ixlg+nxl-1, tempo
write(l_DPJ_me, 821) ixlg, ixlg+nxl-1, tempo
write(l_Gi_me, 821) ixlg, ixlg+nxl-1, tempo
do iz=1,nzl, nwz
do iy=1,nyl, nwy
do ix=1,nxl, nwx
write(l_U_me, 806) Uex(ix,iy,iz), Uey(ix,iy,iz), Uez(ix,iy,iz) &
, Uix(ix,iy,iz), Uiy(ix,iy,iz), Uiz(ix,iy,iz)
enddo
enddo
enddo
do iz=1,nzl, nwz
do iy=1,nyl, nwy
do ix=1,nxl, nwx
write(l_EB_me, 806) Ex(ix,iy,iz), Ey(ix,iy,iz), Ez(ix,iy,iz) &
, Bx(ix,iy,iz), By(ix,iy,iz), Bz(ix,iy,iz)
enddo
enddo
enddo
do iz=1,nzl, nwz
do iy=1,nyl, nwy
do ix=1,nxl, nwx
write(l_DPJ_me, 806) Den(ix,iy,iz), Tracciante(ix,iy,iz) &
, pe_para(ix,iy,iz), pe_perp(ix,iy,iz) &
, pi_para(ix,iy,iz), pi_perp(ix,iy,iz)
enddo
enddo
enddo
do iz=1,nzl, nwz
do iy=1,nyl, nwy
do ix=1,nxl, nwx
write(l_Gi_me, 804) Gi_xx(ix,iy,iz), Gi_xy(ix,iy,iz) &
, Gi_xz(ix,iy,iz), Gi_yz(ix,iy,iz)
enddo
enddo
enddo
802 format(1x, 2(1x, 1e11.4))
803 format(1x, 3(1x, 1e11.4))
804 format(1x, 4(1x, 1e11.4))
805 format(1x, 5(1x, 1e11.4))
806 format(1x, 6(1x, 1e11.4))
808 format(1x, 8(1x, 1e11.4))
809 format(1x, 9(1x, 1e11.4))
812 format(1x, 6(1x, 1e11.4))
821 format(1x, 2(1x, 1i5), 1x, 1e11.4)
end subroutine