|
V3FIT
|
Go to the documentation of this file.
16 USE stel_kinds,
only: rprec
28 CHARACTER (len=*),
PARAMETER ::
29 'Guassian processes are not supported ' //
30 'for thomson pressure measurements.'
47 REAL (rprec),
DIMENSION(3) :: xcart
130 REAL (rprec),
DIMENSION(3),
INTENT(in) :: xcart
133 REAL (rprec) :: start_time
157 REAL (rprec),
DIMENSION(3),
INTENT(in) :: xcart
160 REAL (rprec) :: start_time
184 REAL (rprec),
DIMENSION(3),
INTENT(in) :: xcart
187 REAL (rprec) :: start_time
214 TYPE (thomson_class),
INTENT(inout) :: this
246 REAL (rprec),
DIMENSION(4),
INTENT(out) :: sigma
247 REAL (rprec),
DIMENSION(4),
INTENT(in) :: last_value
250 REAL (rprec) :: start_time
257 IF (btest(a_model%state_flags, model_state_vmec_flag) .or.
258 & btest(a_model%state_flags, model_state_siesta_flag) .or.
259 & btest(a_model%state_flags, model_state_te_flag) .or.
260 & btest(a_model%state_flags, model_state_shift_flag) .or.
261 & btest(a_model%state_flags, model_state_signal_flag))
THEN
265 CALL this%scale_and_offset(a_model,
298 REAL (rprec),
DIMENSION(4),
INTENT(out) :: sigma
299 REAL (rprec),
DIMENSION(4),
INTENT(in) :: last_value
302 REAL (rprec) :: start_time
309 IF (btest(a_model%state_flags, model_state_vmec_flag) .or.
310 & btest(a_model%state_flags, model_state_siesta_flag) .or.
311 & btest(a_model%state_flags, model_state_ne_flag) .or.
312 & btest(a_model%state_flags, model_state_shift_flag) .or.
313 & btest(a_model%state_flags, model_state_signal_flag))
THEN
317 CALL this%scale_and_offset(a_model,
350 REAL (rprec),
DIMENSION(4),
INTENT(out) :: sigma
351 REAL (rprec),
DIMENSION(4),
INTENT(in) :: last_value
354 REAL (rprec) :: start_time
361 IF (btest(a_model%state_flags, model_state_vmec_flag) .or.
362 & btest(a_model%state_flags, model_state_siesta_flag) .or.
363 & btest(a_model%state_flags, model_state_shift_flag) .or.
364 & btest(a_model%state_flags, model_state_signal_flag))
THEN
366 & equilibrium_get_p(a_model%equilibrium, this%xcart)
368 CALL this%scale_and_offset(a_model,
398 REAL (rprec) :: start_time
430 INTEGER,
INTENT(in) :: flags
433 REAL (rprec) :: start_time
466 INTEGER,
INTENT(in) :: i
467 INTEGER,
INTENT(in) :: flags
470 REAL (rprec) :: start_time
506 REAL (rprec),
DIMENSION(3),
INTENT(in) :: x_cart
507 INTEGER,
INTENT(in) :: flags
510 REAL (rprec) :: start_time
544 INTEGER,
INTENT(in) :: i
545 INTEGER,
INTENT(in) :: flags
548 REAL (rprec) :: start_time
583 REAL (rprec),
DIMENSION(3),
INTENT(in) :: x_cart
584 INTEGER,
INTENT(in) :: flags
587 REAL (rprec) :: start_time
real(rprec) function thomson_te_get_gp_i(this, a_model, i, flags)
Gets the guassian process kernel for a thomson te signal and a position.
Defines functions for measuring an tabulating performance of function and subroutine calls....
real(rprec) function thomson_get_gp_s(this, a_model, signal, flags)
Gets the guassian process kernel for a thomson signal and a signal.
Interface for the model density profile values.
Defines the base class of the type model_class. The model contains information not specific to the eq...
Base class representing a thomson scattering te signal.
Base class representing a thomson scattering te signal.
real(rprec) function thomson_te_get_gp_x(this, a_model, x_cart, flags)
Gets the guassian process kernel for a thomson te signal and a cartesian position.
Base class representing a thomson scattering signal.
real(rprec) function, dimension(4) thomson_p_get_modeled_signal(this, a_model, sigma, last_value)
Calculates the modeled pressure signal.
Umbrella module avoid multiple inlcudes of the mpif.h header.
Interface for the model guassian process electron temperature profile values.
real(rprec) function thomson_ne_get_gp_x(this, a_model, x_cart, flags)
Gets the guassian process kernel for a thomson ne signal and a cartesian position.
class(thomson_ne_class) function, pointer thomson_ne_construct(xcart)
Construct a thomson_class object measureing density.
subroutine thomson_destruct(this)
Deconstruct a thomson_class object.
real(rprec) function profiler_get_start_time()
Gets the start time of profiled function.
Base class representing a model.
Interface for the model electron temperature profile values.
real(rprec) function, dimension(4) thomson_ne_get_modeled_signal(this, a_model, sigma, last_value)
Calculates the modeled ne signal.
character(len=data_name_length) function thomson_get_type(this)
Gets a discription of the thomson type.
class(thomson_p_class) function, pointer thomson_p_construct(xcart)
Construct a thomson_class object measureing pressure.
Implements thomson scattering diagnostic. Defines the base class of the type thomson_class.
real(rprec) function, dimension(4) thomson_te_get_modeled_signal(this, a_model, sigma, last_value)
Calculates the modeled te signal.
class(thomson_te_class) function, pointer thomson_te_construct(xcart)
Construct a thomson_class object measureing temperature.
Interface for the model guassian process density profile values.
This modules contains parameters used by equilibrium models.
subroutine profiler_set_stop_time(symbol_name, start_time)
Gets the end time of profiled function.
real(rprec) function thomson_ne_get_gp_i(this, a_model, i, flags)
Gets the guassian process kernel for a thomson ne signal and a position.
Base class representing a signal.
character(len= *), parameter thomson_p_error
Assert message for pressure methods.
Defines the base class of the type signal_class.
Base class representing a thomson scattering te signal.