module Mit.Globals where

import Mit.Prelude
import System.Environment (lookupEnv)
import System.IO.Unsafe (unsafePerformIO)

debug :: Bool
debug :: Bool
debug =
  Maybe String -> Bool
forall a. Maybe a -> Bool
isJust (IO (Maybe String) -> Maybe String
forall a. IO a -> a
unsafePerformIO (String -> IO (Maybe String)
lookupEnv String
"debug"))
{-# NOINLINE debug #-}