DAMASK_EICMD/src/rotations.f90

884 lines
32 KiB
Fortran
Raw Normal View History

! ###################################################################
! Copyright (c) 2013-2014, Marc De Graef/Carnegie Mellon University
2020-01-29 13:55:39 +05:30
! Modified 2017-2020, Martin Diehl/Max-Planck-Institut für Eisenforschung GmbH
! All rights reserved.
!
2020-04-22 18:56:29 +05:30
! Redistribution and use in source and binary forms, with or without modification, are
! permitted provided that the following conditions are met:
!
2020-04-22 18:56:29 +05:30
! - Redistributions of source code must retain the above copyright notice, this list
! of conditions and the following disclaimer.
2020-04-22 18:56:29 +05:30
! - Redistributions in binary form must reproduce the above copyright notice, this
! list of conditions and the following disclaimer in the documentation and/or
! other materials provided with the distribution.
2020-04-22 18:56:29 +05:30
! - Neither the names of Marc De Graef, Carnegie Mellon University nor the names
! of its contributors may be used to endorse or promote products derived from
! this software without specific prior written permission.
!
2020-04-22 18:56:29 +05:30
! THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS"
! AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE
! IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE
! ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT HOLDER OR CONTRIBUTORS BE
! LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR CONSEQUENTIAL
! DAMAGES (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR
! SERVICES; LOSS OF USE, DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER
! CAUSED AND ON ANY THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY,
! OR TORT (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE
! USE OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE.
! ###################################################################
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-02-01 14:31:54 +05:30
!> @author Marc De Graef, Carnegie Mellon University
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
!> @brief rotation storage and conversion
2020-04-22 18:56:29 +05:30
!> @details: rotation is internally stored as quaternion. It can be inialized from different
!> representations and also returns itself in different representations.
2019-02-01 14:47:20 +05:30
!
! All methods and naming conventions based on Rowenhorst et al. 2015
2019-02-01 14:47:20 +05:30
! Convention 1: coordinate frames are right-handed
! Convention 2: a rotation angle ω is taken to be positive for a counterclockwise rotation
! when viewing from the end point of the rotation axis towards the origin
! Convention 3: rotations will be interpreted in the passive sense
! Convention 4: Euler angle triplets are implemented using the Bunge convention,
! with the angular ranges as [0, 2π],[0, π],[0, 2π]
! Convention 5: the rotation angle ω is limited to the interval [0, π]
2020-01-14 16:03:18 +05:30
! Convention 6: the real part of a quaternion is positive, Re(q) > 0
! Convention 7: P = -1
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-02-01 14:31:54 +05:30
module rotations
use IO
use math
2020-04-22 18:56:29 +05:30
implicit none(type,external)
2019-04-03 16:41:18 +05:30
private
2021-01-02 22:27:11 +05:30
real(pReal), parameter :: P = -1.0_pReal !< parameter for orientation conversion.
2022-01-29 20:00:59 +05:30
type, public :: tRotation
2021-01-02 22:27:11 +05:30
real(pReal), dimension(4) :: q
2019-04-03 16:41:18 +05:30
contains
procedure, public :: asQuaternion
2019-09-21 05:48:09 +05:30
procedure, public :: asEulers
procedure, public :: asAxisAngle
procedure, public :: asMatrix
2019-04-03 16:41:18 +05:30
!------------------------------------------
2019-12-02 20:52:27 +05:30
procedure, public :: fromQuaternion
2019-09-21 05:48:09 +05:30
procedure, public :: fromEulers
procedure, public :: fromAxisAngle
procedure, public :: fromMatrix
2019-04-03 16:41:18 +05:30
!------------------------------------------
procedure, private :: rotRot__
generic, public :: operator(*) => rotRot__
2019-09-21 05:09:33 +05:30
generic, public :: rotate => rotVector,rotTensor2,rotTensor4
procedure, public :: rotVector
2019-09-20 21:15:23 +05:30
procedure, public :: rotTensor2
2019-09-21 05:09:33 +05:30
procedure, public :: rotTensor4
2021-11-20 19:45:59 +05:30
procedure, public :: rotStiffness
procedure, public :: misorientation
2020-01-14 16:03:18 +05:30
procedure, public :: standardize
2022-01-29 20:00:59 +05:30
end type tRotation
2020-04-22 18:56:29 +05:30
real(pReal), parameter :: &
PREF = sqrt(6.0_pReal/PI), &
A = PI**(5.0_pReal/6.0_pReal)/6.0_pReal**(1.0_pReal/6.0_pReal), &
AP = PI**(2.0_pReal/3.0_pReal), &
SC = A/AP, &
BETA = A/2.0_pReal, &
R1 = (3.0_pReal*PI/4.0_pReal)**(1.0_pReal/3.0_pReal), &
R2 = sqrt(2.0_pReal), &
PI12 = PI/12.0_pReal, &
PREK = R1 * 2.0_pReal**(1.0_pReal/4.0_pReal)/BETA
2019-09-22 19:23:03 +05:30
public :: &
2020-01-29 13:55:39 +05:30
rotations_init, &
eu2om
contains
2019-09-22 19:23:03 +05:30
!--------------------------------------------------------------------------------------------------
2020-09-14 00:58:53 +05:30
!> @brief Do self test.
2019-09-22 19:23:03 +05:30
!--------------------------------------------------------------------------------------------------
subroutine rotations_init
2019-09-22 19:23:03 +05:30
print'(/,1x,a)', '<<<+- rotations init -+>>>'; flush(IO_STDOUT)
2020-05-21 14:15:52 +05:30
print'(/,1x,a)', 'D. Rowenhorst et al., Modelling and Simulation in Materials Science and Engineering 23:083501, 2015'
print'( 1x,a)', 'https://doi.org/10.1088/0965-0393/23/8/083501'
2020-05-21 14:15:52 +05:30
2020-05-16 20:35:03 +05:30
call selfTest
2019-09-22 19:23:03 +05:30
end subroutine rotations_init
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
! Return rotation in different representations.
!--------------------------------------------------------------------------------------------------
2019-09-20 19:23:49 +05:30
pure function asQuaternion(self)
2019-02-01 14:31:54 +05:30
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
real(pReal), dimension(4) :: asQuaternion
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
2021-01-02 22:27:11 +05:30
asQuaternion = self%q
end function asQuaternion
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:48:09 +05:30
pure function asEulers(self)
2020-04-22 18:56:29 +05:30
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
real(pReal), dimension(3) :: asEulers
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
2021-01-02 22:27:11 +05:30
asEulers = qu2eu(self%q)
2019-09-21 05:48:09 +05:30
end function asEulers
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:48:09 +05:30
pure function asAxisAngle(self)
2019-02-01 14:31:54 +05:30
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
real(pReal), dimension(4) :: asAxisAngle
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
2021-01-02 22:27:11 +05:30
asAxisAngle = qu2ax(self%q)
2019-09-21 05:48:09 +05:30
end function asAxisAngle
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:48:09 +05:30
pure function asMatrix(self)
2020-04-22 18:56:29 +05:30
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
real(pReal), dimension(3,3) :: asMatrix
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
2021-01-02 22:27:11 +05:30
asMatrix = qu2om(self%q)
2019-09-21 05:48:09 +05:30
end function asMatrix
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
! Initialize rotation from different representations.
!--------------------------------------------------------------------------------------------------
2019-12-02 20:52:27 +05:30
subroutine fromQuaternion(self,qu)
2022-01-29 20:00:59 +05:30
class(tRotation), intent(out) :: self
2019-12-02 20:52:27 +05:30
real(pReal), dimension(4), intent(in) :: qu
2022-06-12 02:42:30 +05:30
if (dNeq(norm2(qu),1.0_pReal,1.0e-8_pReal)) call IO_error(402,ext_msg='fromQuaternion')
2019-12-02 20:52:27 +05:30
self%q = qu
end subroutine fromQuaternion
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:48:09 +05:30
subroutine fromEulers(self,eu,degrees)
2019-06-07 18:00:16 +05:30
2022-01-29 20:00:59 +05:30
class(tRotation), intent(out) :: self
2019-06-07 18:00:16 +05:30
real(pReal), dimension(3), intent(in) :: eu
2019-09-20 07:44:37 +05:30
logical, intent(in), optional :: degrees
2019-09-20 19:23:49 +05:30
real(pReal), dimension(3) :: Eulers
2022-06-12 02:42:30 +05:30
2019-09-20 07:44:37 +05:30
if (.not. present(degrees)) then
2019-09-20 19:23:49 +05:30
Eulers = eu
2019-09-20 07:44:37 +05:30
else
2019-09-20 19:23:49 +05:30
Eulers = merge(eu*INRAD,eu,degrees)
2022-06-15 23:45:35 +05:30
end if
2019-09-20 07:44:37 +05:30
if (any(Eulers<0.0_pReal) .or. any(Eulers>TAU) .or. Eulers(2) > PI) &
2019-09-21 05:48:09 +05:30
call IO_error(402,ext_msg='fromEulers')
2019-09-20 19:23:49 +05:30
self%q = eu2qu(Eulers)
2019-09-21 05:48:09 +05:30
end subroutine fromEulers
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:48:09 +05:30
subroutine fromAxisAngle(self,ax,degrees,P)
2022-01-29 20:00:59 +05:30
class(tRotation), intent(out) :: self
real(pReal), dimension(4), intent(in) :: ax
logical, intent(in), optional :: degrees
2019-09-20 19:23:49 +05:30
integer, intent(in), optional :: P
2019-09-20 19:27:39 +05:30
real(pReal) :: angle
real(pReal),dimension(3) :: axis
2022-06-12 02:42:30 +05:30
if (.not. present(degrees)) then
2019-09-20 19:23:49 +05:30
angle = ax(4)
else
angle = merge(ax(4)*INRAD,ax(4),degrees)
2022-06-15 23:45:35 +05:30
end if
2020-04-22 18:56:29 +05:30
2019-09-20 19:23:49 +05:30
if (.not. present(P)) then
axis = ax(1:3)
else
2019-09-20 19:27:39 +05:30
axis = ax(1:3) * merge(-1.0_pReal,1.0_pReal,P == 1)
2019-09-21 05:48:09 +05:30
if(abs(P) /= 1) call IO_error(402,ext_msg='fromAxisAngle (P)')
2022-06-15 23:45:35 +05:30
end if
2019-09-20 19:27:39 +05:30
if(dNeq(norm2(axis),1.0_pReal) .or. angle < 0.0_pReal .or. angle > PI) &
2019-09-21 05:48:09 +05:30
call IO_error(402,ext_msg='fromAxisAngle')
2020-04-22 18:56:29 +05:30
2019-09-20 19:23:49 +05:30
self%q = ax2qu([axis,angle])
2019-09-21 05:48:09 +05:30
end subroutine fromAxisAngle
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:48:09 +05:30
subroutine fromMatrix(self,om)
2022-01-29 20:00:59 +05:30
class(tRotation), intent(out) :: self
real(pReal), dimension(3,3), intent(in) :: om
2019-09-20 19:23:49 +05:30
2022-06-12 02:42:30 +05:30
2019-09-20 19:27:39 +05:30
if (dNeq(math_det33(om),1.0_pReal,tol=1.0e-5_pReal)) &
2019-09-21 05:48:09 +05:30
call IO_error(402,ext_msg='fromMatrix')
2019-09-20 19:23:49 +05:30
self%q = om2qu(om)
2019-09-21 05:48:09 +05:30
end subroutine fromMatrix
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief: Compose rotations.
!--------------------------------------------------------------------------------------------------
2019-09-21 05:09:33 +05:30
pure elemental function rotRot__(self,R) result(rRot)
2020-04-22 18:56:29 +05:30
2022-01-29 20:00:59 +05:30
type(tRotation) :: rRot
class(tRotation), intent(in) :: self,R
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
rRot = tRotation(multiplyQuaternion(self%q,R%q))
2020-01-14 16:03:18 +05:30
call rRot%standardize()
end function rotRot__
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Convert to quaternion representation with positive q(1).
!--------------------------------------------------------------------------------------------------
2020-01-14 16:03:18 +05:30
pure elemental subroutine standardize(self)
2022-01-29 20:00:59 +05:30
class(tRotation), intent(inout) :: self
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
if (sign(1.0_pReal,self%q(1)) < 0.0_pReal) self%q = - self%q
2020-01-14 16:03:18 +05:30
end subroutine standardize
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2021-01-02 22:27:11 +05:30
!> @brief Rotate a vector passively (default) or actively.
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:09:33 +05:30
pure function rotVector(self,v,active) result(vRot)
2020-04-22 18:56:29 +05:30
real(pReal), dimension(3) :: vRot
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
2019-04-03 16:41:18 +05:30
real(pReal), intent(in), dimension(3) :: v
logical, intent(in), optional :: active
2020-04-22 18:56:29 +05:30
2021-01-02 22:27:11 +05:30
real(pReal), dimension(4) :: v_normed, q
logical :: passive
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
2019-04-03 16:41:18 +05:30
if (present(active)) then
passive = .not. active
else
passive = .true.
2022-06-15 23:45:35 +05:30
end if
2020-04-22 18:56:29 +05:30
2019-09-20 21:15:23 +05:30
if (dEq0(norm2(v))) then
vRot = v
2019-04-03 16:41:18 +05:30
else
2021-01-02 22:27:11 +05:30
v_normed = [0.0_pReal,v]/norm2(v)
2022-06-12 02:42:30 +05:30
q = merge(multiplyQuaternion(self%q, multiplyQuaternion(v_normed, conjugateQuaternion(self%q))), &
multiplyQuaternion(conjugateQuaternion(self%q), multiplyQuaternion(v_normed, self%q)), &
passive)
2021-01-02 22:27:11 +05:30
vRot = q(2:4)*norm2(v)
2022-06-15 23:45:35 +05:30
end if
end function rotVector
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2021-01-02 22:27:11 +05:30
!> @brief Rotate a rank-2 tensor passively (default) or actively.
!> @details: Rotation is based on rotation matrix
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:09:33 +05:30
pure function rotTensor2(self,T,active) result(tRot)
2020-04-22 18:56:29 +05:30
2019-09-21 05:09:33 +05:30
real(pReal), dimension(3,3) :: tRot
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
2019-09-21 05:09:33 +05:30
real(pReal), intent(in), dimension(3,3) :: T
2019-04-03 16:41:18 +05:30
logical, intent(in), optional :: active
2020-04-22 18:56:29 +05:30
2019-04-03 16:41:18 +05:30
logical :: passive
2019-04-03 16:41:18 +05:30
if (present(active)) then
passive = .not. active
else
passive = .true.
2022-06-15 23:45:35 +05:30
end if
2020-04-22 18:56:29 +05:30
tRot = merge(matmul(matmul(self%asMatrix(),T),transpose(self%asMatrix())), &
matmul(matmul(transpose(self%asMatrix()),T),self%asMatrix()), &
passive)
2019-09-20 21:15:23 +05:30
end function rotTensor2
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2021-11-20 19:45:59 +05:30
!> @brief Rotate a rank-4 tensor passively (default) or actively.
2019-09-21 05:09:33 +05:30
!> @details: rotation is based on rotation matrix
!! ToDo: Need to check active/passive !!!
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-09-21 05:09:33 +05:30
pure function rotTensor4(self,T,active) result(tRot)
real(pReal), dimension(3,3,3,3) :: tRot
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
2019-09-21 05:09:33 +05:30
real(pReal), intent(in), dimension(3,3,3,3) :: T
logical, intent(in), optional :: active
2020-04-22 18:56:29 +05:30
2019-09-21 05:09:33 +05:30
real(pReal), dimension(3,3) :: R
integer :: i,j,k,l,m,n,o,p
2021-11-20 19:45:59 +05:30
2019-09-21 05:09:33 +05:30
if (present(active)) then
2019-09-21 05:48:09 +05:30
R = merge(transpose(self%asMatrix()),self%asMatrix(),active)
2019-09-21 05:09:33 +05:30
else
2019-09-21 05:48:09 +05:30
R = self%asMatrix()
2022-06-15 23:45:35 +05:30
end if
2019-09-21 05:09:33 +05:30
tRot = 0.0_pReal
do i = 1,3;do j = 1,3;do k = 1,3;do l = 1,3
do m = 1,3;do n = 1,3;do o = 1,3;do p = 1,3
tRot(i,j,k,l) = tRot(i,j,k,l) &
+ R(i,m) * R(j,n) * R(k,o) * R(l,p) * T(m,n,o,p)
2022-06-15 23:45:35 +05:30
end do; end do; end do; end do; end do; end do; end do; end do
2019-09-21 05:09:33 +05:30
end function rotTensor4
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Rotate a rank-4 stiffness tensor in Voigt 6x6 notation passively (default) or actively.
2021-11-20 19:45:59 +05:30
!> @details: https://scicomp.stackexchange.com/questions/35600
!! ToDo: Need to check active/passive !!!
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2021-11-20 19:45:59 +05:30
pure function rotStiffness(self,C,active) result(cRot)
real(pReal), dimension(6,6) :: cRot
2022-01-29 20:00:59 +05:30
class(tRotation), intent(in) :: self
2021-11-20 19:45:59 +05:30
real(pReal), intent(in), dimension(6,6) :: C
logical, intent(in), optional :: active
real(pReal), dimension(3,3) :: R
real(pReal), dimension(6,6) :: M
if (present(active)) then
R = merge(transpose(self%asMatrix()),self%asMatrix(),active)
else
R = self%asMatrix()
2022-06-15 23:45:35 +05:30
end if
2021-11-20 19:45:59 +05:30
M = reshape([R(1,1)**2, R(2,1)**2, R(3,1)**2, &
2021-11-20 19:45:59 +05:30
R(2,1)*R(3,1), R(1,1)*R(3,1), R(1,1)*R(2,1), &
R(1,2)**2, R(2,2)**2, R(3,2)**2, &
2021-11-20 19:45:59 +05:30
R(2,2)*R(3,2), R(1,2)*R(3,2), R(1,2)*R(2,2), &
R(1,3)**2, R(2,3)**2, R(3,3)**2, &
2021-11-20 19:45:59 +05:30
R(2,3)*R(3,3), R(1,3)*R(3,3), R(1,3)*R(2,3), &
2.0_pReal*R(1,2)*R(1,3), 2.0_pReal*R(2,2)*R(2,3), 2.0_pReal*R(3,2)*R(3,3), &
R(2,2)*R(3,3)+R(2,3)*R(3,2), R(1,2)*R(3,3)+R(1,3)*R(3,2), R(1,2)*R(2,3)+R(1,3)*R(2,2), &
2.0_pReal*R(1,3)*R(1,1), 2.0_pReal*R(2,3)*R(2,1), 2.0_pReal*R(3,3)*R(3,1), &
R(2,3)*R(3,1)+R(2,1)*R(3,3), R(1,3)*R(3,1)+R(1,1)*R(3,3), R(1,3)*R(2,1)+R(1,1)*R(2,3), &
2.0_pReal*R(1,1)*R(1,2), 2.0_pReal*R(2,1)*R(2,2), 2.0_pReal*R(3,1)*R(3,2), &
R(2,1)*R(3,2)+R(2,2)*R(3,1), R(1,1)*R(3,2)+R(1,2)*R(3,1), R(1,1)*R(2,2)+R(1,2)*R(2,1)],[6,6])
cRot = matmul(M,matmul(C,transpose(M)))
end function rotStiffness
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Calculate misorientation.
!--------------------------------------------------------------------------------------------------
2019-09-21 05:09:33 +05:30
pure elemental function misorientation(self,other)
2020-04-22 18:56:29 +05:30
2022-01-29 20:00:59 +05:30
type(tRotation) :: misorientation
class(tRotation), intent(in) :: self, other
2020-04-22 18:56:29 +05:30
2021-11-18 20:55:51 +05:30
2022-06-12 02:42:30 +05:30
misorientation%q = multiplyQuaternion(other%q, conjugateQuaternion(self%q))
end function misorientation
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2021-11-20 19:45:59 +05:30
!> @brief Convert unit quaternion to rotation matrix.
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
pure function qu2om(qu) result(om)
real(pReal), intent(in), dimension(4) :: qu
real(pReal), dimension(3,3) :: om
2020-04-22 18:56:29 +05:30
real(pReal) :: qq
2021-11-20 19:45:59 +05:30
qq = qu(1)**2-sum(qu(2:4)**2)
om(1,1) = qq+2.0_pReal*qu(2)**2
om(2,2) = qq+2.0_pReal*qu(3)**2
om(3,3) = qq+2.0_pReal*qu(4)**2
om(1,2) = 2.0_pReal*(qu(2)*qu(3)-qu(1)*qu(4))
om(2,3) = 2.0_pReal*(qu(3)*qu(4)-qu(1)*qu(2))
om(3,1) = 2.0_pReal*(qu(4)*qu(2)-qu(1)*qu(3))
om(2,1) = 2.0_pReal*(qu(3)*qu(2)+qu(1)*qu(4))
om(3,2) = 2.0_pReal*(qu(4)*qu(3)+qu(1)*qu(2))
om(1,3) = 2.0_pReal*(qu(2)*qu(4)+qu(1)*qu(3))
if (sign(1.0_pReal,P) < 0.0_pReal) om = transpose(om)
2022-05-20 10:13:32 +05:30
om = om/math_det33(om)**(1.0_pReal/3.0_pReal)
end function qu2om
2019-02-01 14:31:54 +05:30
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert unit quaternion to Bunge Euler angles.
!--------------------------------------------------------------------------------------------------
pure function qu2eu(qu) result(eu)
real(pReal), intent(in), dimension(4) :: qu
real(pReal), dimension(3) :: eu
2020-04-22 18:56:29 +05:30
2020-04-11 15:06:37 +05:30
real(pReal) :: q12, q03, chi
2020-04-22 18:56:29 +05:30
2021-11-20 19:45:59 +05:30
q03 = qu(1)**2+qu(4)**2
q12 = qu(2)**2+qu(3)**2
chi = sqrt(q03*q12)
2020-04-22 18:56:29 +05:30
2020-04-11 15:06:37 +05:30
degenerated: if (dEq0(q12)) then
eu = [atan2(-P*2.0_pReal*qu(1)*qu(4),qu(1)**2-qu(4)**2), 0.0_pReal, 0.0_pReal]
elseif (dEq0(q03)) then
eu = [atan2( 2.0_pReal*qu(2)*qu(3),qu(2)**2-qu(3)**2), PI, 0.0_pReal]
else degenerated
eu = [atan2((-P*qu(1)*qu(3)+qu(2)*qu(4))*chi, (-P*qu(1)*qu(2)-qu(3)*qu(4))*chi ), &
atan2( 2.0_pReal*chi, q03-q12 ), &
atan2(( P*qu(1)*qu(3)+qu(2)*qu(4))*chi, (-P*qu(1)*qu(2)+qu(3)*qu(4))*chi )]
2022-06-15 23:45:35 +05:30
end if degenerated
where(sign(1.0_pReal,eu)<0.0_pReal) eu = mod(eu+TAU,[TAU,PI,TAU])
end function qu2eu
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert unit quaternion to axis-angle pair.
!--------------------------------------------------------------------------------------------------
pure function qu2ax(qu) result(ax)
real(pReal), intent(in), dimension(4) :: qu
real(pReal), dimension(4) :: ax
2020-04-22 18:56:29 +05:30
real(pReal) :: omega, s
2022-06-12 02:42:30 +05:30
if (dEq0(sum(qu(2:4)**2))) then
2019-04-17 16:21:00 +05:30
ax = [ 0.0_pReal, 0.0_pReal, 1.0_pReal, 0.0_pReal ] ! axis = [001]
elseif (dNeq0(qu(1))) then
s = sign(1.0_pReal,qu(1))/norm2(qu(2:4))
omega = 2.0_pReal * acos(math_clip(qu(1),-1.0_pReal,1.0_pReal))
ax = [ qu(2)*s, qu(3)*s, qu(4)*s, omega ]
else
ax = [ qu(2), qu(3), qu(4), PI ]
end if
end function qu2ax
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
2019-04-17 16:21:00 +05:30
!> @author Martin Diehl, Max-Planck-Institut für Eisenforschung GmbH
2022-06-12 02:42:30 +05:30
!> @brief Convert rotation matrix to unit quaternion.
2019-04-17 16:21:00 +05:30
!> @details the original formulation (direct conversion) had (numerical?) issues
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
pure function om2qu(om) result(qu)
2019-04-17 16:21:00 +05:30
real(pReal), intent(in), dimension(3,3) :: om
real(pReal), dimension(4) :: qu
real(pReal) :: trace,s
trace = math_trace33(om)
2022-06-12 02:42:30 +05:30
if(trace > 0.0_pReal) then
s = 0.5_pReal / sqrt(trace+1.0_pReal)
qu = [0.25_pReal/s, (om(3,2)-om(2,3))*s,(om(1,3)-om(3,1))*s,(om(2,1)-om(1,2))*s]
else
if( om(1,1) > om(2,2) .and. om(1,1) > om(3,3) ) then
s = 2.0_pReal * sqrt( 1.0_pReal + om(1,1) - om(2,2) - om(3,3))
qu = [ (om(3,2) - om(2,3)) /s,0.25_pReal * s,(om(1,2) + om(2,1)) / s,(om(1,3) + om(3,1)) / s]
elseif (om(2,2) > om(3,3)) then
s = 2.0_pReal * sqrt( 1.0_pReal + om(2,2) - om(1,1) - om(3,3))
qu = [ (om(1,3) - om(3,1)) /s,(om(1,2) + om(2,1)) / s,0.25_pReal * s,(om(2,3) + om(3,2)) / s]
else
s = 2.0_pReal * sqrt( 1.0_pReal + om(3,3) - om(1,1) - om(2,2) )
qu = [ (om(2,1) - om(1,2)) /s,(om(1,3) + om(3,1)) / s,(om(2,3) + om(3,2)) / s,0.25_pReal * s]
2022-06-15 23:45:35 +05:30
end if
end if
if(sign(1.0_pReal,qu(1))<0.0_pReal) qu =-1.0_pReal * qu
2022-05-20 10:00:07 +05:30
qu(2:4) = merge(qu(2:4),qu(2:4)*P,dEq0(qu(2:4)))
2022-05-20 10:13:32 +05:30
qu = qu/norm2(qu)
end function om2qu
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert orientation matrix to Bunge Euler angles.
!> @details Two step check for special cases to avoid invalid operations (not needed for python)
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
pure function om2eu(om) result(eu)
2019-04-03 16:41:18 +05:30
real(pReal), intent(in), dimension(3,3) :: om
real(pReal), dimension(3) :: eu
real(pReal) :: zeta
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
if (dNeq(abs(om(3,3)),1.0_pReal,1.e-8_pReal)) then
zeta = 1.0_pReal/sqrt(math_clip(1.0_pReal-om(3,3)**2,1e-64_pReal,1.0_pReal))
2019-04-03 16:41:18 +05:30
eu = [atan2(om(3,1)*zeta,-om(3,2)*zeta), &
acos(math_clip(om(3,3),-1.0_pReal,1.0_pReal)), &
2019-04-03 16:41:18 +05:30
atan2(om(1,3)*zeta, om(2,3)*zeta)]
2020-04-22 18:56:29 +05:30
else
2019-09-23 05:26:23 +05:30
eu = [atan2(om(1,2),om(1,1)), 0.5_pReal*PI*(1.0_pReal-om(3,3)),0.0_pReal ]
2019-04-03 16:41:18 +05:30
end if
where(abs(eu) < 1.e-8_pReal) eu = 0.0_pReal
where(sign(1.0_pReal,eu)<0.0_pReal) eu = mod(eu+TAU,[TAU,PI,TAU])
2020-04-22 18:56:29 +05:30
end function om2eu
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert orientation matrix to axis-angle pair.
!--------------------------------------------------------------------------------------------------
function om2ax(om) result(ax)
2019-04-03 16:41:18 +05:30
real(pReal), intent(in), dimension(3,3) :: om
real(pReal), dimension(4) :: ax
2020-04-22 18:56:29 +05:30
real(pReal) :: t
real(pReal), dimension(3) :: Wr, Wi
real(pReal), dimension((64+2)*3) :: work
real(pReal), dimension(3,3) :: VR, devNull, om_
2019-09-22 19:23:03 +05:30
integer :: ierr, i
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
om_ = om
2020-04-22 18:56:29 +05:30
2019-04-03 16:41:18 +05:30
! first get the rotation angle
t = 0.5_pReal * (math_trace33(om) - 1.0_pReal)
2019-04-03 16:41:18 +05:30
ax(4) = acos(math_clip(t,-1.0_pReal,1.0_pReal))
2020-04-22 18:56:29 +05:30
2019-04-03 16:41:18 +05:30
if (dEq0(ax(4))) then
ax(1:3) = [ 0.0_pReal, 0.0_pReal, 1.0_pReal ]
2019-04-03 16:41:18 +05:30
else
call dgeev('N','V',3,om_,3,Wr,Wi,devNull,3,VR,3,work,size(work,1),ierr)
if (ierr /= 0) error stop 'LAPACK error'
i = findloc(cEq(cmplx(Wr,Wi,pReal),cmplx(1.0_pReal,0.0_pReal,pReal),tol=1.0e-14_pReal),.true.,dim=1) !find eigenvalue (1,0)
if (i == 0) error stop 'om2ax conversion failed'
2019-04-03 16:41:18 +05:30
ax(1:3) = VR(1:3,i)
where ( dNeq0([om(2,3)-om(3,2), om(3,1)-om(1,3), om(1,2)-om(2,1)])) &
ax(1:3) = sign(ax(1:3),-P *[om(2,3)-om(3,2), om(3,1)-om(1,3), om(1,2)-om(2,1)])
2022-06-15 23:45:35 +05:30
end if
end function om2ax
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert Bunge Euler angles to unit quaternion.
!--------------------------------------------------------------------------------------------------
pure function eu2qu(eu) result(qu)
2019-04-03 16:41:18 +05:30
real(pReal), intent(in), dimension(3) :: eu
real(pReal), dimension(4) :: qu
real(pReal), dimension(3) :: ee
real(pReal) :: cPhi, sPhi
2022-06-12 02:42:30 +05:30
ee = 0.5_pReal*eu
2020-04-22 18:56:29 +05:30
cPhi = cos(ee(2))
sPhi = sin(ee(2))
qu = [ cPhi*cos(ee(1)+ee(3)), &
-P*sPhi*cos(ee(1)-ee(3)), &
-P*sPhi*sin(ee(1)-ee(3)), &
-P*cPhi*sin(ee(1)+ee(3))]
if(sign(1.0_pReal,qu(1)) < 0.0_pReal) qu = qu * (-1.0_pReal)
end function eu2qu
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert Euler angles to orientation matrix.
!--------------------------------------------------------------------------------------------------
pure function eu2om(eu) result(om)
2020-04-22 18:56:29 +05:30
real(pReal), intent(in), dimension(3) :: eu
real(pReal), dimension(3,3) :: om
2020-04-22 18:56:29 +05:30
real(pReal), dimension(3) :: c, s
2022-06-12 02:42:30 +05:30
c = cos(eu)
s = sin(eu)
2020-04-22 18:56:29 +05:30
om(1,1) = c(1)*c(3)-s(1)*s(3)*c(2)
om(2,1) = -c(1)*s(3)-s(1)*c(3)*c(2)
om(3,1) = s(1)*s(2)
2020-10-12 08:59:48 +05:30
om(1,2) = s(1)*c(3)+c(1)*s(3)*c(2)
om(2,2) = -s(1)*s(3)+c(1)*c(3)*c(2)
om(3,2) = -c(1)*s(2)
2020-10-12 08:59:48 +05:30
om(1,3) = s(3)*s(2)
om(2,3) = c(3)*s(2)
om(3,3) = c(2)
2020-04-22 18:56:29 +05:30
where(abs(om)<1.0e-12_pReal) om = 0.0_pReal
end function eu2om
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert Bunge Euler angles to axis-angle pair.
!--------------------------------------------------------------------------------------------------
pure function eu2ax(eu) result(ax)
2020-04-22 18:56:29 +05:30
real(pReal), intent(in), dimension(3) :: eu
real(pReal), dimension(4) :: ax
2020-04-22 18:56:29 +05:30
real(pReal) :: t, delta, tau, alpha, sigma
2020-04-22 18:56:29 +05:30
2022-06-12 02:42:30 +05:30
t = tan(eu(2)*0.5_pReal)
sigma = 0.5_pReal*(eu(1)+eu(3))
delta = 0.5_pReal*(eu(1)-eu(3))
tau = sqrt(t**2+sin(sigma)**2)
2020-04-22 18:56:29 +05:30
alpha = merge(PI, 2.0_pReal*atan(tau/cos(sigma)), dEq(sigma,PI*0.5_pReal,tol=1.0e-15_pReal))
2020-04-22 18:56:29 +05:30
if (dEq0(alpha)) then ! return a default identity axis-angle pair
ax = [ 0.0_pReal, 0.0_pReal, 1.0_pReal, 0.0_pReal ]
2019-04-03 16:41:18 +05:30
else
ax(1:3) = -P/tau * [ t*cos(delta), t*sin(delta), sin(sigma) ] ! passive axis-angle pair so a minus sign in front
ax(4) = alpha
if (sign(1.0_pReal,alpha) < 0.0_pReal) ax = -ax ! ensure alpha is positive
2019-04-03 16:41:18 +05:30
end if
2020-04-22 18:56:29 +05:30
end function eu2ax
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert axis-angle pair to unit quaternion.
!--------------------------------------------------------------------------------------------------
pure function ax2qu(ax) result(qu)
2020-04-22 18:56:29 +05:30
real(pReal), intent(in), dimension(4) :: ax
real(pReal), dimension(4) :: qu
real(pReal) :: c, s
if (dEq0(ax(4))) then
qu = [ 1.0_pReal, 0.0_pReal, 0.0_pReal, 0.0_pReal ]
else
c = cos(ax(4)*0.5_pReal)
s = sin(ax(4)*0.5_pReal)
qu = [ c, ax(1)*s, ax(2)*s, ax(3)*s ]
end if
end function ax2qu
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert axis-angle pair to orientation matrix.
!--------------------------------------------------------------------------------------------------
pure function ax2om(ax) result(om)
real(pReal), intent(in), dimension(4) :: ax
real(pReal), dimension(3,3) :: om
2020-04-22 18:56:29 +05:30
real(pReal) :: q, c, s, omc
2022-06-12 02:42:30 +05:30
c = cos(ax(4))
s = sin(ax(4))
omc = 1.0_pReal-c
2019-09-20 19:23:49 +05:30
om(1,1) = ax(1)**2*omc + c
om(2,2) = ax(2)**2*omc + c
om(3,3) = ax(3)**2*omc + c
q = omc*ax(1)*ax(2)
om(1,2) = q + s*ax(3)
om(2,1) = q - s*ax(3)
2020-04-22 18:56:29 +05:30
q = omc*ax(2)*ax(3)
om(2,3) = q + s*ax(1)
om(3,2) = q - s*ax(1)
2020-04-22 18:56:29 +05:30
q = omc*ax(3)*ax(1)
om(3,1) = q + s*ax(2)
om(1,3) = q - s*ax(2)
if (P > 0.0_pReal) om = transpose(om)
end function ax2om
2022-06-12 02:42:30 +05:30
!--------------------------------------------------------------------------------------------------
!> @author Marc De Graef, Carnegie Mellon University
2022-06-12 02:42:30 +05:30
!> @brief Convert axis-angle pair to Bunge Euler angles.
!--------------------------------------------------------------------------------------------------
pure function ax2eu(ax) result(eu)
real(pReal), intent(in), dimension(4) :: ax
real(pReal), dimension(3) :: eu
2022-06-12 02:42:30 +05:30
eu = om2eu(ax2om(ax))
end function ax2eu
2019-09-22 19:23:03 +05:30
!--------------------------------------------------------------------------------------------------
2021-01-02 22:27:11 +05:30
!> @brief Multiply two quaternions.
!--------------------------------------------------------------------------------------------------
2022-06-12 02:42:30 +05:30
pure function multiplyQuaternion(qu1,qu2)
2021-01-02 22:27:11 +05:30
real(pReal), dimension(4), intent(in) :: qu1, qu2
2022-06-12 02:42:30 +05:30
real(pReal), dimension(4) :: multiplyQuaternion
2021-01-02 22:27:11 +05:30
2022-06-12 02:42:30 +05:30
multiplyQuaternion(1) = qu1(1)*qu2(1) - qu1(2)*qu2(2) - qu1(3)*qu2(3) - qu1(4)*qu2(4)
multiplyQuaternion(2) = qu1(1)*qu2(2) + qu1(2)*qu2(1) + P * (qu1(3)*qu2(4) - qu1(4)*qu2(3))
multiplyQuaternion(3) = qu1(1)*qu2(3) + qu1(3)*qu2(1) + P * (qu1(4)*qu2(2) - qu1(2)*qu2(4))
multiplyQuaternion(4) = qu1(1)*qu2(4) + qu1(4)*qu2(1) + P * (qu1(2)*qu2(3) - qu1(3)*qu2(2))
2021-01-02 22:27:11 +05:30
2022-06-12 02:42:30 +05:30
end function multiplyQuaternion
2021-01-02 22:27:11 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Calculate conjugate complex of a quaternion.
!--------------------------------------------------------------------------------------------------
2022-06-12 02:42:30 +05:30
pure function conjugateQuaternion(qu)
2021-01-02 22:27:11 +05:30
real(pReal), dimension(4), intent(in) :: qu
2022-06-12 02:42:30 +05:30
real(pReal), dimension(4) :: conjugateQuaternion
2021-01-02 22:27:11 +05:30
2022-06-12 02:42:30 +05:30
conjugateQuaternion = [qu(1), -qu(2), -qu(3), -qu(4)]
2021-01-02 22:27:11 +05:30
2022-06-12 02:42:30 +05:30
end function conjugateQuaternion
2021-01-02 22:27:11 +05:30
!--------------------------------------------------------------------------------------------------
!> @brief Check correctness of some rotations functions.
2019-09-22 19:23:03 +05:30
!--------------------------------------------------------------------------------------------------
subroutine selfTest()
2020-04-22 18:56:29 +05:30
2022-01-29 20:00:59 +05:30
type(tRotation) :: R
real(pReal), dimension(4) :: qu
2022-06-12 02:42:30 +05:30
real(pReal), dimension(3) :: x, eu, v3
real(pReal), dimension(3,3) :: om, t33
real(pReal), dimension(3,3,3,3) :: t3333
2021-11-20 19:45:59 +05:30
real(pReal), dimension(6,6) :: C
2022-06-27 14:07:41 +05:30
real(pReal) :: A,B
2019-09-22 19:23:03 +05:30
integer :: i
2021-01-02 22:27:11 +05:30
do i = 1, 20
2020-04-22 18:56:29 +05:30
2019-09-22 23:59:34 +05:30
if(i==1) then
2022-06-12 02:34:21 +05:30
qu = [1.0_pReal, 0.0_pReal, 0.0_pReal, 0.0_pReal]
2019-09-22 23:59:34 +05:30
elseif(i==2) then
2022-06-12 02:34:21 +05:30
qu = [1.0_pReal,-0.0_pReal,-0.0_pReal,-0.0_pReal]
2019-09-22 23:59:34 +05:30
elseif(i==3) then
2022-06-12 02:34:21 +05:30
qu = [0.0_pReal, 1.0_pReal, 0.0_pReal, 0.0_pReal]
2019-09-22 23:59:34 +05:30
elseif(i==4) then
qu = [0.0_pReal,0.0_pReal,1.0_pReal,0.0_pReal]
elseif(i==5) then
2022-06-12 02:34:21 +05:30
qu = [0.0_pReal, 0.0_pReal, 0.0_pReal, 1.0_pReal]
2019-09-22 23:59:34 +05:30
else
call random_number(x)
A = sqrt(x(3))
B = sqrt(1-0_pReal -x(3))
qu = [cos(TAU*x(1))*A,&
sin(TAU*x(2))*B,&
cos(TAU*x(2))*B,&
sin(TAU*x(1))*A]
2019-09-22 23:59:34 +05:30
if(qu(1)<0.0_pReal) qu = qu * (-1.0_pReal)
2022-06-15 23:45:35 +05:30
end if
2021-11-20 19:45:59 +05:30
2022-06-12 02:34:21 +05:30
if(.not. quaternion_equal(om2qu(qu2om(qu)),qu)) error stop 'om2qu2om'
if(.not. quaternion_equal(eu2qu(qu2eu(qu)),qu)) error stop 'eu2qu2eu'
if(.not. quaternion_equal(ax2qu(qu2ax(qu)),qu)) error stop 'ax2qu2ax'
om = qu2om(qu)
2022-06-12 02:34:21 +05:30
if(.not. quaternion_equal(om2qu(eu2om(om2eu(om))),qu)) error stop 'eu2om2eu'
if(.not. quaternion_equal(om2qu(ax2om(om2ax(om))),qu)) error stop 'ax2om2ax'
eu = qu2eu(qu)
2022-06-12 02:34:21 +05:30
if(.not. quaternion_equal(eu2qu(ax2eu(eu2ax(eu))),qu)) error stop 'ax2eu2ax'
call R%fromMatrix(om)
2020-04-22 18:56:29 +05:30
call random_number(v3)
if (any(dNeq(R%rotVector(R%rotVector(v3),active=.true.),v3,1.0e-12_pReal))) &
error stop 'rotVector'
2020-04-22 18:56:29 +05:30
call random_number(t33)
if (any(dNeq(R%rotTensor2(R%rotTensor2(t33),active=.true.),t33,1.0e-12_pReal))) &
error stop 'rotTensor2'
2020-04-22 18:56:29 +05:30
call random_number(t3333)
if (any(dNeq(R%rotTensor4(R%rotTensor4(t3333),active=.true.),t3333,1.0e-12_pReal))) &
error stop 'rotTensor4'
2019-09-22 19:23:03 +05:30
2021-11-20 19:45:59 +05:30
call random_number(C)
C = C+transpose(C)
if (any(dNeq(R%rotStiffness(C), &
math_3333toVoigt66_stiffness(R%rotate(math_Voigt66to3333_stiffness(C))),1.0e-12_pReal))) &
2021-11-20 19:45:59 +05:30
error stop 'rotStiffness'
call R%fromQuaternion(qu * (1.0_pReal + merge(+5.e-9_pReal,-5.e-9_pReal, mod(i,2) == 0))) ! allow reasonable tolerance for ASCII/YAML
2021-11-20 19:45:59 +05:30
end do
contains
pure recursive function quaternion_equal(qu1,qu2) result(ok)
real(pReal), intent(in), dimension(4) :: qu1,qu2
logical :: ok
ok = all(dEq(qu1,qu2,1.0e-7_pReal))
if(dEq0(qu1(1),1.0e-12_pReal)) &
ok = ok .or. all(dEq(-1.0_pReal*qu1,qu2,1.0e-7_pReal))
end function quaternion_equal
2020-05-16 20:35:03 +05:30
end subroutine selfTest
2019-09-22 19:23:03 +05:30
end module rotations