Home
last modified time | relevance | path

Searched refs:STIFF (Results 1 – 25 of 195) sorted by relevance

12345678

/dports/science/elmerfem/elmerfem-release-9.0/fem/src/modules/
H A DPoissonDG.F90231 STIFF = 0.0d0
300 STIFF(p,q) = STIFF(p,q) + (gamma/hE)*Jump(p)*Jump(q) * s
301 STIFF(p,q) = STIFF(p,q) - AverageFlux(p) * Jump(q) * s
302 STIFF(p,q) = STIFF(p,q) + Jump(p) * AverageFlux(q) * s
333 STIFF = 0.0d0
402 STIFF(p,q) = STIFF(p,q) + (gamma/hE)*Jump(p)*Jump(q) * s
403 STIFF(p,q) = STIFF(p,q) - AverageFlux(p) * Jump(q) * s
404 STIFF(p,q) = STIFF(p,q) + Jump(p) * AverageFlux(q) * s
435 STIFF = 0.0d0
460 STIFF(1:n,1:n) = STIFF(1:n,1:n) + s * &
[all …]
H A DPoisson.F9041 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:) local
43 SAVE STIFF, LOAD, FORCE, AllocationsDone
54 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), STAT=istat )
79 CALL CondensateP( nd, nb, STIFF, FORCE )
80 CALL DefaultUpdateEquations( STIFF, FORCE )
93 STIFF = 0.0d00
106 CALL DefaultUpdateEquations( STIFF, FORCE )
119 SUBROUTINE LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
121 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
134 STIFF = 0.0d0
[all …]
H A DElementSizeSolver.F9060 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), FORCE(:) local
66 SAVE STIFF, FORCE, AllocationsDone
78 ALLOCATE( FORCE(N), STIFF(N,N), STAT=istat )
101 CALL LocalMatrix( STIFF, FORCE, Element, n )
105 CALL DefaultUpdateEquations( STIFF, FORCE )
115 DEALLOCATE( FORCE, STIFF )
127 SUBROUTINE LocalMatrix( STIFF, FORCE, Element, n )
129 REAL(KIND=dp) :: STIFF(:,:), FORCE(:) local
142 STIFF = 0.0d0
171 STIFF(i,j) = STIFF(i,j) + Weight * &
H A DHeatSolveVec.F90421 STIFF = 0._dp
534 STIFF = 0._dp
561 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + Weight * &
578 STIFF(p,q) = STIFF(p,q) + Weight * A
598 STIFF (p,q) = STIFF(p,q) + Weight * &
614 STIFF(p,q) = STIFF(p,q) + Weight * PerfCoeff
888 STIFF(1:nd,1:nd) = AssFrac * STIFF(1:nd,1:nd)
1540 STIFF(p,p) = STIFF(p,p) + alpha * Basis(p) * s
1541 STIFF(p,n+p) = STIFF(p,n+p) - alpha * Basis(p) * s
1543 STIFF(p+n,p) = STIFF(p+n,p) - alpha * Basis(p) * s
[all …]
H A DDFTSolver.F90152 REAL(KIND=dp) :: STIFF(:,:), FORCE(:) local
170 STIFF = 0.0d0
201 STIFF(i,j) = STIFF(i,j) + Basis(i) * Basis(j) * detJ * IP % s(t)
424 REAL(KIND=dp) :: STIFF(:,:), MASS(:,:) local
443 STIFF = 0.0d0
483 STIFF(i,j) = STIFF(i,j) &
491 STIFF(i,j) = STIFF(i,j) &
501 STIFF = 0.5d0 * ( STIFF + TRANSPOSE(STIFF) )
1009 STIFF = 0.0d0
1043 STIFF(i,j) = STIFF(i,j) &
[all …]
H A DModelPDE.F90117 REAL(KIND=dp) :: MASS(nd,nd), STIFF(nd,nd), FORCE(nd), LOAD(n) local
130 STIFF = 0._dp
178 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + Weight * &
185 STIFF (p,q) = STIFF(p,q) + Weight * &
190 STIFF(p,q) = STIFF(p,q) + Weight * R*Basis(q) * Basis(p)
202 CALL CondensateP( nd-nb, nb, STIFF, FORCE )
203 CALL DefaultUpdateEquations(STIFF,FORCE)
218 REAL(KIND=dp) :: STIFF(nd,nd), FORCE(nd), LOAD(n) local
234 STIFF = 0._dp
267 STIFF(p,q) = STIFF(p,q) + Weight * C * Basis(q) * Basis(p)
[all …]
H A DStreamSolver.F9046 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:) local
57 SAVE STIFF, FORCE, LOAD, AllocationsDone
153 ALLOCATE( FORCE( N ), LOAD( 2*N ), STIFF(N,N), STAT=istat )
182 CALL DefaultUpdateEquations( STIFF, FORCE )
206 CALL DefaultUpdateEquations( STIFF, FORCE )
256 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
270 STIFF = 0.0d0
307 STIFF(1:n,1:n) = STIFF(1:n,1:n) &
312 STIFF(i,j) = STIFF(i,j) + s * Anchor * Basis(i) * Basis(j)
327 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
[all …]
H A DModelMixedPoisson.F9060 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), FORCE(:), Load(:,:) local
64 SAVE STIFF, FORCE, AllocationsDone
76 ALLOCATE( FORCE(N), STIFF(N,N), STAT=istat )
105 CALL DefaultUpdateEquations(STIFF, FORCE)
134 REAL(KIND=dp) :: STIFF(:,:), FORCE(:) local
156 STIFF = 0.0d0
204 STIFF(p,q) = STIFF(p,q) + Basis(p) * Basis(q) * s
208 STIFF(p,q) = STIFF(p,q) - Basis(p) * 1.0d0 * s
220 STIFF(i,j) = STIFF(i,j) + MatPar * &
225 STIFF(i,q) = STIFF(i,q) + 1.0d0 * DivFaceBasis(p) * s
[all …]
H A DViscousCompressibility.F9065 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:,:), FORCE(:), & local
73 SAVE MASS, STIFF, LOAD, FORCE, AllocationsDone, CVelo,PVelo, ppres, indexes, &
93 ALLOCATE( MASS(n,n), FORCE(N), STIFF(N,N), CVelo(dim,N), &
129 CALL LocalMatrix( MASS, STIFF, FORCE, CVelo, &
136 CALL DefaultUpdateEquations( STIFF, FORCE )
161 SUBROUTINE LocalMatrix( MASS, STIFF, FORCE, NodalVelo, Element, n, nd, ntot, dim )
163 REAL(KIND=dp), TARGET :: MASS(:,:), STIFF(:,:), FORCE(:) local
181 STIFF = 0.0d0
225 STIFF(i,:) = 0.0d0
226 STIFF(:,i) = 0.0d0
[all …]
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/CurvedBndryPFEM/
H A DPoisson.f9047 SAVE STIFF, LOAD, FORCE, POT, AllocationsDone
75 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
76 CALL DefaultUpdateEquations( STIFF, FORCE )
93 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
94 CALL DefaultUpdateEquations( STIFF, FORCE )
120 CALL DefaultUpdateEquations( STIFF, FORCE )
133 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
135 Energy = Energy + SUM( POT*MATMUL(STIFF,POT) )
147 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
160 STIFF = 0.0d0
[all …]
/dports/science/elmerfem/elmerfem-release-9.0/elmerice/Solvers/
H A DSIASolver.F90117 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), &
257 STIFF = 0.0D00
333 STIFF = 0.0d0
347 STIFF(p,q) = STIFF(p,q) + IP % S(t) * detJ * dBasisdx(q,dim)*dBasisdx(p,dim)
392 STIFF = 0.0d0
404 STIFF(p,q) = STIFF(p,q) + IP % S(t) * detJ * dBasisdx(q,dim)*dBasisdx(p,dim)
423 REAL(KIND=dp) :: STIFF(:,:), FORCE(:) local
436 STIFF = 0.0d0
448 STIFF(p,q) = STIFF(p,q) + IP % S(t) * detJ * dBasisdx(q,dim)*dBasisdx(p,dim)
474 STIFF = 0.0d0
[all …]
H A DExportVertically.F9088 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), FORCE(:) local
93 SAVE STIFF, FORCE, AllocationsDone, SolverName
107 IF (AllocationsDone) DEALLOCATE(FORCE, STIFF)
109 ALLOCATE( FORCE(N), STIFF(N,N), STAT=istat )
138 CALL LocalMatrix ( STIFF, FORCE, Element, n )
140 CALL DefaultUpdateEquations( STIFF, FORCE )
155 SUBROUTINE LocalMatrix( STIFF, FORCE, Element, n )
157 REAL(KIND=dp) :: STIFF(:,:), FORCE(:) local
170 STIFF = 0.0d0
183 STIFF(p,q) = STIFF(p,q) + IP % S(t) * detJ * dBasisdx(q,dim)*dBasisdx(p,dim)
H A DIntegratedVelocity.F9089 SAVE STIFF, LOAD, FORCE, AllocationsDone, DIM, SolverName
138 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), NodalVar(N), &
173 CALL DefaultUpdateEquations( STIFF, FORCE )
191 STIFF = 0.0D00
194 CALL DefaultUpdateEquations( STIFF, FORCE )
224 SUBROUTINE LocalMatrix( STIFF, FORCE, Element, n, var)
226 REAL(KIND=dp) :: STIFF(:,:), FORCE(:) , var(:) local
239 STIFF = 0.0d0
254 STIFF(p,q) = STIFF(p,q) + IP % S(t) * detJ * dBasisdx(q,dim)*dBasisdx(p,dim)
266 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), var(:) local
[all …]
H A DIntegrateVertically.F9089 SAVE STIFF, LOAD, FORCE, AllocationsDone, DIM, SolverName
139 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), NodalVar(N), &
171 CALL DefaultUpdateEquations( STIFF, FORCE )
187 CALL DefaultUpdateEquations( STIFF, FORCE )
212 SUBROUTINE LocalMatrix( STIFF, FORCE, Element, n, var)
214 REAL(KIND=dp) :: STIFF(:,:), FORCE(:) , var(:) local
227 STIFF = 0.0d0
242 STIFF(p,q) = STIFF(p,q) + IP % S(t) * detJ * dBasisdx(q,dim)*dBasisdx(p,dim)
252 SUBROUTINE LocalMatrixBC( STIFF, FORCE, Element, n, var )
254 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), var(:) local
[all …]
H A DFrontDisplacement.F90126 REAL(KIND=dp),ALLOCATABLE:: STIFF(:,:),& local
457 STIFF = 0.0d0
504 STIFF(p,q)=STIFF(q,p)
512 STIFF( j,: ) = 0.0d0
513 STIFF( :,j ) = 0.0d0
514 STIFF( j,j ) = 1.0d0
527 REAL(KIND=dp) :: STIFF(:,:),FORCE(:) local
552 STIFF = 0.0D0
606 STIFF( j,: ) = 0.0d0
607 STIFF( :,j ) = 0.0d0
[all …]
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/Q1Q0/
H A DQ1Q0.f90129 Pressure = Pressure / STIFF(k+1,k+1)
134 CALL LCondensateP( n*DOFs,STIFF )
139 CALL DefaultUpdateEquations( STIFF, FORCE )
198 STIFF = 0.0d0
237 A => STIFF(i+1:i+dim,j+1:j+dim)
256 STIFF(j+i,l) = STIFF(j+i,l) - s * dBasisdx(p,i)
257 STIFF(l,j+i) = STIFF(l,j+i) + s * rho * dBasisdx(p,i)
263 STIFF(l,l) = STIFF(l,l) + s * 1.d-8
272 STIFF(i,:) = 0.0d0
273 STIFF(:,i) = 0.0d0
[all …]
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/1dtests/
H A DPoisson.f9043 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:) local
45 SAVE STIFF, LOAD, FORCE, AllocationsDone
54 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), STAT=istat )
77 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n )
81 CALL DefaultUpdateEquations( STIFF, FORCE )
91 SUBROUTINE LocalMatrix( STIFF, FORCE, LOAD, Element, n )
93 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
106 STIFF = 0.0d0
124 STIFF(1:n,1:n) = STIFF(1:n,1:n) + IP % s(t) * DetJ * &
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/CurvedBndryPFEM2/
H A DPoisson.f9041 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:), & local
47 SAVE STIFF, LOAD, FORCE, POT, AllocationsDone
56 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), POT(N), STAT=istat )
77 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
78 CALL DefaultUpdateEquations( STIFF, FORCE )
90 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
92 Energy = Energy + SUM( POT*MATMUL(STIFF,POT) )
102 SUBROUTINE LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
104 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
117 STIFF = 0.0_dp
[all …]
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/pmultg/
H A DPoisson.f9041 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:) local
43 SAVE STIFF, LOAD, FORCE, AllocationsDone
52 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), STAT=istat )
76 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd+nb )
77 CALL LCondensate( nd, nb, STIFF, FORCE )
78 CALL DefaultUpdateEquations( STIFF, FORCE )
91 SUBROUTINE LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
93 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
106 STIFF = 0.0d0
124 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + IP % s(t) * DetJ * &
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/PoissonPFEM/
H A DPoisson.f9041 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:) local
43 SAVE STIFF, LOAD, FORCE, AllocationsDone
52 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), STAT=istat )
76 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd+nb )
77 CALL LCondensate( nd, nb, STIFF, FORCE )
78 CALL DefaultUpdateEquations( STIFF, FORCE )
91 SUBROUTINE LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
93 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
106 STIFF = 0.0d0
124 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + IP % s(t) * DetJ * &
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/ExtrudedMesh/
H A DPoisson.f9041 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:) local
43 SAVE STIFF, LOAD, FORCE, AllocationsDone
52 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), STAT=istat )
78 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd+nb )
79 CALL LCondensate( nd, nb, STIFF, FORCE )
80 CALL DefaultUpdateEquations( STIFF, FORCE )
93 SUBROUTINE LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
95 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
108 STIFF = 0.0d0
126 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + IP % s(t) * DetJ * &
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/ExtrudedMeshBaseline1/
H A DPoisson.f9041 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:), FORCE(:) local
43 SAVE STIFF, LOAD, FORCE, AllocationsDone
52 ALLOCATE( FORCE(N), LOAD(N), STIFF(N,N), STAT=istat )
78 CALL LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd+nb )
79 CALL LCondensate( nd, nb, STIFF, FORCE )
80 CALL DefaultUpdateEquations( STIFF, FORCE )
93 SUBROUTINE LocalMatrix( STIFF, FORCE, LOAD, Element, n, nd )
95 REAL(KIND=dp) :: STIFF(:,:), FORCE(:), LOAD(:) local
108 STIFF = 0.0d0
126 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + IP % s(t) * DetJ * &
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/ModelPDEhandle/
H A DModelPDEhandle.F90106 REAL(KIND=dp) :: MASS(nd,nd), STIFF(nd,nd), FORCE(nd) local
118 STIFF = 0._dp
150 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + Weight * &
157 STIFF (p,q) = STIFF(p,q) + Weight * &
162 STIFF(p,q) = STIFF(p,q) + Weight * R*Basis(q) * Basis(p)
174 CALL LCondensate( nd-nb, nb, STIFF, FORCE )
175 CALL DefaultUpdateEquations(STIFF,FORCE)
190 REAL(KIND=dp) :: STIFF(nd,nd), FORCE(nd) local
204 STIFF = 0._dp
232 STIFF(p,q) = STIFF(p,q) + Weight * C * Basis(q) * Basis(p)
[all …]
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/ModelPDEipadapt/
H A DModelPDEhandle.F90106 REAL(KIND=dp) :: MASS(nd,nd), STIFF(nd,nd), FORCE(nd) local
118 STIFF = 0._dp
151 STIFF(1:nd,1:nd) = STIFF(1:nd,1:nd) + Weight * &
158 STIFF (p,q) = STIFF(p,q) + Weight * &
163 STIFF(p,q) = STIFF(p,q) + Weight * R*Basis(q) * Basis(p)
175 CALL LCondensate( nd-nb, nb, STIFF, FORCE )
176 CALL DefaultUpdateEquations(STIFF,FORCE)
191 REAL(KIND=dp) :: STIFF(nd,nd), FORCE(nd) local
205 STIFF = 0._dp
233 STIFF(p,q) = STIFF(p,q) + Weight * C * Basis(q) * Basis(p)
[all …]
/dports/science/elmerfem/elmerfem-release-9.0/fem/tests/StokesProj/
H A DPressure.f9044 REAL(KIND=dp), ALLOCATABLE :: STIFF(:,:), LOAD(:,:), FORCE(:), Velocity(:,:) local
46 SAVE STIFF, LOAD, FORCE, Velocity, AllocationsDone
56 ALLOCATE( FORCE(N), STIFF(N,N), Velocity(dim,N), STAT=istat )
79 CALL LocalMatrix( STIFF, FORCE, Velocity, &
81 IF ( nb>0 ) CALL LCondensate( nd, nb, STIFF, FORCE )
85 CALL DefaultUpdateEquations( STIFF, FORCE )
108 SUBROUTINE LocalMatrix( STIFF, FORCE, NodalVelo, Element, n, nd, ntot, dim )
110 REAL(KIND=dp), TARGET :: STIFF(:,:), FORCE(:) local
128 STIFF = 0.0d0
151 STIFF(1:ntot,1:ntot) = STIFF(1:ntot,1:ntot) + s * &

12345678