Ignore:
Timestamp:
05/18/20 21:07:49 (4 years ago)
Author:
dubos
Message:

devel : towards conformity to F2008 standard

Location:
codes/icosagcm/devel/src/dynamics
Files:
7 edited

Legend:

Unmodified
Added
Removed
  • codes/icosagcm/devel/src/dynamics/compute_caldyn.f90

    r938 r1027  
    1111    SUBROUTINE comp_pvort_only(u,rhodz,qu,qv, hv) 
    1212      IMPORT 
    13       REAL(rstd),INTENT(IN)  :: u(iim_jjm_i, llm_) 
    14       REAL(rstd),INTENT(INOUT) :: rhodz(iim_jjm_i, llm_) 
    15       REAL(rstd),INTENT(OUT) :: qu(iim_jjm_u, llm_) 
    16       REAL(rstd),INTENT(OUT) :: qv(iim_jjm_v, llm_) 
    17       REAL(rstd),INTENT(OUT) :: hv(iim_jjm_v, llm_) 
     13      REAL(rstd), INTENT(IN)    :: u(:,:) 
     14      REAL(rstd), INTENT(INOUT) :: rhodz(:,:) 
     15      REAL(rstd), INTENT(OUT)   :: qu(:,:) 
     16      REAL(rstd), INTENT(OUT)   :: qv(:,:) 
     17      REAL(rstd), INTENT(OUT)   :: hv(:,:) 
    1818    END SUBROUTINE comp_pvort_only 
    1919 
    2020    SUBROUTINE comp_theta(mass_col,theta_rhodz, rhodz,theta) 
    2121      IMPORT 
    22       REAL(rstd),INTENT(IN)    :: mass_col(iim_jjm_i) 
    23       REAL(rstd),INTENT(IN)    :: theta_rhodz(iim_jjm_i, llm_, nqdyn_) 
    24       REAL(rstd),INTENT(INOUT) :: rhodz(iim_jjm_i, llm_) 
    25       REAL(rstd),INTENT(OUT)   :: theta(iim_jjm_i, llm_, nqdyn_) 
     22      REAL(rstd), INTENT(IN)    :: mass_col(:) 
     23      REAL(rstd), INTENT(IN)    :: theta_rhodz(:,:,:) 
     24      REAL(rstd), INTENT(INOUT) :: rhodz(:,:) 
     25      REAL(rstd), INTENT(OUT)   :: theta(:,:,:) 
    2626    END SUBROUTINE comp_theta 
    2727 
    2828    SUBROUTINE comp_geopot(rhodz,theta, ps,pk,geopot)  
    2929      IMPORT 
    30       REAL(rstd),INTENT(IN)    :: rhodz(iim_jjm_i, llm_)         ! rho*dz = mass per unit surface in each full model level 
    31       REAL(rstd),INTENT(IN)    :: theta(iim_jjm_i, llm_, nqdyn_) ! active scalars : theta/entropy, moisture, ... 
    32       REAL(rstd),INTENT(INOUT) :: ps(iim_jjm_i)                  ! surface pressure 
    33       REAL(rstd),INTENT(OUT)   :: pk(iim_jjm_i, llm_)            ! Exner function (compressible) /Lagrange multiplier (Boussinesq) 
    34       REAL(rstd),INTENT(INOUT) :: geopot(iim_jjm_i, llm1)        ! geopotential 
     30      REAL(rstd), INTENT(IN)    :: rhodz(:,:)    ! rho*dz = mass per unit surface in each full model level 
     31      REAL(rstd), INTENT(IN)    :: theta(:,:,:) ! active scalars : theta/entropy, moisture, ... 
     32      REAL(rstd), INTENT(INOUT) :: ps(:)         ! surface pressure 
     33      REAL(rstd), INTENT(OUT)   :: pk(:,:)       ! Exner function (compressible) /Lagrange multiplier (Boussinesq) 
     34      REAL(rstd), INTENT(INOUT) :: geopot(:,:)   ! geopotential 
    3535    END SUBROUTINE comp_geopot 
    3636 
    3737    SUBROUTINE comp_caldyn_fast(tau,theta,geopot, pk,berni,du,u) 
    3838      IMPORT 
    39       REAL(rstd),INTENT(IN)    :: tau                ! "solve" u-tau*du/dt = rhs 
    40       REAL(rstd),INTENT(IN)    :: theta(iim_jjm_i, llm_, nqdyn_) 
    41       REAL(rstd),INTENT(IN)    :: geopot(iim_jjm_i, llm1) 
    42       REAL(rstd),INTENT(INOUT) :: pk(iim_jjm_i, llm_) 
    43       REAL(rstd),INTENT(INOUT) :: berni(iim_jjm_i, llm_)  ! partial Bernoulli function 
    44       REAL(rstd),INTENT(INOUT) :: du(iim_jjm_u, llm_) 
    45       REAL(rstd),INTENT(INOUT) :: u(iim_jjm_u, llm_)   ! INOUT if tau>0 
     39      REAL(rstd), INTENT(IN)    :: tau           ! "solve" u-tau*du/dt = rhs 
     40      REAL(rstd), INTENT(IN)    :: theta(:,:,:) 
     41      REAL(rstd), INTENT(IN)    :: geopot(:,:) 
     42      REAL(rstd), INTENT(INOUT) :: pk(:,:) 
     43      REAL(rstd), INTENT(INOUT) :: berni(:,:)    ! partial Bernoulli function 
     44      REAL(rstd), INTENT(INOUT) :: du(:,:) 
     45      REAL(rstd), INTENT(INOUT) :: u(:,:)        ! INOUT if tau>0 
    4646    END SUBROUTINE comp_caldyn_fast 
    4747 
    4848    SUBROUTINE comp_caldyn_slow_hydro(zero, u,rhodz,hv,Kv, berni, hflux,du) 
    4949      IMPORT 
    50       LOGICAL, INTENT(IN) :: zero 
    51       REAL(rstd),INTENT(IN)  :: u(iim_jjm_u, llm_)    ! prognostic "velocity" 
    52       REAL(rstd),INTENT(IN)  :: rhodz(iim_jjm_i, llm_) 
    53       REAL(rstd),INTENT(IN)  :: hv(iim_jjm_v, llm_)   ! height/mass averaged to vertices 
    54       REAL(rstd),INTENT(IN)  :: Kv(iim_jjm_v, llm_)   ! kinetic energy at vertices 
    55       REAL(rstd), INTENT(OUT) :: berni(iim_jjm_i, llm_)  ! Bernoulli function 
    56       REAL(rstd),INTENT(OUT) :: hflux(iim_jjm_u, llm_) ! hflux in kg/s  
    57       REAL(rstd),INTENT(INOUT) :: du(iim_jjm_u, llm_) 
     50      LOGICAL,    INTENT(IN)    :: zero 
     51      REAL(rstd), INTENT(IN)    :: u(:,:)      ! prognostic "velocity" 
     52      REAL(rstd), INTENT(IN)    :: rhodz(:,:) 
     53      REAL(rstd), INTENT(IN)    :: hv(:,:)     ! height/mass averaged to vertices 
     54      REAL(rstd), INTENT(IN)    :: Kv(:,:)     ! kinetic energy at vertices 
     55      REAL(rstd), INTENT(OUT)   :: berni(:,:)  ! Bernoulli function 
     56      REAL(rstd), INTENT(OUT)   :: hflux(:,:) ! hflux in kg/s  
     57      REAL(rstd), INTENT(INOUT) :: du(:,:) 
    5858    END SUBROUTINE comp_caldyn_slow_hydro 
    5959     
    6060    SUBROUTINE comp_caldyn_coriolis(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
    6161      IMPORT 
    62       REAL(rstd),INTENT(IN)    :: hflux(iim_jjm_u, llm_)  ! hflux in kg/s 
    63       REAL(rstd),INTENT(IN)    :: theta(iim_jjm_i, llm_, nqdyn_) ! active scalars 
    64       REAL(rstd),INTENT(IN)    :: qu(iim_jjm_u, llm_) 
    65       REAL(rstd), INTENT(OUT)  :: Ftheta(iim_jjm_u, llm_)  ! potential temperature flux 
    66       REAL(rstd),INTENT(OUT)   :: convm(iim_jjm_i, llm_)  ! mass flux convergence 
    67       REAL(rstd),INTENT(OUT)   :: dtheta_rhodz(iim_jjm_i, llm_, nqdyn_) 
    68       REAL(rstd),INTENT(INOUT) :: du(iim_jjm_u, llm_) 
     62      REAL(rstd), INTENT(IN)    :: hflux(:,:)   ! hflux in kg/s 
     63      REAL(rstd), INTENT(IN)    :: theta(:,:,:) ! active scalars 
     64      REAL(rstd), INTENT(IN)    :: qu(:,:) 
     65      REAL(rstd), INTENT(OUT)   :: Ftheta(:,:)  ! potential temperature flux 
     66      REAL(rstd), INTENT(OUT)   :: convm(:,:)   ! mass flux convergence 
     67      REAL(rstd), INTENT(OUT)   :: dtheta_rhodz(:,:,:) 
     68      REAL(rstd), INTENT(INOUT) :: du(:,:) 
    6969    END SUBROUTINE comp_caldyn_coriolis 
    7070 
  • codes/icosagcm/devel/src/dynamics/compute_caldyn_Coriolis.F90

    r940 r1027  
    7474#endif END_DYSL 
    7575 
    76   SUBROUTINE compute_caldyn_coriolis_unst(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
     76!-------------- Wrappers for F2008 conformity ----------------- 
     77 
     78    SUBROUTINE compute_caldyn_coriolis_unst(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
     79      REAL(rstd), INTENT(IN)    :: hflux(:,:), theta(:,:,:), qu(:,:) 
     80      REAL(rstd), INTENT(OUT)   :: Ftheta(:,:), convm(:,:), dtheta_rhodz(:,:,:) 
     81      REAL(rstd), INTENT(INOUT) :: du(:,:) 
     82      CALL compute_caldyn_coriolis_unst_(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
     83    END SUBROUTINE compute_caldyn_coriolis_unst 
     84 
     85    SUBROUTINE compute_caldyn_coriolis_hex(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
     86      REAL(rstd), INTENT(IN)    :: hflux(:,:), theta(:,:,:), qu(:,:) 
     87      REAL(rstd), INTENT(OUT)   :: Ftheta(:,:), convm(:,:), dtheta_rhodz(:,:,:) 
     88      REAL(rstd), INTENT(INOUT) :: du(:,:) 
     89      CALL compute_caldyn_coriolis_hex_(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
     90    END SUBROUTINE compute_caldyn_coriolis_hex 
     91 
     92!-------------------------------------------------------------- 
     93 
     94  SUBROUTINE compute_caldyn_coriolis_unst_(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
    7795    USE ISO_C_BINDING, only : C_DOUBLE, C_FLOAT 
    7896    USE data_unstructured_mod, ONLY : enter_trace, exit_trace, & 
     
    89107#include "../kernels_unst/coriolis.k90" 
    90108    STOP_TRACE 
    91   END SUBROUTINE compute_caldyn_coriolis_unst 
    92  
    93   SUBROUTINE compute_caldyn_Coriolis_hex(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
     109  END SUBROUTINE compute_caldyn_coriolis_unst_ 
     110 
     111  SUBROUTINE compute_caldyn_Coriolis_hex_(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
    94112    USE icosa 
    95113    REAL(rstd),INTENT(IN)    :: hflux(3*iim*jjm,llm)  ! hflux in kg/s 
     
    107125 
    108126    CALL trace_end("compute_caldyn_Coriolis") 
    109   END SUBROUTINE compute_caldyn_Coriolis_hex 
     127  END SUBROUTINE compute_caldyn_Coriolis_hex_ 
    110128 
    111129  SUBROUTINE compute_caldyn_Coriolis_manual(hflux,theta,qu, Ftheta, convm,dtheta_rhodz,du) 
  • codes/icosagcm/devel/src/dynamics/compute_caldyn_fast.F90

    r939 r1027  
    6868#endif END_DYSL 
    6969 
     70!-------------- Wrappers for F2008 conformity ----------------- 
     71 
     72  SUBROUTINE compute_caldyn_fast_hex(tau,theta,geopot, pk,berni,du,u) 
     73    REAL(rstd),INTENT(IN)    :: tau, theta(:,:,:), geopot(:,:) 
     74    REAL(rstd),INTENT(INOUT) :: pk(:,:), berni(:,:), du(:,:), u(:,:) 
     75    CALL compute_caldyn_fast_hex_(tau,theta,geopot, pk,berni,du,u) 
     76  END SUBROUTINE compute_caldyn_fast_hex 
     77 
    7078  SUBROUTINE compute_caldyn_fast_unst(tau,theta,geopot, pk,berni,du,u) 
     79    REAL(rstd),INTENT(IN)    :: tau, theta(:,:,:), geopot(:,:) 
     80    REAL(rstd),INTENT(INOUT) :: pk(:,:), berni(:,:), du(:,:), u(:,:) 
     81    CALL compute_caldyn_fast_unst_(tau,theta,geopot, pk,berni,du,u) 
     82  END SUBROUTINE compute_caldyn_fast_unst 
     83 
     84!-------------------------------------------------------------- 
     85 
     86  SUBROUTINE compute_caldyn_fast_unst_(tau,theta,geopot, pk,berni,du,u) 
    7187    USE ISO_C_BINDING, only : C_DOUBLE, C_FLOAT 
    7288    USE data_unstructured_mod, ONLY : enter_trace, exit_trace, & 
     
    84100#include "../kernels_unst/caldyn_fast.k90" 
    85101    STOP_TRACE 
    86   END SUBROUTINE compute_caldyn_fast_unst 
    87  
    88   SUBROUTINE compute_caldyn_fast_hex(tau,theta,geopot, pk,berni,du,u) 
     102  END SUBROUTINE compute_caldyn_fast_unst_ 
     103 
     104  SUBROUTINE compute_caldyn_fast_hex_(tau,theta,geopot, pk,berni,du,u) 
    89105    USE icosa 
    90106    REAL(rstd),INTENT(IN)    :: tau                ! "solve" u-tau*du/dt = rhs 
     
    104120    CALL trace_end("compute_caldyn_fast") 
    105121     
    106   END SUBROUTINE compute_caldyn_fast_hex 
     122  END SUBROUTINE compute_caldyn_fast_hex_ 
    107123 
    108124  SUBROUTINE compute_caldyn_fast_manual(tau,theta,geopot, pk,berni,du,u) 
  • codes/icosagcm/devel/src/dynamics/compute_caldyn_slow_hydro.F90

    r939 r1027  
    5353#endif END_DYSL 
    5454 
     55!-------------- Wrappers for F2008 conformity ----------------- 
     56 
     57  SUBROUTINE compute_caldyn_slow_hydro_hex(zero, u,rhodz,hv,Kv, berni, hflux,du) 
     58    LOGICAL, INTENT(IN)      :: zero 
     59    REAL(rstd),INTENT(IN)    :: u(:,:), rhodz(:,:), hv(:,:), Kv(:,:) 
     60    REAL(rstd), INTENT(OUT)  :: berni(:,:), hflux(:,:) 
     61    REAL(rstd),INTENT(INOUT) :: du(:,:) 
     62    CALL compute_caldyn_slow_hydro_hex_(zero, u,rhodz,hv,Kv, berni, hflux,du) 
     63  END SUBROUTINE compute_caldyn_slow_hydro_hex 
     64 
    5565  SUBROUTINE compute_caldyn_slow_hydro_unst(zero, u,rhodz,hv,Kv, berni, hflux,du) 
     66    LOGICAL, INTENT(IN)      :: zero 
     67    REAL(rstd),INTENT(IN)    :: u(:,:), rhodz(:,:), hv(:,:), Kv(:,:) 
     68    REAL(rstd), INTENT(OUT)  :: berni(:,:), hflux(:,:) 
     69    REAL(rstd),INTENT(INOUT) :: du(:,:) 
     70    CALL compute_caldyn_slow_hydro_unst_(zero, u,rhodz,hv,Kv, berni, hflux,du) 
     71  END SUBROUTINE compute_caldyn_slow_hydro_unst 
     72 
     73!-------------------------------------------------------------- 
     74 
     75  SUBROUTINE compute_caldyn_slow_hydro_unst_(zero, u,rhodz,hv,Kv, berni, hflux,du) 
    5676    USE ISO_C_BINDING, only : C_DOUBLE, C_FLOAT 
    5777    USE data_unstructured_mod, ONLY : enter_trace, exit_trace, & 
     
    6686#include "../kernels_unst/caldyn_slow_hydro.k90" 
    6787    STOP_TRACE 
    68   END SUBROUTINE compute_caldyn_slow_hydro_unst 
    69  
    70   SUBROUTINE compute_caldyn_slow_hydro_hex(zero, u,rhodz,hv,Kv, berni, hflux,du) 
     88  END SUBROUTINE compute_caldyn_slow_hydro_unst_ 
     89 
     90  SUBROUTINE compute_caldyn_slow_hydro_hex_(zero, u,rhodz,hv,Kv, berni, hflux,du) 
    7191    USE icosa 
    7292    USE caldyn_vars_mod 
     
    89109    CALL trace_end("compute_caldyn_slow_hydro")     
    90110 
    91   END SUBROUTINE compute_caldyn_slow_hydro_hex 
     111  END SUBROUTINE compute_caldyn_slow_hydro_hex_ 
    92112 
    93113  SUBROUTINE compute_caldyn_slow_hydro_manual(zero, u,rhodz,hv,Kv, berni, hflux,du) 
  • codes/icosagcm/devel/src/dynamics/compute_geopot.F90

    r955 r1027  
    126126#endif END_DYSL 
    127127 
     128  !-------------- Wrappers for F2008 conformity ----------------- 
     129  !-------------------------------------------------------------- 
     130 
     131  SUBROUTINE compute_geopot_hex(rhodz,theta, ps,pk,geopot)  
     132    REAL(rstd),INTENT(IN)    :: rhodz(:,:), theta(:,:,:) ! active scalars : theta/entropy, moisture, ... 
     133    REAL(rstd),INTENT(INOUT) :: ps(:), geopot(:,:)       ! geopotential 
     134    REAL(rstd),INTENT(OUT)   :: pk(:,:)       ! Exner function (compressible) /Lagrange multiplier (Boussinesq) 
     135    CALL compute_geopot_hex_(rhodz,theta, ps,pk,geopot) 
     136  END SUBROUTINE compute_geopot_hex 
     137 
     138  SUBROUTINE compute_geopot_unst(rhodz,theta, ps,pk,geopot)  
     139    REAL(rstd),INTENT(IN)    :: rhodz(:,:), theta(:,:,:) ! active scalars : theta/entropy, moisture, ... 
     140    REAL(rstd),INTENT(INOUT) :: ps(:), geopot(:,:)       ! geopotential 
     141    REAL(rstd),INTENT(OUT)   :: pk(:,:)       ! Exner function (compressible) /Lagrange multiplier (Boussinesq) 
     142    CALL compute_geopot_unst_(rhodz,theta, ps,pk,geopot) 
     143  END SUBROUTINE compute_geopot_unst 
     144 
    128145  !**************************** Geopotential ***************************** 
    129146 
    130   SUBROUTINE compute_geopot_unst(rhodz,theta,ps,pk,geopot) 
     147  SUBROUTINE compute_geopot_unst_(rhodz,theta,ps,pk,geopot) 
    131148        USE ISO_C_BINDING, only : C_DOUBLE, C_FLOAT 
    132149    USE data_unstructured_mod, ONLY : enter_trace, exit_trace, & 
     
    142159#include "../kernels_unst/compute_geopot.k90" 
    143160    STOP_TRACE 
    144   END SUBROUTINE compute_geopot_unst 
     161  END SUBROUTINE compute_geopot_unst_ 
    145162   
    146   SUBROUTINE compute_geopot_hex(rhodz,theta, ps,pk,geopot)  
     163  SUBROUTINE compute_geopot_hex_(rhodz,theta, ps,pk,geopot)  
    147164    REAL(rstd),INTENT(IN)    :: rhodz(iim*jjm,llm) 
    148165    REAL(rstd),INTENT(IN)    :: theta(iim*jjm,llm,nqdyn) ! active scalars : theta/entropy, moisture, ... 
     
    162179 
    163180    CALL trace_end("compute_geopot") 
    164   END SUBROUTINE compute_geopot_hex 
     181  END SUBROUTINE compute_geopot_hex_ 
    165182 
    166183  SUBROUTINE compute_geopot_manual(rhodz,theta, ps,pk,geopot)  
  • codes/icosagcm/devel/src/dynamics/compute_pvort_only.F90

    r939 r1027  
    11MODULE compute_pvort_only_mod 
    22  USE grid_param 
     3  USE prec, ONLY : rstd 
    34  IMPLICIT NONE 
    45  PRIVATE 
     
    3637#endif END_DYSL 
    3738 
    38   SUBROUTINE compute_pvort_only_unst(u,rhodz,qu,qv, hv_) 
     39!-------------- Wrappers for F2008 conformity ----------------- 
     40 
     41  SUBROUTINE compute_pvort_only_unst(u,rhodz,qu,qv,hv_) 
     42    REAL(rstd),INTENT(IN)  :: u(:,:) 
     43    REAL(rstd),INTENT(INOUT) :: rhodz(:,:) 
     44    REAL(rstd),INTENT(OUT) :: qu(:,:), qv(:,:), hv_(:,:) 
     45    CALL compute_pvort_only_unst_(u,rhodz,qu,qv,hv_) 
     46  END SUBROUTINE compute_pvort_only_unst 
     47 
     48  SUBROUTINE compute_pvort_only_hex(u,rhodz,qu,qv,hv_) 
     49    REAL(rstd),INTENT(IN)  :: u(:,:) 
     50    REAL(rstd),INTENT(INOUT) :: rhodz(:,:) 
     51    REAL(rstd),INTENT(OUT) :: qu(:,:), qv(:,:), hv_(:,:) 
     52    CALL compute_pvort_only_hex_(u,rhodz,qu,qv,hv_) 
     53  END SUBROUTINE compute_pvort_only_hex 
     54 
     55!-------------------------------------------------------------- 
     56 
     57  SUBROUTINE compute_pvort_only_unst_(u,rhodz,qu,qv, hv_) 
    3958    USE ISO_C_BINDING, only : C_DOUBLE, C_FLOAT 
    4059    USE geometry, ONLY : Riv2, Av, fv 
     
    5170#include "../kernels_unst/pvort_only.k90" 
    5271    STOP_TRACE 
    53   END SUBROUTINE compute_pvort_only_unst 
     72  END SUBROUTINE compute_pvort_only_unst_ 
    5473 
    55   SUBROUTINE compute_pvort_only_hex(u,rhodz,qu,qv,hv_) 
     74  SUBROUTINE compute_pvort_only_hex_(u,rhodz,qu,qv,hv_) 
    5675    USE icosa 
    5776    USE trace, ONLY : trace_start, trace_end 
     
    108127    CALL trace_end("compute_pvort_only") 
    109128 
    110   END SUBROUTINE compute_pvort_only_hex 
     129  END SUBROUTINE compute_pvort_only_hex_ 
    111130 
    112131END MODULE compute_pvort_only_mod 
  • codes/icosagcm/devel/src/dynamics/compute_theta.F90

    r939 r1027  
    11MODULE compute_theta_mod 
     2  USE prec, ONLY : rstd 
    23  USE grid_param 
    34  USE disvert_mod, ONLY : mass_dak, mass_dbk, caldyn_eta, eta_mass, ptop 
     
    7172#endif END_DYSL 
    7273 
    73   SUBROUTINE compute_theta_unst(mass_col,theta_rhodz, rhodz,theta) 
     74!-------------- Wrappers for F2008 conformity ----------------- 
     75 
     76  SUBROUTINE compute_theta_unst(ps,theta_rhodz, rhodz,theta) 
     77    REAL(rstd),INTENT(IN)    :: ps(:), theta_rhodz(:,:,:) 
     78    REAL(rstd),INTENT(INOUT) :: rhodz(:,:) 
     79    REAL(rstd),INTENT(OUT)   :: theta(:,:,:) 
     80    CALL compute_theta_unst_(ps,theta_rhodz, rhodz,theta) 
     81  END SUBROUTINE compute_theta_unst 
     82 
     83  SUBROUTINE compute_theta_hex(ps,theta_rhodz, rhodz,theta) 
     84    REAL(rstd),INTENT(IN)    :: ps(:), theta_rhodz(:,:,:) 
     85    REAL(rstd),INTENT(INOUT) :: rhodz(:,:) 
     86    REAL(rstd),INTENT(OUT)   :: theta(:,:,:) 
     87    CALL compute_theta_hex_(ps,theta_rhodz, rhodz,theta) 
     88  END SUBROUTINE compute_theta_hex 
     89 
     90!-------------------------------------------------------------- 
     91 
     92  SUBROUTINE compute_theta_unst_(mass_col,theta_rhodz, rhodz,theta) 
    7493    USE ISO_C_BINDING, only : C_DOUBLE, C_FLOAT 
    7594    USE data_unstructured_mod, ONLY : enter_trace, exit_trace, id_theta 
     
    86105#undef MASS_DBK 
    87106    STOP_TRACE 
    88   END SUBROUTINE compute_theta_unst 
     107  END SUBROUTINE compute_theta_unst_ 
    89108 
    90   SUBROUTINE compute_theta_hex(mass_col,theta_rhodz, rhodz,theta) 
     109  SUBROUTINE compute_theta_hex_(mass_col,theta_rhodz, rhodz,theta) 
    91110    USE icosa 
    92111    USE trace, ONLY : trace_start, trace_end 
     
    105124#undef MASS_DBK 
    106125    CALL trace_end("compute_theta") 
    107   END SUBROUTINE compute_theta_hex 
     126  END SUBROUTINE compute_theta_hex_ 
    108127   
    109128  SUBROUTINE compute_theta_manual(ps,theta_rhodz, rhodz,theta) 
Note: See TracChangeset for help on using the changeset viewer.