Civil Engineering Reference
In-Depth Information
The integration point (nip= 1) stresses are:
Element r-coord z-coord sig_r sig_z sig_t
tau_rz tau_zt tau_tr
1 0.2500E+00 0.9000E+01 0.6441E+00 -0.5036E+01 -0.4726E+00
0.8638E-01 0.0000E+00 0.0000E+00
2 0.2500E+00 0.7000E+01 0.2661E+01 -0.1413E+02 0.1144E+01
0.6800E-01 0.0000E+00 0.0000E+00
3 0.2500E+00 0.5000E+01 0.5441E+01 -0.2274E+02 0.3341E+01
0.1484E+00 0.0000E+00 0.0000E+00
4 0.2500E+00 0.3000E+01 0.8040E+01 -0.3164E+02 0.5250E+01
0.3627E+00 0.0000E+00 0.0000E+00
5 0.2500E+00 0.1000E+01 0.1700E+02 -0.3521E+02 0.1580E+02
0.9873E+00 0.0000E+00 0.0000E+00
Figure 5.21
( Continued from page 189 )
10 2 m, compared with the slender beam value
deflection of the cantilever to be 6 . 755
×
10 2 m. If the same load amplitude was applied to the second freedom of node 3,
it would correspond to a net moment of 0.5 kNm. The computed displacement in this case
would be
of 6 . 791
×
10 3 m.
It should be noted that the current version of Program 5.2 is restricted to load control only.
10 3 m, compared with the slender beam value of
5 . 063
×
5 . 093
×
Program 5.3 Three-dimensional analysis of an elastic solid using 8-, 14-, or 20-node
brick hexahedra. Mesh numbered in x - z planes then in the y -direction.
PROGRAM p53
!-------------------------------------------------------------------------
! Program 5.3 Three-dimensional analysis of an elastic solid using
! 8-, 14- or 20-node brick hexahedra. Mesh numbered in x-z
! planes then in the y-direction.
!-------------------------------------------------------------------------
USE main; USE geom; IMPLICIT NONE
INTEGER,PARAMETER::iwp=SELECTED_REAL_KIND(15)
INTEGER::fixed_freedoms,i,iel,k,loaded_nodes,ndim=3,ndof,nels,neq,nip,nn,&
nprops=2,np_types,nod,nodof=3,nr,nst=6,nxe,nye,nze
REAL(iwp)::det,penalty=1.0e20_iwp,zero=0.0_iwp
CHARACTER(LEN=15)::element='hexahedron'
!-----------------------dynamic arrays-----------------------------------
INTEGER,ALLOCATABLE::etype(:),g(:),g_g(:,:),g_num(:,:),kdiag(:),nf(:,:), &
no(:),node(:),num(:),sense(:)
REAL(iwp),ALLOCATABLE::bee(:,:),coord(:,:),dee(:,:),der(:,:),deriv(:,:), &
eld(:),fun(:),gc(:),g_coord(:,:),jac(:,:),km(:,:),kv(:),loads(:),
&
points(:,:),prop(:,:),sigma(:),value(:),weights(:),x_coords(:),
&
y_coords(:),z_coords(:)
!-----------------------input and initialisation--------------------------
OPEN(10,FILE='fe95.dat'); OPEN(11,FILE='fe95.res')
READ(10,*)nod,nxe,nye,nze,nip,np_types
CALL mesh_size(element,nod,nels,nn,nxe,nye,nze); ndof=nod*nodof
ALLOCATE(nf(nodof,nn),points(nip,ndim),dee(nst,nst),coord(nod,ndim), &
jac(ndim,ndim),der(ndim,nod),deriv(ndim,nod),g(ndof),bee(nst,ndof), &
km(ndof,ndof),eld(ndof),sigma(nst),g_g(ndof,nels),g_coord(ndim,nn), &
g_num(nod,nels),weights(nip),num(nod),prop(nprops,np_types), &
x_coords(nxe+1),y_coords(nye+1),z_coords(nze+1),etype(nels),fun(nod), &
gc(ndim))
READ(10,*)prop; etype=1; IF(np_types>1)READ(10,*)etype
READ(10,*)x_coords,y_coords,z_coords
nf=1; READ(10,*)nr,(k,nf(:,k),i=1,nr); CALL formnf(nf); neq=MAXVAL(nf)
ALLOCATE(loads(0:neq),kdiag(neq)); kdiag=0
Search WWH ::




Custom Search