
If you explicitly want to avoid JavaScript / XHR you could use a meta
refresh attribute in your HTML page:
http://en.m.wikipedia.org/wiki/Meta_refresh
Cheers,
Ben
On 19 Mar 2014 20:55, "Miroslav Karpis"
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.
_______________________________________________ Beginners mailing list Beginners@haskell.org http://www.haskell.org/mailman/listinfo/beginners