1 SUBROUTINE database_transport2(COREPROF, CORETRANSP_DB, CORETRANSP_OUT, RHO_INTERPOL,user_out_outputFlag,user_out_diagnosticInfo)
4 USE deallocate_structures
20 TYPE (type_coreprof
),
POINTER :: coreprof(:)
21 TYPE (type_coretransp
),
POINTER :: coretransp_out(:)
22 TYPE (type_coretransp
),
POINTER :: coretransp_db(:)
23 TYPE (type_coretransp
),
POINTER :: coretransp_tmp(:)
25 INTEGER,
PARAMETER :: nslice = 1
26 INTEGER :: nrho1, nrho2
30 INTEGER,
ALLOCATABLE :: nzimp1(:)
32 INTEGER,
ALLOCATABLE :: ncomp1(:)
33 INTEGER,
ALLOCATABLE :: ntype1(:)
39 INTEGER :: rho_interpol
42 integer,
intent(out) :: user_out_outputflag
43 character(len=:),
pointer,
intent(out) :: user_out_diagnosticinfo
45 character*255 error_mes
50 nullify(user_out_diagnosticinfo)
52 if (.not.
associated(coretransp_db(1)%values))
then
53 user_out_outputflag=-1
54 error_mes=
'no coretransp present in input,stop'
55 nchd=len_trim(error_mes)
56 allocate(
character(nchd) :: user_out_diagnosticinfo)
57 user_out_diagnosticinfo=error_mes(1:nchd)
59 allocate(coretransp_out(1))
68 nrho1 =
SIZE(coreprof(1)%rho_tor, dim=1)
69 CALL
get_comp_dimensions(coreprof(1)%COMPOSITIONS, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1)
70 CALL
allocate_coretransp_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coretransp_out)
71 call deallocate_cpo(coretransp_out(1)%COMPOSITIONS)
72 CALL copy_cpo(coreprof(1)%COMPOSITIONS, coretransp_out(1)%COMPOSITIONS)
73 coretransp_out(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
80 write(*,*)
'take the transport data from cpo'
82 WRITE (6,*)
'ERROR>>> NO CORETRANSP CPO IN THE DATABASE FOR SELECTED SHOT:', shot, run
83 CALL
allocate_coretransp_cpo(nslice, nrho1, nnucl1, nion1, nimp1, nzimp1, nneut1, ntype1, ncomp1, coretransp_db)
84 call deallocate_cpo(coretransp_db(1)%COMPOSITIONS)
85 CALL copy_cpo(coreprof(1)%COMPOSITIONS, coretransp_db(1)%COMPOSITIONS)
86 coretransp_db(1)%VALUES(1)%rho_tor = coreprof(1)%rho_tor
92 nrho2 =
SIZE (coretransp_db(1)%VALUES(1)%rho_tor, dim=1)
94 IF (rho_interpol.NE.0) &
95 coretransp_db(1)%VALUES(1)%rho_tor = coretransp_db(1)%VALUES(1)%rho_tor &
96 / coretransp_db(1)%VALUES(1)%rho_tor(nrho2) &
97 * coretransp_out(1)%VALUES(1)%rho_tor(nrho1)
103 IF (
SIZE(coretransp_db(1)%VALUES).GT.1)
THEN
104 ALLOCATE (coretransp_tmp(1))
105 ALLOCATE (coretransp_tmp(1)%VALUES(1))
106 CALL copy_cpo(coretransp_db(1)%VALUES(1), coretransp_tmp(1)%VALUES(1))
107 CALL deallocate_cpo(coretransp_db(1)%VALUES)
108 ALLOCATE (coretransp_db(1)%VALUES(1))
109 CALL copy_cpo(coretransp_tmp(1)%VALUES(1), coretransp_db(1)%VALUES(1))
119 ALLOCATE (coretransp_out(1)%VALUES(1)%transportid%id(1))
120 ALLOCATE (coretransp_out(1)%VALUES(1)%transportid%description(1))
121 coretransp_out(1)%VALUES(1)%transportid%id =
'database'
122 coretransp_out(1)%VALUES(1)%transportid%flag = 10
123 coretransp_out(1)%VALUES(1)%transportid%description =
'Transport specified by a database entry'
127 CALL deallocate_cpo(coretransp_db)
128 if (
associated(coretransp_tmp)) call deallocate_cpo(coretransp_tmp)
129 IF (
ALLOCATED(nzimp1))
DEALLOCATE (nzimp1)
130 IF (
ALLOCATED(ncomp1))
DEALLOCATE (ncomp1)
131 IF (
ALLOCATED(ntype1))
DEALLOCATE (ntype1)
subroutine database_transport2(COREPROF, CORETRANSP_DB, CORETRANSP_OUT, RHO_INTERPOL, user_out_outputFlag, user_out_diagnosticInfo)
subroutine get_comp_dimensions(COMPOSITIONS, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP)
subroutine interpolate_transp(CORETRANSP_IN, CORETRANSP_OUT, NEGATIVE_DIFF)
This module contains routines for allocation/deallocation if CPOs used in ETS.
subroutine allocate_coretransp_cpo(NSLICE, NRHO, NNUCL, NION, NIMP, NZIMP, NNEUT, NTYPE, NCOMP, CORETRANSP)
This routine allocates CORETRANSP CPO.