module Control.Effect.Debug where
import Control.Effect.Carrier
import GHC.TypeLits
type family DebugEffects (m :: * -> *) :: k where
DebugEffects m = TypeError ( 'Text "Control.Effect.Debug.debugEffects"
':$$: 'Text "Derivs: " ':<>: 'ShowType (Derivs m)
':$$: 'Text "Prims: " ':<>: 'ShowType (Prims m)
':$$: 'Text "Carrier is:"
':$$: 'Text "\t" ':<>: 'ShowType m
)
debugEffects :: DebugEffects m
=> m a
debugEffects :: m a
debugEffects = [Char] -> m a
forall a. [Char] -> a
errorWithoutStackTrace [Char]
"debugEffects: impossible"