|
V3FIT
|
Go to the documentation of this file.
18 USE stel_kinds,
only: rprec, dp
36 REAL (rprec),
DIMENSION(3) :: x_cart
38 INTEGER,
DIMENSION(2) :: indices
76 REAL (rprec),
DIMENSION(3),
INTENT(in) :: x_cart
77 INTEGER,
DIMENSION(2),
INTENT(in) :: indices
80 REAL (rprec) :: start_time
83 start_time = profiler_get_start_time()
90 CALL profiler_set_stop_time(
'sxrem_ratio_construct', start_time)
109 TYPE (sxrem_ratio_class),
INTENT(inout) :: this
140 REAL (rprec),
DIMENSION(4),
INTENT(out) :: sigma
141 REAL (rprec),
DIMENSION(4),
INTENT(in) :: last_value
144 REAL (rprec) :: emissivity
145 REAL (rprec) :: start_time
148 start_time = profiler_get_start_time()
152 IF (btest(a_model%state_flags, model_state_vmec_flag) .or.
153 & btest(a_model%state_flags, model_state_siesta_flag) .or.
154 & btest(a_model%state_flags, model_state_shift_flag) .or.
155 & btest(a_model%state_flags, model_state_sxrem_flag +
156 & (this%indices(1) - 1)) .or.
157 & btest(a_model%state_flags, model_state_sxrem_flag +
158 & (this%indices(2) - 1)) .or.
159 & btest(a_model%state_flags, model_state_signal_flag))
THEN
164 IF (emissivity .eq. 0.0)
THEN
169 & this%indices(1))/emissivity
172 CALL this%scale_and_offset(a_model,
178 CALL profiler_set_stop_time(
'sxrem_ratio_get_modeled_signal',
203 REAL (rprec) :: start_time
206 start_time = profiler_get_start_time()
212 CALL profiler_set_stop_time(
'sxrem_ratio_get_observed_signal',
235 REAL (rprec) :: start_time
238 start_time = profiler_get_start_time()
242 CALL profiler_set_stop_time(
'sxrem_ratio_get_type', start_time)
265 INTEGER,
INTENT(in) :: iou
266 INTEGER,
INTENT(in) :: index
267 TYPE (model_class),
INTENT(in) :: a_model
270 REAL (rprec) :: start_time
273 start_time = profiler_get_start_time()
275 WRITE (iou,1000) this%indices(1), this%indices(2)
277 CALL profiler_set_stop_time(
'sxrem_ratio_write_auxiliary',
280 1000
FORMAT(
'sxrem profile ratio',1x,i2,
'/',1x,i2)
real(rprec) function model_get_sxrem_cart(this, x_cart, index)
Gets the soft x-ray emissivity at a cartesian position.
real(rprec) function model_get_te_cart(this, x_cart)
Gets the electron temperature at a cartesian position.
character(len=data_name_length) function sxrem_ratio_get_type(this)
Gets a discription of the feedback type.
Defines a feedback signal based on the temperature based on the ration of the soft x-ray emissivity p...
Defines the base class of the type model_class. The model contains information not specific to the eq...
Base class representing a sxrem_ratio signal.
class(sxrem_ratio_class) function, pointer sxrem_ratio_construct(x_cart, indices)
Construct a sxrem_ratio_class object.
real(rprec) function, dimension(4) sxrem_ratio_get_modeled_signal(this, a_model, sigma, last_value)
Calculates the modeled signal.
subroutine sxrem_ratio_write_auxiliary(this, iou, index, a_model)
Write out auxiliary signal information to an output file.
Base class representing a model.
real(rprec) function model_get_sxrem_ratio(this, te)
Gets the soft x-ray emissivity ratio.
subroutine sxrem_ratio_destruct(this)
Deconstruct a sxrem_ratio_class object.
real(rprec) function sxrem_ratio_get_observed_signal(this, a_model)
Calculates the observed signal.
Base class representing a signal.
Defines the base class of the type signal_class.