CFD Online Logo CFD Online URL
www.cfd-online.com
[Sponsors]
Home > Wiki > Common icomm 1.f90 - include module

Common icomm 1.f90 - include module

From CFD-Wiki

(Difference between revisions)
Jump to: navigation, search
(New page: <pre> !Sample program for solving Lid-driven cavity flow test using SIMPLE-algorithm ! include modul !Copyright (C) 2010 Michail Kiričkov !This program is free software; you can redist...)
 
(2 intermediate revisions not shown)
Line 4: Line 4:
! include modul
! include modul
!Copyright (C) 2010  Michail Kiričkov
!Copyright (C) 2010  Michail Kiričkov
-
 
+
!Copyright (C) 2016  Michail Kiričkov, Kaunas University for Technology
 +
!
!This program is free software; you can redistribute it and/or
!This program is free software; you can redistribute it and/or
!modify it under the terms of the GNU General Public License
!modify it under the terms of the GNU General Public License
Line 20: Line 21:
!**********************************************************************
!**********************************************************************
-
parameter nx=500, ny=500
+
parameter nx=300, ny=300
-
 
+
  DOUBLE PRECISION  U(nx,ny),V(nx,ny),F(nx,ny,10), &
  DOUBLE PRECISION  U(nx,ny),V(nx,ny),F(nx,ny,10), &
Xc(nx,ny),Yc(nx,ny),X(nx,ny),Y(nx,ny),Gam(nx,ny),Ro(nx,ny)
Xc(nx,ny),Yc(nx,ny),X(nx,ny),Y(nx,ny),Gam(nx,ny),Ro(nx,ny)
-
 
  DOUBLE PRECISION  X_xi(nx,ny),    &
  DOUBLE PRECISION  X_xi(nx,ny),    &
  Y_xi(nx,ny),    &
  Y_xi(nx,ny),    &
  X_et(nx,ny),    &
  X_et(nx,ny),    &
  Y_et(nx,ny),   &
  Y_et(nx,ny),   &
-
 
+
              Del_X_xi(nx,ny),    &
-
                          Del_X_xi(nx,ny),    &
+
  Del_Y_xi(nx,ny),    &
  Del_Y_xi(nx,ny),    &
-
 
  Del_X_et(nx,ny),    &
  Del_X_et(nx,ny),    &
  Del_Y_et(nx,ny),    &
  Del_Y_et(nx,ny),    &
-
 
 
-
 
  Dx_c(nx,ny),    &
  Dx_c(nx,ny),    &
  Dy_c(nx,ny)  
  Dy_c(nx,ny)  
-
 
  DOUBLE PRECISION  DPx_c(nx,ny),  &
  DOUBLE PRECISION  DPx_c(nx,ny),  &
          DPy_c(nx,ny),  &
          DPy_c(nx,ny),  &
-
              
+
            Con_e(nx,ny),  &              
-
  Con_e(nx,ny),  &               
+
  Con_w(nx,ny),  &               
  Con_n(nx,ny),  &   
  Con_n(nx,ny),  &   
-
  CheckFlux(nx,ny),  &
+
  Con_s(nx,ny),  &  
-
 
+
  Con_we(nx,ny),  &             
 +
  Con_ns(nx,ny),  & 
 +
  Check_Flux(nx,ny),  &
DpU(nx,ny),  &
DpU(nx,ny),  &
DpV(nx,ny),  &
DpV(nx,ny),  &
-
 
+
      Ap(nx,ny,5),  &
-
      Ap(nx,ny,10),  &
+
      As(nx,ny),  &
      As(nx,ny),  &
      An(nx,ny),  &
      An(nx,ny),  &
      Aw(nx,ny),  &
      Aw(nx,ny),  &
      Ae(nx,ny),  &
      Ae(nx,ny),  &
-
      Sp(nx,ny,10)
+
      Sp(nx,ny,5)
-
 
+
DOUBLE PRECISION  Istoch_nar_abs,Istoch_nar_whole
-
 
+
integer N_centr,N_golbal_iter
-
   
+
  real max_V,min_V,max_U
!-----------------------------------------------
!-----------------------------------------------
-
 
-
 
Common /var/  U,V,F, &
Common /var/  U,V,F, &
-
Xc,Yc,X,Y,Gam,Ro
+
Xc,Yc,X,Y,Gam,Ro,&
-
 
+
N_centr,N_golbal_iter, &
 +
            Istoch_nar_abs,Istoch_nar_whole, &
 +
max_V,min_V,max_U
Common /var_Geom/  X_xi,    &
Common /var_Geom/  X_xi,    &
  Y_xi,    &
  Y_xi,    &
  X_et,    &
  X_et,    &
  Y_et,    &
  Y_et,    &
-
 
+
          Del_X_xi,    &
-
              Del_X_xi,    &
+
        Del_Y_xi,    &
        Del_Y_xi,    &
-
 
      Del_X_et,    &
      Del_X_et,    &
      Del_Y_et,    &
      Del_Y_et,    &
-
 
 
  Dx_c,    &
  Dx_c,    &
  Dy_c  
  Dy_c  
-
 
+
Common /koeff/ Con_e,  &            
-
Common /koeff/ Con_e,  &
+
  Con_w,  &             
-
      Con_n,  &  
+
  Con_n,  &  
-
   
+
  Con_s,
 +
  Con_we,  &             
 +
  Con_ns,  & 
      DPx_c,  &
      DPx_c,  &
      DPy_c,  &
      DPy_c,  &
-
 
+
  Check_Flux,  &
-
  CheckFlux,  &
+
-
 
+
DpU,  &
DpU,  &
DpV,  &
DpV,  &
-
 
      Ap,  &
      Ap,  &
      As,  &
      As,  &
Line 96: Line 87:
      Ae,  &
      Ae,  &
      Sp
      Sp
-
 
-
 
Common /geomt/ NXmax,NYmax,NXmaxC,NYmaxC   
Common /geomt/ NXmax,NYmax,NXmaxC,NYmaxC   
</pre>
</pre>

Latest revision as of 14:55, 19 May 2016


!Sample program for solving Lid-driven cavity flow test using SIMPLE-algorithm
! include modul
!Copyright (C) 2010  Michail Kiričkov
!Copyright (C) 2016  Michail Kiričkov, Kaunas University for Technology
!
!This program is free software; you can redistribute it and/or
!modify it under the terms of the GNU General Public License
!as published by the Free Software Foundation; either version 2
!of the License, or (at your option) any later version.

!This program is distributed in the hope that it will be useful,
!but WITHOUT ANY WARRANTY; without even the implied warranty of
!MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
!GNU General Public License for more details.

!You should have received a copy of the GNU General Public License
!along with this program; if not, write to the Free Software
!Foundation, Inc., 51 Franklin Street, Fifth Floor, Boston, MA  02110-1301, USA.

!**********************************************************************
parameter nx=300, ny=300
 DOUBLE PRECISION  U(nx,ny),V(nx,ny),F(nx,ny,10), &
			Xc(nx,ny),Yc(nx,ny),X(nx,ny),Y(nx,ny),Gam(nx,ny),Ro(nx,ny)
 DOUBLE PRECISION  X_xi(nx,ny),    &
				  Y_xi(nx,ny),    &
				  X_et(nx,ny),    &
				  Y_et(nx,ny),	  &
              Del_X_xi(nx,ny),    &
			  Del_Y_xi(nx,ny),    &
			  Del_X_et(nx,ny),    &
			  Del_Y_et(nx,ny),    &
				  Dx_c(nx,ny),    &
				  Dy_c(nx,ny) 
 DOUBLE PRECISION  DPx_c(nx,ny),  &
	           DPy_c(nx,ny),  &
            Con_e(nx,ny),  &              
		   Con_w(nx,ny),  &              
		   Con_n(nx,ny),  &   		 
		   Con_s(nx,ny),  &   		 
		   Con_we(nx,ny),  &              
		   Con_ns(nx,ny),  &   		 
		   Check_Flux(nx,ny),  &
				 DpU(nx,ny),   &
				 DpV(nx,ny),   &
			      Ap(nx,ny,5),   &
			      As(nx,ny),   &
			      An(nx,ny),   &
			      Aw(nx,ny),   &
			      Ae(nx,ny),   &
			      Sp(nx,ny,5)
DOUBLE PRECISION  Istoch_nar_abs,Istoch_nar_whole 
 integer N_centr,N_golbal_iter
 real max_V,min_V,max_U
!-----------------------------------------------
Common /var/  U,V,F, &
			Xc,Yc,X,Y,Gam,Ro,&
			N_centr,N_golbal_iter, &
            Istoch_nar_abs,Istoch_nar_whole, &
			max_V,min_V,max_U
Common /var_Geom/  X_xi,    &
		   Y_xi,    &
		   X_et,    &
		   Y_et,    &
          Del_X_xi,    &
 	      Del_Y_xi,    &
	      Del_X_et,    &
	      Del_Y_et,    &
		  Dx_c,    &
		  Dy_c 
Common /koeff/ Con_e,  &              
		   Con_w,  &              
		   Con_n,  &   		 
		   Con_s,  &   		 
		   Con_we,  &              
		   Con_ns,  &   		 
	       DPx_c,  &
	       DPy_c,  &
		   Check_Flux,  &
				 DpU,   &
				 DpV,   &
			      Ap,   &
			      As,   &
			      An,   &
			      Aw,   &
			      Ae,   &
			      Sp
Common /geomt/ NXmax,NYmax,NXmaxC,NYmaxC  

My wiki