/[MITgcm]/MITgcm/pkg/aim_v23/phy_suflux_post.F
ViewVC logotype

Annotation of /MITgcm/pkg/aim_v23/phy_suflux_post.F

Parent Directory Parent Directory | Revision Log Revision Log | View Revision Graph Revision Graph


Revision 1.1 - (hide annotations) (download)
Thu Mar 11 14:33:19 2004 UTC (20 years, 3 months ago) by jmc
Branch: MAIN
CVS Tags: checkpoint52l_post
a) Treat separately land / ocean / sea-ice surface fluxes
   to allow implicit computation of land & sea-ice surface temp.
b) add snow precipitation
c) other (little) modifications for new land formulation.

1 jmc 1.1 C $Header: $
2     C $Name: $
3    
4     #include "AIM_OPTIONS.h"
5    
6     CBOP
7     C !ROUTINE: SUFLUX_POST
8     C !INTERFACE:
9     SUBROUTINE SUFLUX_POST(
10     I FMASK, EMISloc,
11     I TLAND, TSEA, TSICE, dTskin, SLRD,
12     I T0, Q0, CDENVV,
13     U DRAG, SHF, EVAP, SLRup,
14     O SLRU, TSFC, TSKIN,
15     I bi,bj,myThid)
16    
17     C !DESCRIPTION: \bv
18     C *==========================================================*
19     C | S/R SUFLUX_POST
20     C | o finish surface flux calculation
21     C *==========================================================*
22     C | o contain 2nd part of original S/R SUFLUX (Speedy code)
23     C *==========================================================*
24     C--
25     C-- SUBROUTINE SUFLUX (PSA,UA,VA,TA,QA,RH,PHI,
26     C-- & PHI0,FMASK,TLAND,TSEA,SWAV,SSR,SLRD,
27     C-- & USTR,VSTR,SHF,EVAP,SLRU,
28     C-- & TSFC,TSKIN,U0,V0,T0,Q0)
29     C--
30     C-- Purpose: Compute surface fluxes of momentum, energy and moisture,
31     C-- and define surface skin temperature from energy balance
32     C *==========================================================*
33     C \ev
34    
35     C !USES:
36     IMPLICIT NONE
37    
38     C Resolution parameters
39    
40     C-- size for MITgcm & Physics package :
41     #include "AIM_SIZE.h"
42    
43     #include "EEPARAMS.h"
44    
45     C Physical constants + functions of sigma and latitude
46     #include "com_physcon.h"
47    
48     C Surface flux constants
49     #include "com_sflcon.h"
50    
51     C !INPUT/OUTPUT PARAMETERS:
52     C == Routine Arguments ==
53     C-- Input:
54     C FMASK :: fraction land - sea - sea-ice (2.5-dim)
55     C EMISloc:: longwave surface emissivity
56     C TLAND :: land-surface temperature (2-dim)
57     C TSEA :: sea-surface temperature (2-dim)
58     C TSICE :: sea-ice surface temperature (2-dim)
59     C dTskin :: temp. correction for daily-cycle heating [K]
60     C SLRD :: sfc lw radiation (downward flux)(2-dim)
61     C SSR :: sfc sw radiation (net flux) (2-dim)
62     C T0 :: near-surface air temperature (2-dim)
63     C Q0 :: near-surface sp. humidity [g/kg](2-dim)
64     C CDENVV :: sensible heat flux coefficient (1:land, 2:sea, 3:sea-ice)
65     C-- Output:
66     C DRAG :: surface Drag term (= Cd*Rho*|V|)(2-dim)
67     C SHF :: sensible heat flux (2-dim)
68     C EVAP :: evaporation [g/(m^2 s)] (2-dim)
69     C SLRU :: sfc lw radiation (upward flux) (2-dim)
70     C SLRup :: same, for each surface type (2-dim)
71     C TSFC :: surface temperature (clim.) (2-dim)
72     C TSKIN :: skin surface temperature (2-dim)
73     C-- Input:
74     C bi,bj :: tile index
75     C myThid :: Thread number for this instance of the routine
76     C--
77     _RL FMASK(NGP,3), EMISloc
78     _RL TLAND(NGP), TSEA(NGP), TSICE(NGP), dTskin(NGP), SLRD(NGP)
79     _RL T0(NGP), Q0(NGP), CDENVV(NGP,3)
80    
81     _RL DRAG(NGP,0:3), SHF(NGP,0:3), EVAP(NGP,0:3), SLRup(NGP,3)
82     _RL SLRU(NGP), TSFC(NGP), TSKIN(NGP)
83    
84     INTEGER bi,bj,myThid
85     CEOP
86    
87     #ifdef ALLOW_AIM
88    
89     C-- Local variables:
90     INTEGER J
91    
92     C---+----1----+----2----+----3----+----4----+----5----+----6----+----7-|--+----|
93    
94     C-- 1. Extrapolation of wind, temp, hum. and density to the surface
95    
96     C-- 2. Computation of fluxes over land and sea
97    
98     C-- 3. Adjustment of skin temperature and fluxes over land
99     C-- based on energy balance (to be implemented)
100    
101     C 3.2 Sensible heat flux (from clim. TS over land)
102     C Note: needs to update SHF if land or sea-ice surf temp are computed
103     C implicitly ; recomputes SHF is consistent since SHF linear in TS
104    
105     DO J=1,NGP
106     SHF(J,1) = CDENVV(J,1)*CP*(TLAND(J)+dTskin(J)-T0(J))
107     c SHF(J,2) = CDENVV(J,2)*CP*(TSEA(J) -T0(J))
108     SHF(J,3) = CDENVV(J,3)*CP*(TSICE(J)-T0(J))
109     ENDDO
110    
111    
112     C-- 4. Weighted average of surface fluxes and temperatures
113     C-- according to land-sea mask
114    
115     DO J=1,NGP
116     c USTR(J,3) = USTR(J,2)+FMASK(J,1)*(USTR(J,1)-USTR(J,2))
117     c VSTR(J,3) = VSTR(J,2)+FMASK(J,1)*(VSTR(J,1)-VSTR(J,2))
118     c DRAG(J,0) = DRAG(J,2)+FMASK(J,1)*(DRAG(J,1)-DRAG(J,2))
119     c SHF(J,0) = SHF(J,2)+FMASK(J,1)*( SHF(J,1)- SHF(J,2))
120     c EVAP(J,0) = EVAP(J,2)+FMASK(J,1)*(EVAP(J,1)-EVAP(J,2))
121     c SLRU(J) = SLRup(J,2)+FMASK(J,1)*(SLRup(J,1)-SLRup(J,2))
122     DRAG(J,0) = (FMASK(J,1)*DRAG(J,1)+FMASK(J,2)*DRAG(J,2)
123     & +FMASK(J,3)*DRAG(J,3))
124     SHF (J,0) = (FMASK(J,1)*SHF(J,1) +FMASK(J,2)*SHF(J,2)
125     & +FMASK(J,3)*SHF(J,3) )
126     EVAP(J,0) = (FMASK(J,1)*EVAP(J,1)+FMASK(J,2)*EVAP(J,2)
127     & +FMASK(J,3)*EVAP(J,3))
128     SLRU(J) = (FMASK(J,1)*SLRup(J,1)+FMASK(J,2)*SLRup(J,2)
129     & +FMASK(J,3)*SLRup(J,3))
130     ENDDO
131    
132     DO J=1,NGP
133     c TSFC(J) = TSEA(J)+FMASK(J,1)*(TLAND(J)-TSEA(J))
134     TSFC(J) = (FMASK(J,1)*TLAND(J) + FMASK(J,2)*TSEA(J)
135     & + FMASK(J,3)*TSICE(J))
136     TSKIN(J) = TSFC(J)+FMASK(J,1)*dTskin(J)
137     ENDDO
138    
139     C- Compute Net LW surf flux (+=upward) for each surface type:
140     C (for diagnostic only)
141     DO J=1,NGP
142     SLRup(J,1)=EMISloc*SLRup(J,1)-SLRD(J)
143     SLRup(J,2)=EMISloc*SLRup(J,2)-SLRD(J)
144     SLRup(J,3)=EMISloc*SLRup(J,3)-SLRD(J)
145     ENDDO
146    
147     C---+----1----+----2----+----3----+----4----+----5----+----6----+----7-|--+----|
148     #endif /* ALLOW_AIM */
149    
150     RETURN
151     END

  ViewVC Help
Powered by ViewVC 1.1.22