5 USE deallocate_structures
20 TYPE (type_coreprof
),
POINTER :: coreprof(:)
21 TYPE (type_coreprof
),
POINTER :: coreprof_out(:)
22 TYPE (type_coreprof
),
POINTER :: coreprof_db(:)
24 INTEGER,
PARAMETER :: nslice = 1
25 INTEGER :: nrho1, nrho2
27 INTEGER :: nion1, iion1
29 INTEGER,
ALLOCATABLE :: nzimp1(:)
31 INTEGER,
ALLOCATABLE :: ncomp1(:)
32 INTEGER,
ALLOCATABLE :: ntype1(:)
38 INTEGER :: rho_interpol
40 CHARACTER(len=10) :: cpopath
46 nrho1 =
SIZE(coreprof(1)%rho_tor, dim=1)
47 CALL
get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1)
48 CALL
allocate_coreprof_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coreprof_out)
49 CALL copy_cpo(coreprof(1), coreprof_out(1))
50 coreprof_out(1)%rho_tor = coreprof(1)%rho_tor
59 write(6,*)
' profiles are read from the database'
61 WRITE (6,*)
'ERROR>>> NO COREPROF CPO IN THE DATABASE FOR SELECTED SHOT:'
62 CALL
allocate_coreprof_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coreprof_db)
63 call deallocate_cpo(coreprof_db(1)%COMPOSITIONS)
64 CALL copy_cpo(coreprof(1)%COMPOSITIONS, coreprof_db(1)%COMPOSITIONS)
65 coreprof_db(1)%rho_tor = coreprof(1)%rho_tor
71 nrho2 =
SIZE (coreprof_db(1)%rho_tor, dim=1)
73 IF (rho_interpol.NE.0) &
74 coreprof_db(1)%rho_tor = coreprof_db(1)%rho_tor &
75 / coreprof_db(1)%rho_tor(nrho2) &
76 * coreprof_out(1)%rho_tor(nrho1)
87 IF (coreprof_out(1)%psi%flag .EQ. 1) &
88 coreprof_out(1)%psi%value = coreprof(1)%psi%value
89 IF (coreprof_out(1)%ne%flag .EQ. 1) &
90 coreprof_out(1)%ne%value = coreprof(1)%ne%value
91 IF (coreprof_out(1)%te%flag .EQ. 1) &
92 coreprof_out(1)%te%value = coreprof(1)%te%value
96 IF (coreprof_out(1)%ni%flag(iion1) .EQ. 1) &
97 coreprof_out(1)%ni%value(:,iion1) = coreprof(1)%ni%value(:,iion1)
98 IF (coreprof_out(1)%ti%flag(iion1) .EQ. 1) &
99 coreprof_out(1)%ti%value(:,iion1) = coreprof(1)%ti%value(:,iion1)
100 IF (coreprof_out(1)%vtor%flag(iion1) .EQ. 1) &
101 coreprof_out(1)%vtor%value(:,iion1) = coreprof(1)%vtor%value(:,iion1)
105 IF (coreprof_out(1)%ne%flag .EQ. 3)
THEN
106 coreprof_out(1)%ne%boundary%value(1) = coreprof(1)%ne%value(nrho1)
107 coreprof_out(1)%ne%boundary%value(2) = 0.0_r8
108 coreprof_out(1)%ne%boundary%value(3) = 0.0_r8
109 coreprof_out(1)%ne%boundary%type = 1
111 IF (coreprof_out(1)%te%flag .EQ. 3)
THEN
112 coreprof_out(1)%te%boundary%value(1) = coreprof(1)%te%value(nrho1)
113 coreprof_out(1)%te%boundary%value(2) = 0.0_r8
114 coreprof_out(1)%te%boundary%value(3) = 0.0_r8
115 coreprof_out(1)%te%boundary%type = 1
120 IF (coreprof_out(1)%ni%flag(iion1) .EQ. 3)
THEN
121 coreprof_out(1)%ni%boundary%value(1,iion1) = coreprof(1)%ni%value(nrho1,iion1)
122 coreprof_out(1)%ni%boundary%value(2,iion1) = 0.0_r8
123 coreprof_out(1)%ni%boundary%value(3,iion1) = 0.0_r8
124 coreprof_out(1)%ni%boundary%type(iion1) = 1
127 IF (coreprof_out(1)%ti%flag(iion1) .EQ. 3)
THEN
128 coreprof_out(1)%ti%boundary%value(1,iion1) = coreprof(1)%ti%value(nrho1,iion1)
129 coreprof_out(1)%ti%boundary%value(2,iion1) = 0.0_r8
130 coreprof_out(1)%ti%boundary%value(3,iion1) = 0.0_r8
131 coreprof_out(1)%ti%boundary%type(iion1) = 1
134 IF (coreprof_out(1)%vtor%flag(iion1) .EQ. 3)
THEN
135 coreprof_out(1)%vtor%boundary%value(1,iion1) = coreprof(1)%vtor%value(nrho1,iion1)
136 coreprof_out(1)%vtor%boundary%value(2,iion1) = 0.0_r8
137 coreprof_out(1)%vtor%boundary%value(3,iion1) = 0.0_r8
138 coreprof_out(1)%vtor%boundary%type(iion1) = 1
147 CALL deallocate_cpo(coreprof_db)
148 IF (
ALLOCATED(nzimp1))
DEALLOCATE (nzimp1)
149 IF (
ALLOCATED(ncomp1))
DEALLOCATE (ncomp1)
150 IF (
ALLOCATED(ntype1))
DEALLOCATE (ntype1)
subroutine allocate_coreprof_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, COREPROF)
This routine allocates COREPROF CPO.
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
subroutine interpolate_prof(COREPROF_IN, COREPROF_OUT)
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine database_profiles2(COREPROF_DB, COREPROF, COREPROF_OUT, RHO_INTERPOL)