{-# LANGUAGE OverloadedStrings #-}
module Yesod.Default.Handlers
    ( getFaviconR
    , getRobotsR
    ) where

import Yesod.Core

getFaviconR :: MonadHandler m => m ()
getFaviconR :: m ()
getFaviconR = ContentType -> FilePath -> m ()
forall (m :: * -> *) a.
MonadHandler m =>
ContentType -> FilePath -> m a
sendFile ContentType
"image/x-icon" FilePath
"config/favicon.ico"

getRobotsR :: MonadHandler m => m ()
getRobotsR :: m ()
getRobotsR = ContentType -> FilePath -> m ()
forall (m :: * -> *) a.
MonadHandler m =>
ContentType -> FilePath -> m a
sendFile ContentType
"text/plain" FilePath
"config/robots.txt"