{-# LANGUAGE CPP #-}

module Intensional.Ubiq where

import qualified GhcPlugins as GHC

  -- Ubiquitous functions, they're found everywhere

debugging :: Bool
debugging :: Bool
debugging = 
#ifdef DEBUG
  True
#else
  Bool
False
#endif

traceSpan :: GHC.SrcSpan -> String
traceSpan :: SrcSpan -> String
traceSpan s :: SrcSpan
s = SDoc -> String
GHC.showSDocUnsafe (SrcSpan -> SDoc
forall a. Outputable a => a -> SDoc
GHC.ppr SrcSpan
s)