-- |
-- Module      :  Cryptol.Utils.Debug
-- Copyright   :  (c) 2013-2016 Galois, Inc.
-- License     :  BSD3
-- Maintainer  :  cryptol@galois.com
-- Stability   :  provisional
-- Portability :  portable

module Cryptol.Utils.Debug where

import Cryptol.Utils.PP

import qualified Debug.Trace as X
trace :: String -> b -> b
trace :: String -> b -> b
trace = String -> b -> b
forall a. String -> a -> a
X.trace

ppTrace :: Doc -> b -> b
ppTrace :: Doc -> b -> b
ppTrace Doc
d = String -> b -> b
forall a. String -> a -> a
trace (Doc -> String
forall a. Show a => a -> String
show Doc
d)