Ignore:
Timestamp:
06/13/19 16:45:41 (5 years ago)
Author:
adurocher
Message:

trunk : Fixed GCC warnings

Fixed iso c bindings
fixed warnings with -Wall -Wno-aliasing -Wno-unused -Wno-unused-dummy-argument -Wno-maybe-uninitialized -Wno-tabs warnings
Removed all unused variables (-Wunused-variable)
vector%dot_product is now dot_product_3d to avoid compilation warning "dot_product shadows intrinsic" with GCC

File:
1 edited

Legend:

Unmodified
Added
Removed
  • codes/icosagcm/trunk/src/sphere/metric.f90

    r711 r899  
    117117    REAL(rstd) :: rot=0. 
    118118    INTEGER :: nf,i,j 
    119     REAL(rstd),DIMENSION(3) :: p1,p2,p3 
     119    REAL(rstd),DIMENSION(3) :: p1 
    120120    REAL(rstd) :: d1,d2,d3 
    121121   
     
    180180    REAL(rstd) :: rot=0. 
    181181    INTEGER :: nf,i,j 
    182     REAL(rstd),DIMENSION(3) :: p1,p2,p3 
    183     REAL(rstd) :: d1,d2,d3 
    184182   
    185183   len_edge=acos(cos(Pi/5)*cos(2*Pi/5)/(sin(Pi/5)*sin(2*Pi/5))) 
     
    467465    INTEGER :: ind,ind2 
    468466    INTEGER :: nf,nf2,nfm1,nfp1 
    469     INTEGER :: i,j,k 
    470     INTEGER :: delta 
     467    INTEGER :: i,j 
    471468     
    472469    ind=0 
     
    836833  SUBROUTINE set_cell_vertex 
    837834  IMPLICIT NONE 
    838     INTEGER :: i,j,k,k2 
     835    INTEGER :: k,k2 
    839836    INTEGER :: ind,ind1,ind2 
    840837    INTEGER :: ng1,ng2 
Note: See TracChangeset for help on using the changeset viewer.