> {-# LANGUAGE TypeFamilies, QuasiQuotes, OverloadedStrings, MultiParamTypeClasses, TemplateHaskell #-} > import Yesod > import Yesod.Helpers.Static > import Yesod.Form.Jquery > import Yesod.Form.Nic > import Control.Applicative > import Data.Text (unpack) > > data HW = HW { hwStatic :: Static } > type Handler = GHandler HW HW > mkYesod "HW" [$parseRoutes| > / RootR GET > /form FormR > /static StaticR Static hwStatic > /autocomplete AutoCompleteR GET > |] > instance Yesod HW where approot _ = "" > instance YesodJquery HW > instance YesodNic HW > wrapper h = [$hamlet| > <#wrapper>^{h} >