module Conduit.Features.Account.Handlers where

import Conduit.App.Monad (AppM)
import Web.Scotty.Internal.Types (ScottyT)

import Conduit.Features.Account.User.GetUser         (handleGetUser)
import Conduit.Features.Account.User.LoginUser       (handleUserLogin)
import Conduit.Features.Account.User.RegisterUser    (handleUserRegistration)
import Conduit.Features.Account.User.GetProfile      (handleGetProfile)
import Conduit.Features.Account.User.UpdateUser      (handleUpdateUser)
import Conduit.Features.Account.Follows.FollowUser   (handleUserFollow)
import Conduit.Features.Account.Follows.UnfollowUser (handleUserUnfollow)

handlers :: ScottyT AppM ()
handlers :: ScottyT AppM ()
handlers = [ScottyT AppM ()] -> ScottyT AppM ()
forall m. Monoid m => [m] -> m
forall (t :: * -> *) m. (Foldable t, Monoid m) => t m -> m
fold
  [ ScottyT AppM ()
handleGetUser
  , ScottyT AppM ()
handleUserLogin
  , ScottyT AppM ()
handleUserRegistration
  , ScottyT AppM ()
handleUpdateUser
  , ScottyT AppM ()
handleGetProfile
  , ScottyT AppM ()
handleUserFollow
  , ScottyT AppM ()
handleUserUnfollow
  ]