error from inversion routines now boolean type
This commit is contained in:
parent
6095ce0972
commit
4743c1cd86
118
trunk/math.f90
118
trunk/math.f90
|
@ -138,7 +138,7 @@
|
||||||
implicit none
|
implicit none
|
||||||
|
|
||||||
integer(pInt) i,dimen
|
integer(pInt) i,dimen
|
||||||
real(pReal) math_identity2nd(dimen,dimen)
|
real(pReal), dimension(dimen,dimen) :: math_identity2nd
|
||||||
|
|
||||||
math_identity2nd = 0.0_pReal
|
math_identity2nd = 0.0_pReal
|
||||||
forall (i=1:dimen) math_identity2nd(i,i) = 1.0_pReal
|
forall (i=1:dimen) math_identity2nd(i,i) = 1.0_pReal
|
||||||
|
@ -156,7 +156,7 @@
|
||||||
implicit none
|
implicit none
|
||||||
|
|
||||||
integer(pInt) i,j,k,l,dimen
|
integer(pInt) i,j,k,l,dimen
|
||||||
real(pReal) math_identity4th(dimen,dimen,dimen,dimen)
|
real(pReal), dimension(dimen,dimen,dimen,dimen) :: math_identity4th
|
||||||
|
|
||||||
forall (i=1:dimen,j=1:dimen,k=1:dimen,l=1:dimen) math_identity4th(i,j,k,l) = &
|
forall (i=1:dimen,j=1:dimen,k=1:dimen,l=1:dimen) math_identity4th(i,j,k,l) = &
|
||||||
0.5_pReal*(math_I3(i,k)*math_I3(j,k)+math_I3(i,l)*math_I3(j,k))
|
0.5_pReal*(math_I3(i,k)*math_I3(j,k)+math_I3(i,l)*math_I3(j,k))
|
||||||
|
@ -168,88 +168,81 @@
|
||||||
!**************************************************************************
|
!**************************************************************************
|
||||||
! Cramer inversion of 3x3 matrix
|
! Cramer inversion of 3x3 matrix
|
||||||
!**************************************************************************
|
!**************************************************************************
|
||||||
SUBROUTINE math_invert3x3(A, InvA, DetA, err)
|
SUBROUTINE math_invert3x3(A, InvA, DetA, error)
|
||||||
|
|
||||||
! Bestimmung der Determinanten und Inversen einer 3x3-Matrix
|
! Bestimmung der Determinanten und Inversen einer 3x3-Matrix
|
||||||
|
|
||||||
! A = Matrix A
|
! A = Matrix A
|
||||||
! InvA = Inverse von A
|
! InvA = Inverse of A
|
||||||
! DetA = Determinante von A
|
! DetA = Determinant of A
|
||||||
! Fehler = Fehlerparameter
|
! error = logical
|
||||||
! 0 : Die Berechnung wurde durchgefuehrt.
|
|
||||||
! 1 : Die Determinante ist kleiner gleich Null.
|
|
||||||
|
|
||||||
use prec, only: pReal,pInt
|
use prec, only: pReal,pInt
|
||||||
implicit none
|
implicit none
|
||||||
|
|
||||||
integer (pInt) err
|
logical, intent(out) :: error
|
||||||
real(pReal) InvA(3,3), DetA, A(3,3)
|
real(pReal),dimension(3,3),intent(in) :: A
|
||||||
|
real(pReal),dimension(3,3),intent(out) :: InvA
|
||||||
INTENT (IN) A
|
real(pReal), intent(out) :: DetA
|
||||||
INTENT (OUT) InvA, DetA, err
|
|
||||||
|
|
||||||
err = 0
|
|
||||||
|
|
||||||
DetA = A(1,1) * ( A(2,2) * A(3,3) - A(2,3) * A(3,2) )&
|
DetA = A(1,1) * ( A(2,2) * A(3,3) - A(2,3) * A(3,2) )&
|
||||||
- A(1,2) * ( A(2,1) * A(3,3) - A(2,3) * A(3,1) )&
|
- A(1,2) * ( A(2,1) * A(3,3) - A(2,3) * A(3,1) )&
|
||||||
+ A(1,3) * ( A(2,1) * A(3,2) - A(2,2) * A(3,1) )
|
+ A(1,3) * ( A(2,1) * A(3,2) - A(2,2) * A(3,1) )
|
||||||
|
|
||||||
IF (DetA <= 0.0000001) THEN
|
if (DetA <= 0.0000001) then
|
||||||
err = 1
|
error = .true.
|
||||||
RETURN
|
else
|
||||||
END IF
|
InvA(1,1) = ( A(2,2) * A(3,3) - A(2,3) * A(3,2) ) / DetA
|
||||||
|
InvA(2,1) = ( -A(2,1) * A(3,3) + A(2,3) * A(3,1) ) / DetA
|
||||||
|
InvA(3,1) = ( A(2,1) * A(3,2) - A(2,2) * A(3,1) ) / DetA
|
||||||
|
|
||||||
InvA(1,1) = ( A(2,2) * A(3,3) - A(2,3) * A(3,2) ) / DetA
|
InvA(1,2) = ( -A(1,2) * A(3,3) + A(1,3) * A(3,2) ) / DetA
|
||||||
InvA(2,1) = ( -A(2,1) * A(3,3) + A(2,3) * A(3,1) ) / DetA
|
InvA(2,2) = ( A(1,1) * A(3,3) - A(1,3) * A(3,1) ) / DetA
|
||||||
InvA(3,1) = ( A(2,1) * A(3,2) - A(2,2) * A(3,1) ) / DetA
|
InvA(3,2) = ( -A(1,1) * A(3,2) + A(1,2) * A(3,1) ) / DetA
|
||||||
|
|
||||||
InvA(1,2) = ( -A(1,2) * A(3,3) + A(1,3) * A(3,2) ) / DetA
|
InvA(1,3) = ( A(1,2) * A(2,3) - A(1,3) * A(2,2) ) / DetA
|
||||||
InvA(2,2) = ( A(1,1) * A(3,3) - A(1,3) * A(3,1) ) / DetA
|
InvA(2,3) = ( -A(1,1) * A(2,3) + A(1,3) * A(2,1) ) / DetA
|
||||||
InvA(3,2) = ( -A(1,1) * A(3,2) + A(1,2) * A(3,1) ) / DetA
|
InvA(3,3) = ( A(1,1) * A(2,2) - A(1,2) * A(2,1) ) / DetA
|
||||||
|
|
||||||
InvA(1,3) = ( A(1,2) * A(2,3) - A(1,3) * A(2,2) ) / DetA
|
error = .false.
|
||||||
InvA(2,3) = ( -A(1,1) * A(2,3) + A(1,3) * A(2,1) ) / DetA
|
endif
|
||||||
InvA(3,3) = ( A(1,1) * A(2,2) - A(1,2) * A(2,1) ) / DetA
|
return
|
||||||
|
|
||||||
RETURN
|
|
||||||
END SUBROUTINE
|
END SUBROUTINE
|
||||||
|
|
||||||
|
|
||||||
!**************************************************************************
|
!**************************************************************************
|
||||||
! Gauss elimination to invert 6x6 matrix
|
! Gauss elimination to invert 6x6 matrix
|
||||||
!**************************************************************************
|
!**************************************************************************
|
||||||
SUBROUTINE math_invert6x6(A, InvA, AnzNegEW, err)
|
SUBROUTINE math_invert6x6(A, InvA, AnzNegEW, error)
|
||||||
|
|
||||||
! Invertieren einer 6x6-Matrix
|
! Invertieren einer 6x6-Matrix
|
||||||
|
|
||||||
! A = Matrix A
|
! A = Matrix A
|
||||||
! InvA = Inverse von A
|
! InvA = Inverse von A
|
||||||
! AnzNegEW = Anzahl der negativen Eigenwerte von A
|
! AnzNegEW = Anzahl der negativen Eigenwerte von A
|
||||||
! Fehler = Fehlerparameter
|
! error = logical
|
||||||
! = 0: Inversion wurde durchgefuehrt.
|
! = false: Inversion wurde durchgefuehrt.
|
||||||
! = 1: Die Inversion in SymGauss wurde wegen eines verschwindenen
|
! = true: Die Inversion in SymGauss wurde wegen eines verschwindenen
|
||||||
! Pivotelement abgebrochen.
|
! Pivotelement abgebrochen.
|
||||||
|
|
||||||
use prec, only: pReal,pInt
|
use prec, only: pReal,pInt
|
||||||
implicit none
|
implicit none
|
||||||
|
|
||||||
integer (pInt) AnzNegEW, err
|
real(pReal),dimension(6,6), intent(in) :: A
|
||||||
real(pReal) InvA(6,6), A(6,6)
|
real(pReal),dimension(6,6), intent(out) :: InvA
|
||||||
|
integer(pInt), intent(out) :: AnzNegEW
|
||||||
|
logical, intent(out) :: error
|
||||||
|
|
||||||
|
integer(pInt) i
|
||||||
INTENT (IN) A
|
real(pReal) LogAbsDetA
|
||||||
INTENT (OUT) InvA, AnzNegEW, err
|
real(pReal),dimension(6,6) :: B
|
||||||
|
|
||||||
|
|
||||||
integer (pInt) i
|
|
||||||
real(pReal) LogAbsDetA
|
|
||||||
real(pReal) B(6,6)
|
|
||||||
|
|
||||||
InvA = 0.0_pReal
|
InvA = 0.0_pReal
|
||||||
|
|
||||||
forall(i = 1:6) InvA(i,i) = 1.0_pReal
|
forall(i = 1:6) InvA(i,i) = 1.0_pReal
|
||||||
B = A
|
B = A
|
||||||
CALL Gauss (B, InvA, LogAbsDetA, AnzNegEW, err)
|
CALL Gauss (B,InvA,LogAbsDetA,AnzNegEW,error)
|
||||||
|
|
||||||
RETURN
|
RETURN
|
||||||
|
|
||||||
|
@ -258,7 +251,7 @@
|
||||||
! ++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++
|
! ++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++
|
||||||
! ++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++
|
! ++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++++
|
||||||
|
|
||||||
SUBROUTINE Gauss (A, B,LogAbsDetA, NegHDK,Fehler)
|
SUBROUTINE Gauss (A,B,LogAbsDetA,NegHDK,error)
|
||||||
|
|
||||||
! Loesung eines linearen Gleichungsssystem A * X = B mit Hilfe des
|
! Loesung eines linearen Gleichungsssystem A * X = B mit Hilfe des
|
||||||
! GAUSS-Algorithmusses
|
! GAUSS-Algorithmusses
|
||||||
|
@ -277,20 +270,21 @@
|
||||||
! LogAbsDetA = 10-Logarithmus des Betrages der Determinanten von A
|
! LogAbsDetA = 10-Logarithmus des Betrages der Determinanten von A
|
||||||
! NegHDK = Anzahl der negativen Hauptdiagonalkoeffizienten nach der
|
! NegHDK = Anzahl der negativen Hauptdiagonalkoeffizienten nach der
|
||||||
! Vorwaertszerlegung
|
! Vorwaertszerlegung
|
||||||
! Fehler = Fehlerparameter
|
! error = logical
|
||||||
! = 0: Das Gleichungssystem wurde geloest.
|
! = false: Das Gleichungssystem wurde geloest.
|
||||||
! = 1: Matrix A ist singulaer.
|
! = true : Matrix A ist singulaer.
|
||||||
|
|
||||||
! A und B werden veraendert!
|
! A und B werden veraendert!
|
||||||
|
|
||||||
use prec, only: pReal,pInt
|
use prec, only: pReal,pInt
|
||||||
implicit none
|
implicit none
|
||||||
|
|
||||||
integer (pInt) NegHDK, Fehler
|
logical error
|
||||||
|
integer (pInt) NegHDK
|
||||||
real(pReal) LogAbsDetA
|
real(pReal) LogAbsDetA
|
||||||
real(pReal) A(6,6), B(6,6)
|
real(pReal) A(6,6), B(6,6)
|
||||||
|
|
||||||
INTENT (OUT) LogAbsDetA, NegHDK, Fehler
|
INTENT (OUT) LogAbsDetA, NegHDK, error
|
||||||
INTENT (INOUT) A, B
|
INTENT (INOUT) A, B
|
||||||
|
|
||||||
LOGICAL SortX
|
LOGICAL SortX
|
||||||
|
@ -299,7 +293,7 @@
|
||||||
real(pReal) AbsA, PivotWert, EpsAbs, Quote
|
real(pReal) AbsA, PivotWert, EpsAbs, Quote
|
||||||
real(pReal) StoreA(6), StoreB(6)
|
real(pReal) StoreA(6), StoreB(6)
|
||||||
|
|
||||||
Fehler = 1
|
error = .true.
|
||||||
NegHDK = 1
|
NegHDK = 1
|
||||||
SortX = .FALSE.
|
SortX = .FALSE.
|
||||||
|
|
||||||
|
@ -435,7 +429,7 @@
|
||||||
LogAbsDetA = LogAbsDetA + LOG10(AbsA)
|
LogAbsDetA = LogAbsDetA + LOG10(AbsA)
|
||||||
END DO
|
END DO
|
||||||
|
|
||||||
Fehler = 0
|
error = .false.
|
||||||
|
|
||||||
RETURN
|
RETURN
|
||||||
|
|
||||||
|
@ -868,21 +862,21 @@
|
||||||
|
|
||||||
|
|
||||||
!****************************************************************
|
!****************************************************************
|
||||||
subroutine math_pDecomposition(FE,U,R,ISING)
|
subroutine math_pDecomposition(FE,U,R,error)
|
||||||
!-----FE=RU
|
!-----FE=RU
|
||||||
!-----INVERT is the subroutine applied by Marc
|
|
||||||
!****************************************************************
|
!****************************************************************
|
||||||
use prec, only: pReal, pInt
|
use prec, only: pReal, pInt
|
||||||
implicit none
|
implicit none
|
||||||
|
|
||||||
integer(pInt) ISING
|
logical error
|
||||||
real(pReal) FE(3,3),R(3,3),U(3,3),CE(3,3),EW1,EW2,EW3,EB1(3,3),EB2(3,3),EB3(3,3),UI(3,3),det
|
real(pReal) FE(3,3),R(3,3),U(3,3),CE(3,3),EW1,EW2,EW3,EB1(3,3),EB2(3,3),EB3(3,3),UI(3,3),det
|
||||||
ising=0
|
|
||||||
|
error = .false.
|
||||||
ce=matmul(transpose(fe),fe)
|
ce=matmul(transpose(fe),fe)
|
||||||
CALL math_spectral1(CE,EW1,EW2,EW3,EB1,EB2,EB3)
|
CALL math_spectral1(CE,EW1,EW2,EW3,EB1,EB2,EB3)
|
||||||
U=DSQRT(EW1)*EB1+DSQRT(EW2)*EB2+DSQRT(EW3)*EB3
|
U=DSQRT(EW1)*EB1+DSQRT(EW2)*EB2+DSQRT(EW3)*EB3
|
||||||
call math_invert3x3(U,UI,det,ising)
|
call math_invert3x3(U,UI,det,error)
|
||||||
if (ising==0) R=matmul(fe,ui)
|
if (.not. error) R = matmul(fe,ui)
|
||||||
return
|
return
|
||||||
|
|
||||||
END SUBROUTINE
|
END SUBROUTINE
|
||||||
|
|
Loading…
Reference in New Issue