korc_coords Module



Contents


Subroutines

public subroutine cart_to_cyl(X, Xcyl)

Read more…

Arguments

Type IntentOptional AttributesName
real(kind=rp), intent(in), DIMENSION(:,:), ALLOCATABLE:: X

Particles' position in Cartesian coordinates. X(1,:) = , X(2,:) = , X(3,:) =

real(kind=rp), intent(inout), DIMENSION(:,:), ALLOCATABLE:: Xcyl

Particles' position in cylindrical coordinates. Xcyl(1,:) = , Xcyl(2,:) = , Xcyl(3,:) =

public subroutine cart_to_cyl_p(X_X, X_Y, X_Z, Y_R, Y_PHI, Y_Z)

Arguments

Type IntentOptional AttributesName
real(kind=rp), intent(in), DIMENSION(8):: X_X
real(kind=rp), intent(in), DIMENSION(8):: X_Y
real(kind=rp), intent(in), DIMENSION(8):: X_Z
real(kind=rp), intent(out), DIMENSION(8):: Y_R
real(kind=rp), intent(out), DIMENSION(8):: Y_PHI
real(kind=rp), intent(out), DIMENSION(8):: Y_Z

public subroutine cyl_to_cart(Xcyl, X)

Read more…

Arguments

Type IntentOptional AttributesName
real(kind=rp), intent(in), DIMENSION(:,:), ALLOCATABLE:: Xcyl

Particles' position in cylindrical coordinates. Xcyl(1,:) = , Xcyl(2,:) = , Xcyl(3,:) =

real(kind=rp), intent(inout), DIMENSION(:,:), ALLOCATABLE:: X

Particles' position in Cartesian coordinates. X(1,:) = , X(2,:) = , X(3,:) =

public subroutine cyl_check_if_confined(F, Xcyl, flag)

Arguments

Type IntentOptional AttributesName
type(FIELDS), intent(in) :: F

An instance of the KORC derived type FIELDS.

real(kind=rp), intent(in), DIMENSION(:,:), ALLOCATABLE:: Xcyl

Particles' position in cylindrical coordinates. Xcyl(1,:) = , Xcyl(2,:) = , Xcyl(3,:) =

integer(kind=is), intent(inout), DIMENSION(:), ALLOCATABLE:: flag

public subroutine cyl_check_if_confined_p(a, R0, Xcyl_R, Xcyl_Z, flag)

Arguments

Type IntentOptional AttributesName
real(kind=rp), intent(in) :: a

Distance to plasma edge as measured from the magnetic axis.

real(kind=rp), intent(in) :: R0

Distance to plasma edge as measured from the magnetic axis.

real(kind=rp), intent(in), DIMENSION(8):: Xcyl_R
real(kind=rp), intent(in), DIMENSION(8):: Xcyl_Z
integer(kind=is), intent(inout), DIMENSION(8):: flag

public subroutine cart_to_tor_check_if_confined(X, F, Xtor, flag)

Read more…

Arguments

Type IntentOptional AttributesName
real(kind=rp), intent(in), DIMENSION(:,:), ALLOCATABLE:: X

Particles' position in Cartesian coordinates. X(1,:) = , X(2,:) = , X(3,:) =

type(FIELDS), intent(in) :: F

An instance of the KORC derived type FIELDS.

real(kind=rp), intent(inout), DIMENSION(:,:), ALLOCATABLE:: Xtor

Particles' position in cylindrical coordinates. Xtor(1,:) = , Xtor(2,:) = , Xtor(3,:) =

integer(kind=is), intent(inout), DIMENSION(:), ALLOCATABLE:: flag

public subroutine cart_to_tor_p(R0, X_X, X_Y, X_Z, T_R, T_T, T_Z)

Arguments

Type IntentOptional AttributesName
real(kind=rp), intent(in) :: R0
real(kind=rp), intent(in), DIMENSION(8):: X_X
real(kind=rp), intent(in), DIMENSION(8):: X_Y
real(kind=rp), intent(in), DIMENSION(8):: X_Z
real(kind=rp), intent(out), DIMENSION(8):: T_R
real(kind=rp), intent(out), DIMENSION(8):: T_T
real(kind=rp), intent(out), DIMENSION(8):: T_Z

public subroutine cart_to_tor_check_if_confined_p(ar, R0, X_X, X_Y, X_Z, T_R, T_T, T_Z, flag_cache)

Arguments

Type IntentOptional AttributesName
real(kind=rp), intent(in) :: ar
real(kind=rp), intent(in) :: R0
real(kind=rp), intent(in), DIMENSION(8):: X_X
real(kind=rp), intent(in), DIMENSION(8):: X_Y
real(kind=rp), intent(in), DIMENSION(8):: X_Z
real(kind=rp), intent(out), DIMENSION(8):: T_R
real(kind=rp), intent(out), DIMENSION(8):: T_T
real(kind=rp), intent(out), DIMENSION(8):: T_Z
integer(kind=is), intent(inout), DIMENSION(8):: flag_cache