!WRF:DRIVER_LAYER:MAIN ! !<DESCRIPTION> ! ESMF-specific modules for building WRF as an ESMF component. ! ! This source file is only built when ESMF coupling is used. ! !</DESCRIPTION> MODULE module_metadatautils 5 !<DESCRIPTION> ! This module defines component-independent "model metadata" utilities ! used for ESMF coupling. !</DESCRIPTION> !TODO: Upgrade this later to support multiple coupling intervals via Alarms !TODO: associated with top-level clock. Do this by adding TimesAttachedToState() !TODO: inquiry function that will test an ESMF_State to see if the times are !TODO: present via names defined in this module. Then call it for every !TODO: component and resolve conflicts (somehow) for cases where two components !TODO: define conflicting clocks. Of course, a component is allowed to not attach !TODO: times to a state at all, if it can handle any time step. ! !TODO: Replace meta-data names with "model metadata" conventions such as CF !TODO: (once they exist) ! !TODO: Refactor to remove duplication of hard-coded names. ! USE ESMF IMPLICIT NONE ! everything is private by default PRIVATE ! Public interfaces PUBLIC AttachTimesToState PUBLIC GetTimesFromStates PUBLIC AttachDecompToState PUBLIC GetDecompFromState ! private stuff CHARACTER (ESMF_MAXSTR) :: str CONTAINS ! Attach time information to state as meta-data. ! Update later to use some form of meta-data standards/conventions for ! model "time" meta-data. SUBROUTINE AttachTimesToState( state, startTime, stopTime, couplingInterval ) 2,6 TYPE(ESMF_State), INTENT(INOUT) :: state TYPE(ESMF_Time), INTENT(INOUT) :: startTime TYPE(ESMF_Time), INTENT(INOUT) :: stopTime TYPE(ESMF_TimeInterval), INTENT(INOUT) :: couplingInterval ! locals INTEGER :: rc INTEGER :: year, month, day, hour, minute, second INTEGER(ESMF_KIND_I4) :: timevals(6) ! big enough to hold the vars listed above ! start time CALL ESMF_TimeGet(startTime, yy=year, mm=month, dd=day, & h=hour, m=minute, s=second, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_TimeGet(startTime) failed' ) ENDIF timevals(1) = year timevals(2) = month timevals(3) = day timevals(4) = hour timevals(5) = minute timevals(6) = second CALL ESMF_AttributeSet(state, 'ComponentStartTime', timevals, itemCount=SIZE(timevals), rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_AttributeSet(ComponentStartTime) failed' ) ENDIF ! stop time CALL ESMF_TimeGet(stopTime, yy=year, mm=month, dd=day, & h=hour, m=minute, s=second, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_TimeGet(stopTime) failed' ) ENDIF timevals(1) = year timevals(2) = month timevals(3) = day timevals(4) = hour timevals(5) = minute timevals(6) = second CALL ESMF_AttributeSet(state, 'ComponentStopTime', timevals, itemCount=SIZE(timevals), rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_AttributeSet(ComponentStopTime) failed' ) ENDIF ! coupling time step CALL ESMF_TimeIntervalGet(couplingInterval, yy=year, mm=month, d=day, & h=hour, m=minute, s=second, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_TimeIntervalGet(couplingInterval) failed' ) ENDIF timevals(1) = year timevals(2) = month timevals(3) = day timevals(4) = hour timevals(5) = minute timevals(6) = second CALL ESMF_AttributeSet(state, 'ComponentCouplingInterval', timevals, itemCount=SIZE(timevals), rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_AttributeSet(ComponentCouplingInterval) failed' ) ENDIF END SUBROUTINE AttachTimesToState ! Extract time information attached as meta-data from a single ! ESMF_State. ! Update later to use some form of meta-data standards/conventions for ! model "time" meta-data. SUBROUTINE GetTimesFromState( state, startTime, stopTime, couplingInterval, rc ) 3,3 TYPE(ESMF_State), INTENT(INOUT) :: state TYPE(ESMF_Time), INTENT(INOUT) :: startTime TYPE(ESMF_Time), INTENT(INOUT) :: stopTime TYPE(ESMF_TimeInterval), INTENT(INOUT) :: couplingInterval INTEGER, INTENT(INOUT) :: rc ! locals INTEGER :: year, month, day, hour, minute, second INTEGER(ESMF_KIND_I4) :: timevals(6) ! big enough to hold the vars listed above INTEGER :: thecount ! 'one attribute ... ah ah ah. TWO attributes! ah ah ah!! CHARACTER*256 mess ! start time thecount = SIZE(timevals) CALL ESMF_AttributeGet(state, 'ComponentStartTime', timevals, itemCount=thecount, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN !JM return but don't fail; let the caller figure out what to do RETURN ENDIF year = timevals(1) month = timevals(2) day = timevals(3) hour = timevals(4) minute = timevals(5) second = timevals(6) CALL ESMF_TimeSet(startTime, yy=year, mm=month, dd=day, & h=hour, m=minute, s=second, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_TimeSet(startTime) failed' ) ENDIF ! stop time thecount = SIZE(timevals) CALL ESMF_AttributeGet(state, 'ComponentStopTime', timevals, itemCount=thecount, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN !JM return but don't fail; let the caller figure out what to do !CALL wrf_error_fatal ( 'ESMF_AttributeGet(ComponentStopTime) failed' ) RETURN ENDIF year = timevals(1) month = timevals(2) day = timevals(3) hour = timevals(4) minute = timevals(5) second = timevals(6) CALL ESMF_TimeSet(stopTime, yy=year, mm=month, dd=day, & h=hour, m=minute, s=second, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_TimeSet(stopTime) failed' ) ENDIF ! coupling time step thecount = SIZE(timevals) CALL ESMF_AttributeGet(state, 'ComponentCouplingInterval', timevals, itemCount=thecount, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN !JM return but don't fail; let the caller figure out what to do !CALL wrf_error_fatal ( 'ESMF_AttributeGet(ComponentCouplingInterval) failed' ) RETURN ENDIF year = timevals(1) month = timevals(2) day = timevals(3) hour = timevals(4) minute = timevals(5) second = timevals(6) CALL ESMF_TimeIntervalSet(couplingInterval, yy=year, mm=month, d=day, & h=hour, m=minute, s=second, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'ESMF_TimeIntervalSet(couplingInterval) failed' ) ENDIF END SUBROUTINE GetTimesFromState ! Extract time information attached as meta-data from one or more ! ESMF_States. To use this with more than one ESMF_State, put the ! ESMF_States into a single ESMF_State. If times differ, an attempt ! is made to reconcile them. SUBROUTINE GetTimesFromStates( state, startTime, stopTime, couplingInterval ) 1,9 USE ESMF TYPE(ESMF_State), INTENT(INOUT) :: state TYPE(ESMF_Time), INTENT(INOUT) :: startTime TYPE(ESMF_Time), INTENT(INOUT) :: stopTime TYPE(ESMF_TimeInterval), INTENT(INOUT) :: couplingInterval ! locals INTEGER :: rc INTEGER :: numItems, numStates, i, istate TYPE(ESMF_StateItem_Flag), ALLOCATABLE :: itemTypes(:) TYPE(ESMF_State) :: tmpState CHARACTER (len=ESMF_MAXSTR), ALLOCATABLE :: itemNames(:) TYPE(ESMF_Time), ALLOCATABLE :: startTimes(:) TYPE(ESMF_Time), ALLOCATABLE :: stopTimes(:) TYPE(ESMF_TimeInterval), ALLOCATABLE :: couplingIntervals(:) CHARACTER (len=132) :: mess ! Unfortunately, implementing this is unnecessarily difficult due ! to lack of Iterators for ESMF_State. ! Since there are no convenient iterators for ESMF_State, ! write a lot of code... ! Figure out how many items are in the ESMF_State CALL ESMF_StateGet(state, itemCount=numItems, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'ESMF_StateGet(numItems) failed' ) ENDIF ! allocate an array to hold the types of all items ALLOCATE( itemTypes(numItems) ) ! allocate an array to hold the names of all items ALLOCATE( itemNames(numItems) ) ! get the item types and names CALL ESMF_StateGet(state, itemtypeList=itemTypes, & itemNameList=itemNames, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN WRITE(str,*) 'ESMF_StateGet itemTypes failed with rc = ', rc CALL wrf_error_fatal ( str ) ENDIF ! count how many items are ESMF_States numStates = 0 DO i=1,numItems IF ( itemTypes(i) == ESMF_STATEITEM_STATE ) THEN numStates = numStates + 1 ENDIF ENDDO ALLOCATE( startTimes(numStates), stopTimes(numStates), & couplingIntervals(numStates) ) IF ( numStates > 0) THEN ! finally, extract nested ESMF_States by name, if there are any ! (should be able to do this by index at least!) istate = 0 DO i=1,numItems IF ( itemTypes(i) == ESMF_STATEITEM_STATE ) THEN CALL ESMF_StateGet( state, itemName=TRIM(itemNames(i)), & nestedState=tmpState, rc=rc ) IF ( rc /= ESMF_SUCCESS) THEN WRITE(str,*) 'ESMF_StateGet(',TRIM(itemNames(i)),') failed' CALL wrf_error_fatal ( str ) ENDIF istate = istate + 1 CALL GetTimesFromState( tmpState, startTimes(istate), & stopTimes(istate), & couplingIntervals(istate), rc ) IF ( rc /= ESMF_SUCCESS ) THEN istate = istate - 1 ENDIF ENDIF ENDDO IF ( istate .EQ. 1 ) THEN ! this presupposes that 1 of the child states exist and has ! valid times in it. Use that one. WRITE(mess,*)'WARNING: Only ',TRIM(itemNames(1)),& ' is valid and has time info in it. Using that.' CALL wrf_message(mess) CALL ESMF_StateGet( state, itemName=TRIM(itemNames(1)), & nestedState=tmpState, rc=rc ) CALL GetTimesFromState( tmpState, startTime, stopTime, & couplingInterval , rc ) ELSE IF ( istate .GT. 1 ) THEN CALL ReconcileTimes( startTimes, stopTimes, couplingIntervals, & startTime, stopTime, couplingInterval ) ELSE CALL wrf_error_fatal('no valid states with times found. giving up.') ENDIF ELSE ! there are no nested ESMF_States so use parent state only CALL GetTimesFromState( state, startTime, stopTime, & couplingInterval , rc ) ENDIF ! deallocate locals DEALLOCATE( itemTypes ) DEALLOCATE( itemNames ) DEALLOCATE( startTimes, stopTimes, couplingIntervals ) END SUBROUTINE GetTimesFromStates ! Reconcile all times and intervals in startTimes, stopTimes, and ! couplingIntervals and return the results in startTime, stopTime, and ! couplingInterval. Abort if reconciliation is not possible. SUBROUTINE ReconcileTimes( startTimes, stopTimes, couplingIntervals, & 1,6 startTime, stopTime, couplingInterval ) TYPE(ESMF_Time), INTENT(INOUT) :: startTimes(:) TYPE(ESMF_Time), INTENT(INOUT) :: stopTimes(:) TYPE(ESMF_TimeInterval), INTENT(INOUT) :: couplingIntervals(:) TYPE(ESMF_Time), INTENT(INOUT) :: startTime TYPE(ESMF_Time), INTENT(INOUT) :: stopTime TYPE(ESMF_TimeInterval), INTENT(INOUT) :: couplingInterval ! locals INTEGER :: numTimes, numTimesTmp, i ! how many sets of time info? numTimes = SIZE(startTimes) IF ( numTimes < 2 ) THEN CALL wrf_error_fatal ( 'SIZE(startTimes) too small' ) ENDIF numTimesTmp = SIZE(stopTimes) IF ( numTimes /= numTimesTmp ) THEN CALL wrf_error_fatal ( 'incorrect SIZE(stopTimes)' ) ENDIF numTimesTmp = SIZE(couplingIntervals) IF ( numTimes /= numTimesTmp ) THEN CALL wrf_error_fatal ( 'incorrect SIZE(couplingIntervals)' ) ENDIF ! reconcile !TODO: For now this is very simple. Fancy it up later. DO i = 1, numTimes IF ( i == 1 ) THEN startTime = startTimes(i) stopTime = stopTimes(i) couplingInterval = couplingIntervals(i) ELSE !jm IF ( startTimes(i) /= startTime ) THEN !jm CALL wrf_message ( 'ReconcileTimes: inconsistent startTimes. Using first.' ) !jm startTimes(i) = startTime !jm ENDIF !jm IF ( stopTimes(i) /= stopTime ) THEN !jm CALL wrf_message ( 'ReconcileTimes: inconsistent stopTimes. Using first.' ) !jm stopTimes(i) = stopTime !jm ENDIF IF ( startTimes(i) > startTime ) THEN CALL wrf_message ( 'ReconcileTimes: inconsistent startTimes. Using later.' ) startTime = startTimes(i) ENDIF IF ( stopTimes(i) < stopTime ) THEN CALL wrf_message ( 'ReconcileTimes: inconsistent stopTimes. Using earlier.' ) stopTime = stopTimes(i) ENDIF IF ( couplingIntervals(i) /= couplingInterval ) THEN CALL wrf_message ( 'ReconcileTimes: inconsistent couplingIntervals. Using first.' ) couplingIntervals(i) = couplingInterval ENDIF ENDIF ENDDO stopTimes = stopTime startTimes = startTime END SUBROUTINE ReconcileTimes !TODO: Eliminate this once this information can be derived via other !TODO: means. SUBROUTINE AttachDecompToState( state, & 3,2 ids, ide, jds, jde, kds, kde, & ims, ime, jms, jme, kms, kme, & ips, ipe, jps, jpe, kps, kpe, & domdesc, bdy_mask ) TYPE(ESMF_State), INTENT(INOUT) :: state INTEGER, INTENT(IN ) :: ids, ide, jds, jde, kds, kde INTEGER, INTENT(IN ) :: ims, ime, jms, jme, kms, kme INTEGER, INTENT(IN ) :: ips, ipe, jps, jpe, kps, kpe INTEGER, INTENT(IN ) :: domdesc LOGICAL, INTENT(IN ) :: bdy_mask(4) ! locals INTEGER :: i, rc ! big enough to hold the integer values listed above INTEGER(ESMF_KIND_I4) :: intvals(19) ! big enough to hold the logical values listed above ! TYPE(ESMF_Logical) :: logvals(4) logical :: logvals(4) ! first the logicals ! Usually, when writing an API for a target language, it is considered ! good practice to use native types of the target language in the ! interfaces. logvals = .FALSE. DO i = 1, SIZE(bdy_mask) IF (bdy_mask(i)) THEN logvals(i) = .TRUE. ENDIF ENDDO CALL ESMF_AttributeSet(state, 'DecompositionLogicals', logvals, itemCount=SIZE(logvals), rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'ESMF_AttributeSet(DecompositionLogicals) failed' ) ENDIF ! now the integers intvals(1) = ids intvals(2) = ide intvals(3) = jds intvals(4) = jde intvals(5) = kds intvals(6) = kde intvals(7) = ims intvals(8) = ime intvals(9) = jms intvals(10) = jme intvals(11) = kms intvals(12) = kme intvals(13) = ips intvals(14) = ipe intvals(15) = jps intvals(16) = jpe intvals(17) = kps intvals(18) = kpe intvals(19) = domdesc CALL ESMF_AttributeSet(state, 'DecompositionIntegers', intvals, itemCount=SIZE(intvals), rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'ESMF_AttributeSet(DecompositionIntegers) failed' ) ENDIF END SUBROUTINE AttachDecompToState !TODO: Eliminate this once this information can be derived via other !TODO: means. SUBROUTINE GetDecompFromState( state, & 2,6 ids, ide, jds, jde, kds, kde, & ims, ime, jms, jme, kms, kme, & ips, ipe, jps, jpe, kps, kpe, & domdesc, bdy_mask ) TYPE(ESMF_State), INTENT(INOUT) :: state INTEGER, INTENT( OUT) :: ids, ide, jds, jde, kds, kde INTEGER, INTENT( OUT) :: ims, ime, jms, jme, kms, kme INTEGER, INTENT( OUT) :: ips, ipe, jps, jpe, kps, kpe INTEGER, INTENT( OUT) :: domdesc LOGICAL, INTENT( OUT) :: bdy_mask(4) ! locals INTEGER :: i, rc ! big enough to hold the integer values listed above INTEGER(ESMF_KIND_I4) :: intvals(19) ! big enough to hold the logical values listed above logical :: logvals(4) integer :: thecount ! ah ah ah ! first the logicals thecount = SIZE(logvals) CALL ESMF_AttributeGet(state, 'DecompositionLogicals', logvals, itemCount=thecount, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'ESMF_AttributeGet(DecompositionLogicals) failed' ) ENDIF ! Usually, when writing an API for a target language, it is considered ! good practice to use native types of the target language in the ! interfaces. bdy_mask = .FALSE. DO i = 1, SIZE(logvals) IF (logvals(i) ) THEN bdy_mask(i) = .TRUE. ENDIF ENDDO ! now the integers thecount = SIZE(intvals) CALL ESMF_AttributeGet(state, 'DecompositionIntegers', intvals, itemCount=thecount, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'ESMF_AttributeGet(DecompositionIntegers) failed' ) ENDIF ids = intvals(1) ide = intvals(2) jds = intvals(3) jde = intvals(4) kds = intvals(5) kde = intvals(6) ims = intvals(7) ime = intvals(8) jms = intvals(9) jme = intvals(10) kms = intvals(11) kme = intvals(12) ips = intvals(13) ipe = intvals(14) jps = intvals(15) jpe = intvals(16) kps = intvals(17) kpe = intvals(18) domdesc = intvals(19) END SUBROUTINE GetDecompFromState END MODULE module_metadatautils MODULE module_wrf_component_top 1 !<DESCRIPTION> ! This module defines wrf_component_init1(), wrf_component_init2(), ! wrf_component_run(), and wrf_component_finalize() routines that are called ! when WRF is run as an ESMF component. !</DESCRIPTION> USE ESMF USE module_wrf_top, ONLY : wrf_init, wrf_run, wrf_finalize USE module_domain, ONLY : head_grid, get_ijk_from_grid USE module_state_description USE module_streams USE module_esmf_extensions USE module_metadatautils, ONLY: AttachTimesToState, AttachDecompToState IMPLICIT NONE ! everything is private by default PRIVATE ! Public entry points PUBLIC wrf_component_init1 PUBLIC wrf_component_init2 PUBLIC wrf_component_run PUBLIC wrf_component_finalize ! private stuff CHARACTER (ESMF_MAXSTR) :: str CONTAINS SUBROUTINE wrf_component_init1( gcomp, importState, exportState, clock, rc ),14 TYPE(ESMF_GridComp), TARGET, INTENT(INOUT) :: gcomp TYPE(ESMF_State), TARGET, INTENT(INOUT) :: importState TYPE(ESMF_State), TARGET, INTENT(INOUT) :: exportState TYPE(ESMF_Clock), TARGET, INTENT(INOUT) :: clock #ifdef DM_PARALLEL TYPE(ESMF_VM) :: vm INTEGER :: mpicomtmp #endif INTEGER, INTENT( OUT) :: rc !<DESCRIPTION> ! WRF component init routine, phase 1. Passes relevant coupling ! information back as metadata on exportState. ! ! The arguments are: ! gcomp Component ! importState Importstate ! exportState Exportstate ! clock External clock ! rc Return code; equals ESMF_SUCCESS if there are no errors, ! otherwise ESMF_FAILURE. !</DESCRIPTION> !TODO: Note that much of the decomposition-related meta-data attached to the !TODO: exportState are WRF-specific and are only useful if other components !TODO: want to re-use the WRF IOAPI with the same decomposition as the WRF !TODO: model. This is true for the simple WRF+CPL+SST test case, but will !TODO: not be in general. Of course other components are free to ignore this !TODO: information. ! Local variables TYPE(ESMF_GridComp), POINTER :: p_gcomp TYPE(ESMF_State), POINTER :: p_importState TYPE(ESMF_State), POINTER :: p_exportState TYPE(ESMF_Clock), POINTER :: p_clock ! Time hackery TYPE(ESMF_Time) :: startTime TYPE(ESMF_Time) :: stopTime TYPE(ESMF_TimeInterval) :: couplingInterval ! decomposition hackery INTEGER :: ids, ide, jds, jde, kds, kde INTEGER :: ims, ime, jms, jme, kms, kme INTEGER :: ips, ipe, jps, jpe, kps, kpe INTEGER :: domdesc LOGICAL :: bdy_mask(4) CHARACTER(LEN=256) :: couplingIntervalString rc = ESMF_SUCCESS p_gcomp => gcomp p_importState => importState p_exportState => exportState p_clock => clock ! NOTE: It will be possible to remove this call once ESMF supports ! interfaces ESMF_ClockGetCurrent(), ESMF_ImportStateGetCurrent(), ! ESMF_ExportStateGetCurrent(), and ESMF_GridCompGetCurrent(). CALL ESMF_SetCurrent( gcomp=p_gcomp, importState=p_importState, & exportState=p_exportState, clock=p_clock ) #ifdef DM_PARALLEL CALL ESMF_VMGetCurrent(vm, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'wrf_component_init1: ESMF_VMGetCurrent failed' ) ENDIF CALL ESMF_VMGet(vm, mpiCommunicator=mpicomtmp, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'wrf_component_init1: ESMF_VMGet failed' ) ENDIF CALL wrf_set_dm_communicator( mpicomtmp ) #endif ! Call WRF "init" routine, which, for a DM_PARALLEL run, will recognize ! that ESMF has already called MPI_INIT and respond appropriately. CALL wrf_init( no_init1=.TRUE. ) ! For now, use settings from WRF component intialization to set up ! top-level clock. Per suggestion from ESMF Core team, these are passed ! back as attributes on exportState. CALL wrf_clockprint( 100, head_grid%domain_clock, & 'DEBUG wrf_component_init1(): head_grid%domain_clock,' ) CALL ESMF_ClockGet(head_grid%domain_clock, startTime=startTime, & stopTime=stopTime, rc=rc) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'wrf_component_init1: ESMF_ClockGet failed' ) ENDIF CALL wrf_debug( 500, 'DEBUG wrf_component_init1(): before wrf_findCouplingInterval' ) CALL wrf_findCouplingInterval( startTime, stopTime, couplingInterval ) CALL wrf_debug( 500, 'DEBUG wrf_component_init1(): after wrf_findCouplingInterval' ) CALL ESMF_TimeIntervalGet( couplingInterval, TimeString=couplingIntervalString, & rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'wrf_component_init1: ESMF_TimeIntervalGet failed' ) ENDIF CALL wrf_debug( 100, 'DEBUG wrf_component_init1(): couplingInterval = '//TRIM(couplingIntervalString) ) CALL AttachTimesToState( exportState, startTime, stopTime, couplingInterval ) CALL wrf_getDecompInfo( ids, ide, jds, jde, kds, kde, & ims, ime, jms, jme, kms, kme, & ips, ipe, jps, jpe, kps, kpe, & domdesc, bdy_mask ) CALL AttachDecompToState( exportState, & ids, ide, jds, jde, kds, kde, & ims, ime, jms, jme, kms, kme, & ips, ipe, jps, jpe, kps, kpe, & domdesc, bdy_mask ) CALL AttachDecompToState( importState, & ids, ide, jds, jde, kds, kde, & ims, ime, jms, jme, kms, kme, & ips, ipe, jps, jpe, kps, kpe, & domdesc, bdy_mask ) END SUBROUTINE wrf_component_init1 SUBROUTINE wrf_component_init2( gcomp, importState, exportState, clock, rc ),24 TYPE(ESMF_GridComp), TARGET, INTENT(INOUT) :: gcomp TYPE(ESMF_State), TARGET, INTENT(INOUT) :: importState TYPE(ESMF_State), TARGET, INTENT(INOUT) :: exportState TYPE(ESMF_Clock), TARGET, INTENT(INOUT) :: clock INTEGER, INTENT( OUT) :: rc !<DESCRIPTION> ! WRF component init routine, phase 2. Initializes importState and ! exportState. ! ! The arguments are: ! gcomp Component ! importState Importstate ! exportState Exportstate ! clock External clock ! rc Return code; equals ESMF_SUCCESS if there are no errors, ! otherwise ESMF_FAILURE. !</DESCRIPTION> ! Local variables TYPE(ESMF_GridComp), POINTER :: p_gcomp TYPE(ESMF_State), POINTER :: p_importState TYPE(ESMF_State), POINTER :: p_exportState TYPE(ESMF_Clock), POINTER :: p_clock ! Time hackery TYPE(ESMF_Time) :: startTime TYPE(ESMF_Time) :: stopTime TYPE(ESMF_TimeInterval) :: couplingInterval ! decomposition hackery INTEGER :: ids, ide, jds, jde, kds, kde INTEGER :: ims, ime, jms, jme, kms, kme INTEGER :: ips, ipe, jps, jpe, kps, kpe INTEGER :: domdesc LOGICAL :: bdy_mask(4) INTEGER :: itemCount, i TYPE(ESMF_StateIntent_Flag) :: stateintent CHARACTER (ESMF_MAXSTR) :: statename CHARACTER (ESMF_MAXSTR), ALLOCATABLE :: itemNames(:) TYPE(ESMF_StateItem_Flag), ALLOCATABLE :: itemTypes(:) CALL wrf_debug ( 100, 'wrf_component_init2(): begin' ) ! check exportState CALL ESMF_StateGet( exportState, itemCount=itemCount, & stateintent=stateintent, rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal("wrf_component_init2: ESMF_StateGet(exportState) failed" ) ENDIF WRITE (str,*) 'wrf_component_init2: exportState itemCount = ', itemCount CALL wrf_debug ( 100 , TRIM(str) ) IF ( stateintent /= ESMF_STATEINTENT_EXPORT ) THEN CALL wrf_error_fatal("wrf_component_init2: exportState is not an export state" ) ENDIF ! check importState CALL ESMF_StateGet( importState, itemCount=itemCount, & stateintent=stateintent, rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal("wrf_component_init2: ESMF_StateGet(importState) failed" ) ENDIF WRITE (str,*) 'wrf_component_init2: importState itemCount = ', itemCount CALL wrf_debug ( 100 , TRIM(str) ) IF ( stateintent /= ESMF_STATEINTENT_IMPORT ) THEN CALL wrf_error_fatal("wrf_component_init2: importState is not an import state" ) ENDIF p_gcomp => gcomp p_importState => importState p_exportState => exportState p_clock => clock ! NOTE: It will be possible to remove this call once ESMF supports ! interfaces ESMF_ClockGetCurrent(), ESMF_ImportStateGetCurrent(), ! ESMF_ExportStateGetCurrent(), and ESMF_GridCompGetCurrent(). CALL ESMF_SetCurrent( gcomp=p_gcomp, importState=p_importState, & exportState=p_exportState, clock=p_clock ) ! populate ESMF import and export states CALL wrf_state_populate( rc ) IF ( rc /= 0 ) THEN CALL wrf_error_fatal ( 'wrf_component_init2: wrf_state_populate failed' ) ENDIF ! examine importState WRITE (str,*) 'wrf_component_init2: EXAMINING importState...' CALL wrf_debug ( 100 , TRIM(str) ) CALL ESMF_StateGet( importState, itemCount=itemCount, & stateintent=stateintent, name=statename, rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal("wrf_component_init2: ESMF_StateGet(importState) failed B" ) ENDIF IF ( stateintent /= ESMF_STATEINTENT_IMPORT ) THEN CALL wrf_error_fatal("wrf_component_init2: importState is not an import state" ) ENDIF WRITE (str,*) 'wrf_component_init2: importState <',TRIM(statename), & '> itemCount = ', itemCount CALL wrf_debug ( 100 , TRIM(str) ) ALLOCATE ( itemNames(itemCount), itemTypes(itemCount) ) CALL ESMF_StateGet( importState, itemNameList=itemNames, & itemtypeList=itemTypes, rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal("wrf_component_init2: ESMF_StateGet(importState) failed C" ) ENDIF DO i=1, itemCount IF ( itemTypes(i) == ESMF_STATEITEM_FIELD ) THEN WRITE(str,*) 'wrf_component_init2: importState contains field <',TRIM(itemNames(i)),'>' CALL wrf_debug ( 100 , TRIM(str) ) ENDIF ENDDO DEALLOCATE ( itemNames, itemTypes ) WRITE (str,*) 'wrf_component_init2: DONE EXAMINING importState...' CALL wrf_debug ( 100 , TRIM(str) ) ! examine exportState WRITE (str,*) 'wrf_component_init2: EXAMINING exportState...' CALL wrf_debug ( 100 , TRIM(str) ) CALL ESMF_StateGet( exportState, itemCount=itemCount, & stateintent=stateintent, name=statename, rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal("wrf_component_init2: ESMF_StateGet(exportState) failed B" ) ENDIF IF ( stateintent /= ESMF_STATEINTENT_EXPORT ) THEN CALL wrf_error_fatal("wrf_component_init2: exportState is not an export state" ) ENDIF WRITE (str,*) 'wrf_component_init2: exportState <',TRIM(statename), & '> itemCount = ', itemCount CALL wrf_debug ( 100 , TRIM(str) ) ALLOCATE ( itemNames(itemCount), itemTypes(itemCount) ) CALL ESMF_StateGet( exportState, itemNameList=itemNames, & itemtypeList=itemTypes, rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal("wrf_component_init2: ESMF_StateGet(exportState) failed C" ) ENDIF DO i=1, itemCount IF ( itemTypes(i) == ESMF_STATEITEM_FIELD ) THEN WRITE(str,*) 'wrf_component_init2: exportState contains field <',TRIM(itemNames(i)),'>' CALL wrf_debug ( 100 , TRIM(str) ) ENDIF ENDDO DEALLOCATE ( itemNames, itemTypes ) WRITE (str,*) 'wrf_component_init2: DONE EXAMINING exportState...' CALL wrf_debug ( 100 , TRIM(str) ) CALL wrf_debug ( 100, 'DEBUG wrf_component_init2(): end' ) END SUBROUTINE wrf_component_init2 SUBROUTINE wrf_component_run( gcomp, importState, exportState, clock, rc ),11 TYPE(ESMF_GridComp), TARGET, INTENT(INOUT) :: gcomp TYPE(ESMF_State), TARGET, INTENT(INOUT) :: importState, exportState TYPE(ESMF_Clock), TARGET, INTENT(INOUT) :: clock INTEGER, INTENT( OUT) :: rc !<DESCRIPTION> ! WRF component run routine. ! ! The arguments are: ! gcomp Component ! importState Importstate ! exportState Exportstate ! clock External clock ! rc Return code; equals ESMF_SUCCESS if there are no errors, ! otherwise ESMF_FAILURE. !</DESCRIPTION> ! Local variables TYPE(ESMF_GridComp), POINTER :: p_gcomp TYPE(ESMF_State), POINTER :: p_importState TYPE(ESMF_State), POINTER :: p_exportState TYPE(ESMF_Clock), POINTER :: p_clock ! timing TYPE(ESMF_Time) :: currentTime, nextTime TYPE(ESMF_TimeInterval) :: runLength ! how long to run in this call CHARACTER(LEN=256) :: timeStr CALL wrf_debug ( 100 , 'DEBUG wrf_component_run(): begin' ) p_gcomp => gcomp p_importState => importState p_exportState => exportState p_clock => clock ! NOTE: It will be possible to remove this call once ESMF supports ! interfaces ESMF_ClockGetCurrent(), ESMF_ImportStateGetCurrent(), ! ESMF_ExportStateGetCurrent(), and ESMF_GridCompGetCurrent(). CALL ESMF_SetCurrent( gcomp=p_gcomp, importState=p_importState, & exportState=p_exportState, clock=p_clock ) ! connect ESMF clock with WRF domain clock CALL ESMF_ClockGet( clock, currTime=currentTime, timeStep=runLength, rc=rc ) IF ( rc /= ESMF_SUCCESS ) THEN CALL wrf_error_fatal ( 'wrf_component_run: ESMF_ClockGet failed' ) ENDIF CALL wrf_clockprint(100, clock, & 'DEBUG wrf_component_run(): clock,') nextTime = currentTime + runLength head_grid%start_subtime = currentTime head_grid%stop_subtime = nextTime CALL wrf_timetoa ( head_grid%start_subtime, timeStr ) WRITE (str,*) 'wrf_component_run: head_grid%start_subtime ',TRIM(timeStr) CALL wrf_debug ( 100 , TRIM(str) ) CALL wrf_timetoa ( head_grid%stop_subtime, timeStr ) WRITE (str,*) 'wrf_component_run: head_grid%stop_subtime ',TRIM(timeStr) CALL wrf_debug ( 100 , TRIM(str) ) ! Call WRF "run" routine CALL wrf_debug ( 100 , 'DEBUG wrf_component_run(): calling wrf_run()' ) CALL wrf_run( ) CALL wrf_debug ( 100 , 'DEBUG wrf_component_run(): back from wrf_run()' ) CALL wrf_debug ( 100 , 'DEBUG wrf_component_run(): end' ) END SUBROUTINE wrf_component_run SUBROUTINE wrf_component_finalize( gcomp, importState, exportState, clock, rc ),1 TYPE(ESMF_GridComp), TARGET, INTENT(INOUT) :: gcomp TYPE(ESMF_State), TARGET, INTENT(INOUT) :: importState, exportState TYPE(ESMF_Clock), TARGET, INTENT(INOUT) :: clock INTEGER, INTENT( OUT) :: rc !<DESCRIPTION> ! WRF component finalize routine. ! ! The arguments are: ! gcomp Component ! importState Importstate ! exportState Exportstate ! clock External clock ! rc Return code; equals ESMF_SUCCESS if there are no errors, ! otherwise ESMF_FAILURE. !</DESCRIPTION> ! Local variables TYPE(ESMF_GridComp), POINTER :: p_gcomp TYPE(ESMF_State), POINTER :: p_importState TYPE(ESMF_State), POINTER :: p_exportState TYPE(ESMF_Clock), POINTER :: p_clock INTEGER :: rc p_gcomp => gcomp p_importState => importState p_exportState => exportState p_clock => clock ! NOTE: It will be possible to remove this call once ESMF supports ! interfaces ESMF_ClockGetCurrent(), ESMF_ImportStateGetCurrent(), ! ESMF_ExportStateGetCurrent(), and ESMF_GridCompGetCurrent(). CALL ESMF_SetCurrent( gcomp=p_gcomp, importState=p_importState, & exportState=p_exportState, clock=p_clock ) ! Call WRF "finalize" routine, suppressing call to MPI_FINALIZE so ! ESMF can do it (if needed) during ESMF_Finalize(). CALL wrf_finalize( no_shutdown=.TRUE. ) rc = ESMF_SUCCESS END SUBROUTINE wrf_component_finalize SUBROUTINE wrf_findCouplingInterval( startTime, stopTime, couplingInterval ) 1,5 TYPE(ESMF_Time), INTENT(IN ) :: startTime TYPE(ESMF_Time), INTENT(IN ) :: stopTime TYPE(ESMF_TimeInterval), INTENT( OUT) :: couplingInterval !<DESCRIPTION> ! WRF convenience routine for deducing coupling interval. The startTime ! and stopTime arguments are only used for determining a default value ! when coupling is not actually being done. ! ! The arguments are: ! startTime start time ! stopTime stop time ! couplingInterval coupling interval !</DESCRIPTION> ! locals LOGICAL :: foundcoupling INTEGER :: rc INTEGER :: io_form ! external function prototype INTEGER, EXTERNAL :: use_package ! deduce coupling time-step foundcoupling = .FALSE. !TODO: This bit just finds the FIRST case and extracts coupling interval... !TODO: Add error-checking for over-specification. !TODO: Add support for multiple coupling intervals later... !TODO: Add support for coupling that does not begin immediately later... !TODO: Get rid of duplication once I/O refactoring is finished (and !TODO: auxio streams can be addressed via index). #include "med_find_esmf_coupling.inc" ! look for erroneous use of io_form... CALL nl_get_io_form_restart( 1, io_form ) IF ( use_package( io_form ) == IO_ESMF ) THEN CALL wrf_error_fatal ( 'wrf_findCouplingInterval: ERROR: ESMF cannot be used for WRF restart I/O' ) ENDIF CALL nl_get_io_form_input( 1, io_form ) IF ( use_package( io_form ) == IO_ESMF ) THEN CALL wrf_error_fatal ( 'wrf_findCouplingInterval: ERROR: ESMF cannot be used for WRF input' ) ENDIF CALL nl_get_io_form_history( 1, io_form ) IF ( use_package( io_form ) == IO_ESMF ) THEN CALL wrf_error_fatal ( 'wrf_findCouplingInterval: ERROR: ESMF cannot be used for WRF history output' ) ENDIF CALL nl_get_io_form_boundary( 1, io_form ) IF ( use_package( io_form ) == IO_ESMF ) THEN CALL wrf_error_fatal ( 'wrf_findCouplingInterval: ERROR: ESMF cannot be used for WRF boundary I/O' ) ENDIF ! If nobody uses IO_ESMF, then default is to run WRF all the way to ! the end. IF ( .NOT. foundcoupling ) THEN couplingInterval = stopTime - startTime call wrf_debug ( 1, 'WARNING: ESMF coupling not used in this WRF run' ) ENDIF END SUBROUTINE wrf_findCouplingInterval SUBROUTINE wrf_getDecompInfo( ids, ide, jds, jde, kds, kde, & 1,1 ims, ime, jms, jme, kms, kme, & ips, ipe, jps, jpe, kps, kpe, & domdesc, bdy_mask ) INTEGER, INTENT(OUT) :: ids, ide, jds, jde, kds, kde INTEGER, INTENT(OUT) :: ims, ime, jms, jme, kms, kme INTEGER, INTENT(OUT) :: ips, ipe, jps, jpe, kps, kpe INTEGER, INTENT(OUT) :: domdesc LOGICAL, INTENT(OUT) :: bdy_mask(4) !<DESCRIPTION> ! WRF convenience routine for deducing decomposition information. !TODO: Note that domdesc is meaningful only for SPMD alternating event loops. !TODO: For concurrent operation (SPMD or MPMD), we will need to create a new !TODO: "domdesc" suitable for the task layout of the SST component. For !TODO: MPMD alternating event loops, we will need to serialize domdesc and !TODO: store it as metadata within the export state. Similar arguments apply !TODO: to [ij][mp][se] and bdy_mask. ! ! The arguments are: ! ids, ide, jds, jde, kds, kde Domain extent. ! ims, ime, jms, jme, kms, kme Memory extent. ! ips, ipe, jps, jpe, kps, kpe Patch extent. ! domdesc Domain descriptor for external ! distributed-memory communication ! package (opaque to WRF). ! bdy_mask Boundary mask flags indicating which ! domain boundaries are on this task. !</DESCRIPTION> ! extract decomposition information from head_grid CALL get_ijk_from_grid( head_grid , & ids, ide, jds, jde, kds, kde, & ims, ime, jms, jme, kms, kme, & ips, ipe, jps, jpe, kps, kpe ) #if 0 ! JM ! with version 3 of ESMF's staggering concepts, WRF's non-staggered grid is equivalent to ! esmf's 'exclusive' region -- that is the set of points that are owned by the 'DE' (eyeroll) ! WRF, on the other hand, is returning the 'staggered' dimensions here. So convert to the ! unstaggered dims before returning. ! Don't bother with vertical dimension for the time being, since we're only doing 2D coupling. ! ide = ide-1 ; ipe = MIN(ide,ipe) jde = jde-1 ; jpe = MIN(jde,jpe) #else ! JM ! with version 4 I have no damned clue at this writing... just random shots for now ! see if this works. ipe = MIN(ide-1,ipe) jpe = MIN(jde-1,jpe) #endif domdesc = head_grid%domdesc bdy_mask = head_grid%bdy_mask END SUBROUTINE wrf_getDecompInfo SUBROUTINE wrf_state_populate( ierr ) 1,7 ! Driver layer USE module_domain, ONLY : domain USE module_io_domain ! Model layer USE module_configure, ONLY : grid_config_rec_type, model_to_grid_config_rec USE module_bc_time_utilities IMPLICIT NONE !<DESCRIPTION> ! Populate WRF import and export states from Registry-generated code. ! For now, only head_grid can be coupled. ! !</DESCRIPTION> !TODO: Extend later to include child !TODO: domains, possibly via nested ESMF_State's. ! Arguments INTEGER, INTENT(OUT) :: ierr ! Local TYPE(domain), POINTER :: grid TYPE(grid_config_rec_type) :: config_flags INTEGER :: stream, idum1, idum2, io_form CHARACTER*80 :: fname, n2 ! external function prototype INTEGER, EXTERNAL :: use_package ! for now support coupling to head_grid only grid => head_grid ! TODO: Use actual grid via current_grid%id via something like this... ! IF ( current_grid_set ) THEN ! grid => current_grid ! ELSE ! ERROR ! ENDIF CALL model_to_grid_config_rec ( grid%id , model_config_rec , config_flags ) CALL set_scalar_indices_from_config ( grid%id , idum1 , idum2 ) stream = 0 ierr = 0 #include "med_open_esmf_calls.inc" END SUBROUTINE wrf_state_populate END MODULE module_wrf_component_top MODULE module_wrf_setservices 1 !<DESCRIPTION> ! This module defines WRF "Set Services" method wrf_register() ! used for ESMF coupling. !</DESCRIPTION> USE module_wrf_component_top, ONLY: wrf_component_init1, & wrf_component_init2, & wrf_component_run, & wrf_component_finalize USE ESMF IMPLICIT NONE ! everything is private by default PRIVATE ! Public entry point for ESMF_GridCompSetServices() PUBLIC WRF_register ! private stuff CHARACTER (ESMF_MAXSTR) :: str CONTAINS SUBROUTINE wrf_register(gcomp, rc),4 TYPE(ESMF_GridComp), INTENT(INOUT) :: gcomp INTEGER, INTENT(OUT) :: rc ! !<DESCRIPTION> ! WRF_register - Externally visible registration routine ! ! User-supplied SetServices routine. ! The Register routine sets the subroutines to be called ! as the init, run, and finalize routines. Note that these are ! private to the module. ! ! The arguments are: ! gcomp Component ! rc Return code; equals ESMF_SUCCESS if there are no errors, ! otherwise ESMF_FAILURE. !</DESCRIPTION> rc = ESMF_SUCCESS ! Register the callback routines. call ESMF_GridCompSetEntryPoint(gcomp, ESMF_METHOD_INITIALIZE, & wrf_component_init1, phase=1, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'wrf_register: ESMF_GridCompSetEntryPoint(wrf_component_init1) failed' ) ENDIF call ESMF_GridCompSetEntryPoint(gcomp, ESMF_METHOD_INITIALIZE, & wrf_component_init2, phase=2, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'wrf_register: ESMF_GridCompSetEntryPoint(wrf_component_init2) failed' ) ENDIF call ESMF_GridCompSetEntryPoint(gcomp, ESMF_METHOD_RUN, & wrf_component_run, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'wrf_register: ESMF_GridCompSetEntryPoint(wrf_component_run) failed' ) ENDIF call ESMF_GridCompSetEntryPoint(gcomp, ESMF_METHOD_FINALIZE, & wrf_component_finalize, rc=rc) IF ( rc /= ESMF_SUCCESS) THEN CALL wrf_error_fatal ( 'wrf_register: ESMF_GridCompSetEntryPoint(wrf_component_finalize) failed' ) ENDIF PRINT *,'WRF: Registered Initialize, Run, and Finalize routines' END SUBROUTINE wrf_register END MODULE module_wrf_setservices