Skip to content

Commit 75d81db

Browse files
author
José Gómez-Dans
committed
Changes to prosail state, adding a soil brightness term, as well as selecting a leaf angle distribution type
1 parent 3e192d7 commit 75d81db

File tree

2 files changed

+12
-10
lines changed

2 files changed

+12
-10
lines changed

README.rst

+1-1
Original file line numberDiff line numberDiff line change
@@ -116,4 +116,4 @@ A simple example of using bindings would be
116116

117117
This results in a simulation of surface reflectance (from 400 to 2500 nm) as a function of LAI and under the other parameters' prescribed values. This yields the following
118118

119-
.. image:: http://i.imgur.com/2Hh0z.png
119+
.. image:: http://i.imgur.com/2Hh0z.png

prosail/run_prosail.f90

+11-9
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,6 @@
11

22
SUBROUTINE run_prosail ( N, Cab, Car, Cbrown, Cw, Cm, lai, LIDFa, LIDFb, &
3-
psoil, hspot, tts, tto, psi, retval )
3+
rsoil, psoil, hspot, tts, tto, psi, TypeLidf, retval )
44

55
USE MOD_ANGLE ! defines pi & rad conversion
66
USE MOD_staticvar ! static variables kept in memory for optimization
@@ -14,7 +14,7 @@ SUBROUTINE run_prosail ( N, Cab, Car, Cbrown, Cw, Cm, lai, LIDFa, LIDFb, &
1414
REAL*8, dimension(nw), intent(out) :: retval
1515
REAL*8, intent(in) :: N,Cab,Car,Cbrown,Cw,Cm
1616
! CANOPY
17-
REAL*8, intent(in) :: lai,LIDFa,LIDFb,psoil
17+
REAL*8, intent(in) :: lai,LIDFa,LIDFb,psoil,rsoil
1818
REAL*8, intent(in) :: hspot
1919
REAL*8, intent(in) :: tts,tto,psi
2020

@@ -40,7 +40,7 @@ SUBROUTINE run_prosail ( N, Cab, Car, Cbrown, Cw, Cm, lai, LIDFa, LIDFb, &
4040
ALLOCATE (resh(nw),resv(nw))
4141
ALLOCATE (rsoil_old(nw))
4242

43-
TypeLidf=1
43+
!TypeLidf=1
4444
! if 2-parameters LIDF: TypeLidf=1
4545
!!!IF (TypeLidf.EQ.1) THEN
4646
! LIDFa LIDF parameter a, which controls the average leaf slope
@@ -81,7 +81,8 @@ SUBROUTINE run_prosail ( N, Cab, Car, Cbrown, Cw, Cm, lai, LIDFa, LIDFb, &
8181
! rsoil2 = wet soil
8282
ALLOCATE (rsoil0(nw))
8383
!psoil = 1. ! soil factor (psoil=0: wet soil / psoil=1: dry soil)
84-
rsoil0=psoil*Rsoil1+(1-psoil)*Rsoil2
84+
! rsoil : soil brightness term
85+
rsoil0=rsoil*(psoil*Rsoil1+(1-psoil)*Rsoil2)
8586

8687
!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
8788
!! 4SAIL canopy structure parm !!
@@ -106,16 +107,17 @@ SUBROUTINE run_prosail ( N, Cab, Car, Cbrown, Cw, Cm, lai, LIDFa, LIDFb, &
106107
! Francois et al. (2002) Conversion of 400–1100 nm vegetation albedo
107108
! measurements into total shortwave broadband albedo using a canopy
108109
! radiative transfer model, Agronomie
109-
skyl = 0.847- 1.61*sin((90-tts)*rd)+ 1.04*sin((90-tts)*rd)*sin((90-tts)*rd) ! % diffuse radiation
110+
!skyl = 0.847- 1.61*sin((90-tts)*rd)+ 1.04*sin((90-tts)*rd)*sin((90-tts)*rd) ! % diffuse radiation
110111
! Es = direct
111112
! Ed = diffuse
112113
! PAR direct
113-
PARdiro = (1-skyl)*Es
114+
!PARdiro = (1-skyl)*Es
114115
! PAR diffus
115-
PARdifo = (skyl)*Ed
116+
!PARdifo = (skyl)*Ed
116117
! resv : directional reflectance
117118

118-
retval = (rdot*PARdifo+rsot*PARdiro)/(PARdiro+PARdifo)
119+
!retval = (rdot*PARdifo+rsot*PARdiro)/(PARdiro+PARdifo)
120+
retval = rsot
119121
deallocate ( lrt )
120122
deallocate ( rho )
121123
deallocate ( tau )
@@ -132,4 +134,4 @@ SUBROUTINE run_prosail ( N, Cab, Car, Cbrown, Cw, Cm, lai, LIDFa, LIDFb, &
132134
deALLOCATE (rsoil0)
133135
!WRITE( *,'(i4,f10.6)') (lambda(ii),run_prosail(ii), ii=1,nw)
134136
END subroutine run_prosail
135-
137+

0 commit comments

Comments
 (0)