{-# LANGUAGE OverloadedStrings #-}
module Funcons.Core.Computations.Abnormal.Sticking where
import Funcons.EDSL
entities :: [a]
entities = []
types :: TypeRelation
types = [(Name, DataTypeMembers)] -> TypeRelation
typeEnvFromList
[]
funcons :: FunconLibrary
funcons = [(Name, EvalFunction)] -> FunconLibrary
libFromList
[(Name
"stuck",NullaryFuncon -> EvalFunction
NullaryFuncon NullaryFuncon
forall a. Rewrite a
stepStuck)]
stuck_ :: Funcons
stuck_ = Name -> Funcons
FName Name
"stuck"
stepStuck :: Rewrite a
stepStuck = Funcons -> Rewrite a
forall a. Funcons -> Rewrite a
norule (Name -> Funcons
FName Name
"stuck")