-- | A module for tier-0 constants.

module Hydra.Constants where

import qualified Hydra.Core as Core
import Data.Int
import Data.List as L
import Data.Map as M
import Data.Set as S

ignoredVariable :: String
ignoredVariable :: String
ignoredVariable = String
"_"

-- | A placeholder name for row types as they are being constructed
placeholderName :: Core.Name
placeholderName :: Name
placeholderName = (String -> Name
Core.Name String
"Placeholder")

maxTraceDepth :: Int
maxTraceDepth :: Int
maxTraceDepth = Int
50