{-# LANGUAGE Trustworthy #-}
module Relude.Base
(
module Data.Char
, module Data.Eq
, module Data.Ord
, module System.IO
, module Data.Coerce
, module Data.Kind
, module Data.Proxy
, module Data.Typeable
, module Data.Void
, module GHC.Base
, module GHC.Generics
, module GHC.Show
, module GHC.TypeNats
, module GHC.OverloadedLabels
, module GHC.ExecutionStack
, module GHC.Stack
) where
import Data.Char (Char, chr)
import System.IO (FilePath, IO, IOMode (..))
import Data.Eq (Eq (..))
import Data.Ord (Down (..), Ord (..), Ordering (..), comparing)
import Data.Coerce (Coercible, coerce)
import Data.Kind (Constraint, Type)
import Data.Proxy (Proxy (..))
import Data.Typeable (Typeable)
import Data.Void (Void, absurd, vacuous)
import GHC.Base (asTypeOf, ord, seq, ($!))
import GHC.Generics (Generic)
import GHC.Show (Show)
import GHC.TypeNats (CmpNat, KnownNat, Nat, SomeNat (..), natVal, someNatVal)
import GHC.ExecutionStack (getStackTrace, showStackTrace)
import GHC.OverloadedLabels (IsLabel (..))
import GHC.Stack (CallStack, HasCallStack, callStack, currentCallStack, getCallStack,
prettyCallStack, prettySrcLoc, withFrozenCallStack)