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/initial/etat0.f90

    r581 r899  
    6666 
    6767  SUBROUTINE etat0(f_ps,f_mass,f_phis,f_theta_rhodz,f_u, f_geopot,f_w, f_q) 
    68     USE mpipara, ONLY : is_mpi_root 
    6968    USE disvert_mod 
    7069    ! Generic interface 
     
    9695     
    9796    REAL(rstd),POINTER :: ps(:), mass(:,:) 
    98     LOGICAL :: autoinit_mass, autoinit_geopot, collocated 
    99     INTEGER :: ind,i,j,ij,l 
     97    LOGICAL :: autoinit_mass, collocated 
     98    INTEGER :: ind 
    10099 
    101100    ! most etat0 routines set ps and not mass 
     
    248247 
    249248    REAL(rstd) :: p(iim*jjm,llm+1) 
    250     REAL(rstd) :: cppd,Rd, mass, p_ij, q_ij,r_ij, chi,nu, entropy, theta 
     249    REAL(rstd) :: cppd,Rd, mass, p_ij, chi,nu, entropy, theta 
    251250    INTEGER :: i,j,ij,l 
    252251 
     
    323322    REAL(rstd) :: q_e(3*iim*jjm,llm,nqtot) 
    324323 
    325     INTEGER :: l,i,j,ij 
     324    INTEGER :: l,ij 
    326325    REAL :: p_ik, v_ik, mass_ik 
    327326    LOGICAL :: autoinit_mass, autoinit_NH 
Note: See TracChangeset for help on using the changeset viewer.