Civil Engineering Reference
In-Depth Information
Figure 12.31
( Continued from page 550 )
Program 12.7 Three-dimensional analysis of Biot poro-elastic solid. Compare
Program 9.2.
PROGRAM p127
!-------------------------------------------------------------------------
! Program 9.5 3 - D consolidation of a cuboidal Biot elastic
! solid using 20 -node solid hexahedral elements coupled to 8-node
! fluid elements - parallel pcg version - biot_cube
!-------------------------------------------------------------------------
USE precision; USE mp_module;USE gather_scatter6; USE utility; USE timing
USE global_variables1; USE new_library; USE geometry_lib ; IMPLICIT NONE
! nels,neq,ntot,ndof are now in global_variables1
INTEGER::nxe,nye,nze,nn,nr,nip,nodof=4,nod=20,nodf=8,nst=6,ndim=3,
&
i,j,k,l,iel, ns,nstep,cjiters,cjits,loaded_freedoms,
&
num_no,no_index_start,n_t, neq_temp, nn_temp, nle
REAL(iwp)::kx,ky,kz,e,v,det,dtim,theta,real_time,
&
up,alpha,beta,cjtol,aa,bb,cc ,q
LOGICAL :: cj_converged ; CHARACTER(LEN=15) :: element='hexahedron'
!---------------------------- dynamic arrays------------------------------
REAL(iwp) ,ALLOCATABLE :: dee(:,:),points(:,:),coord(:,:),derivf(:,:), &
jac(:,:),kay(:,:),der(:,:),deriv(:,:),weights(:), &
derf(:,:),funf(:), coordf(:,:), bee(:,:), km(:,:), &
eld(:), sigma(:), kc(:,:),ke(:,:),p_g_co_pp(:,:,:),&
kd(:,:),fun(:),c(:,:),loads_pp(:),pmul_pp(:,:),
&
vol(:), storke_pp(:,:,:), ans_pp(:) ,volf(:,:) ,
&
p_pp(:),x_pp(:),xnew_pp(:),u_pp(:),eld_pp(:,:),
&
diag_precon_pp(:),diag_precon_tmp(:,:),d_pp(:),
&
utemp_pp(:,:), storkd_pp(:,:,:),val(:)
INTEGER, ALLOCATABLE :: rest(:,:),g(:),num(:),g_g_pp(:,:),g_num_pp(:,:), &
g_t(:),no(:),no_local_temp(:),no_local(:)
!-------------------------input and initialisation------------------------
timest(1) = elap_time( )
;
CALL find_pe_procs(numpe,npes)
IF(numpe==npes)THEN
Search WWH ::




Custom Search