module Hydra.Dsl.Lib.Io where

import Hydra.Core
import Hydra.Phantoms
import Hydra.Sources.Libraries
import qualified Hydra.Dsl.Terms as Terms


showTerm :: TTerm (Term -> String)
showTerm :: TTerm (Term -> String)
showTerm = Term -> TTerm (Term -> String)
forall a. Term -> TTerm a
TTerm (Term -> TTerm (Term -> String)) -> Term -> TTerm (Term -> String)
forall a b. (a -> b) -> a -> b
$ Name -> Term
Terms.primitive Name
_io_showTerm

showType :: TTerm (Type -> String)
showType :: TTerm (Type -> String)
showType = Term -> TTerm (Type -> String)
forall a. Term -> TTerm a
TTerm (Term -> TTerm (Type -> String)) -> Term -> TTerm (Type -> String)
forall a b. (a -> b) -> a -> b
$ Name -> Term
Terms.primitive Name
_io_showType