Ignore:
Timestamp:
07/06/14 09:10:13 (10 years ago)
Author:
dubos
Message:

First draft of generic dynamics-physics interface - works with DCMIP5.1

File:
1 edited

Legend:

Unmodified
Added
Removed
  • codes/icosagcm/trunk/src/wind.f90

    r186 r196  
    185185  END SUBROUTINE compute_wind_from_lonlat_compound 
    186186  
     187  SUBROUTINE compute_wind_centered_from_lonlat_compound(ulon, ulat, u) 
     188  USE icosa   
     189     
     190  IMPLICIT NONE 
     191  REAL(rstd) :: u(iim*jjm,3,llm) 
     192  REAL(rstd) :: ulon(iim*jjm,llm) 
     193  REAL(rstd) :: ulat(iim*jjm,llm) 
     194 
     195  INTEGER :: i,j,ij,l      
     196  DO l=1,llm 
     197      DO j=jj_begin-1,jj_end+1 
     198        DO i=ii_begin-1,ii_end+1 
     199          ij=(j-1)*iim+i 
     200          u(ij,:,l)=ulon(ij,l)*elon_i(ij,:)+ ulat(ij,l)*elat_i(ij,:) 
     201        ENDDO 
     202      ENDDO 
     203    ENDDO 
     204  
     205  END SUBROUTINE compute_wind_centered_from_lonlat_compound 
     206  
    187207  SUBROUTINE compute_wind2D_from_lonlat_compound(ulon, ulat, u) 
    188208  USE icosa   
Note: See TracChangeset for help on using the changeset viewer.