Ignore:
Timestamp:
10/16/17 13:07:30 (7 years ago)
Author:
dubos
Message:

devel : reconstruct fluxes at cell centers

File:
1 edited

Legend:

Unmodified
Added
Removed
  • codes/icosagcm/devel/src/diagnostics/diagflux.f90

    r583 r585  
    3737    END DO 
    3838  END SUBROUTINE zero_qfluxt 
     39 
     40  SUBROUTINE flux_centered_lonlat(f_flux, f_flux_lon, f_flux_lat) 
     41    TYPE(t_field),POINTER :: f_flux(:), f_flux_lon(:), f_flux_lat(:) 
     42    REAL(rstd), POINTER :: flux(:,:,:), flux_lon(:,:,:), flux_lat(:,:,:) 
     43    INTEGER :: ind, itrac 
     44    DO ind=1,ndomain 
     45       IF (.NOT. assigned_domain(ind)) CYCLE 
     46       CALL swap_dimensions(ind) 
     47       CALL swap_geometry(ind) 
     48       flux=f_flux(ind) 
     49       DO itrac=1,nqtot 
     50          CALL compute_flux_centered_lonlat(flux(:,:,itrac), flux_lon(:,:,itrac), flux_lat(:,:,itrac)) 
     51       END DO 
     52    END DO 
     53  END SUBROUTINE flux_centered_lonlat 
    3954   
     55  SUBROUTINE compute_flux_centered_lonlat(flux, flux_lon, flux_lat) 
     56    REAL(rstd), INTENT(IN) :: flux(3*iim*jjm,llm) 
     57    REAL(rstd), INTENT(OUT) :: flux_lon(iim*jjm,llm), flux_lat(iim*jjm,llm) 
     58    REAL(rstd) :: flux_3d(iim*jjm,llm,3) 
     59    CALL compute_flux_centered(flux, flux_3d) 
     60    CALL compute_wind_centered_lonlat_compound(flux_3d, flux_lon, flux_lat) 
     61  END SUBROUTINE compute_flux_centered_lonlat 
     62 
    4063END MODULE diagflux_mod 
Note: See TracChangeset for help on using the changeset viewer.