-- SPDX-FileCopyrightText: 2020 Tocqueville Group
--
-- SPDX-License-Identifier: LicenseRef-MIT-TQ

-- | Functions supposed to be used in the @Main@ module.

module Morley.Util.Main
  ( wrapMain
  ) where

import Control.Exception.Uncaught (withDisplayExceptionHandler)
import Main.Utf8 (withUtf8)

-- | Some defaults in Haskell are debatable and we typically want
-- to customize them in our applications.
-- Some customizations are done at the level of @main@.
-- Currently we have two of them:
--
-- 1. 'withUtf8' from the @with-utf8@ package.
-- 2. 'withDisplayExceptionHandler' from the @uncaught-exception@ package.
--
-- This function is supposed to apply all @main@ customizations that we
-- typcally want to do.
wrapMain :: IO () -> IO ()
wrapMain :: IO () -> IO ()
wrapMain = IO () -> IO ()
forall (m :: * -> *) r. (MonadIO m, MonadMask m) => m r -> m r
withUtf8 (IO () -> IO ()) -> (IO () -> IO ()) -> IO () -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. IO () -> IO ()
forall a. IO a -> IO a
withDisplayExceptionHandler