{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE ConstraintKinds #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE QuantifiedConstraints #-}
module Clod.Effects
(
ClodM
, ClodError(..)
, ClodConfig(..)
, runClodM
, throwError
, catchError
, liftIO
, ask
, asks
, local
) where
import Clod.Types
( ClodM
, ClodError(..)
, ClodConfig(..)
, runClodM
, throwError
, catchError
, liftIO
, ask
, asks
, local
)