
19 Mar
2014
19 Mar
'14
6:55 a.m.
Hi, please is there a way how I could autorefresh / reload the page in scotty? A small example, where I would like to see that the time refreshes every second: {-# LANGUAGE OverloadedStrings #-} import Web.Scotty import Control.Monad.Trans (liftIO) import qualified Data.Text.Lazy as L (Text, pack) import Data.Time.Clock main = scotty 3005 $ do get "/" $ do time <- liftIO getTime html time getTime :: IO L.Text getTime = do utcTime <- getCurrentTime let timeText = L.pack $ show utcTime return timeText Cheers, M.