{-# LANGUAGE TypeApplications #-}

-- | The simplest Ema site possible.
--
-- A site with one route (index) that displays content generated from pure
-- values.
module Ema.Example.Ex01_HelloWorld where

import Ema (runEmaPure)

main :: IO ()
main :: IO ()
main = do
  let Text
speaker :: Text = Text
"Ema"
  (Action -> LByteString) -> IO ()
runEmaPure ((Action -> LByteString) -> IO ())
-> (Action -> LByteString) -> IO ()
forall a b. (a -> b) -> a -> b
$ \Action
_ ->
    Text -> LByteString
forall a b. ConvertUtf8 a b => a -> b
encodeUtf8 (Text -> LByteString) -> Text -> LByteString
forall a b. (a -> b) -> a -> b
$ Text
"<b>Hello</b>, from " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
speaker