toEnum -package:clash-prelude
base Prelude Data.Enum GHC.Enum,
hedgehog Hedgehog.Internal.Prelude,
base-compat Prelude.Compat,
protolude Protolude Protolude.Base,
haskell-gi-base Data.GI.Base.ShortPrelude,
relude Relude.Enum,
rio RIO.Partial,
base-prelude BasePrelude,
classy-prelude ClassyPrelude,
numeric-prelude NumericPrelude NumericPrelude.Base,
Cabal-syntax Distribution.Compat.Prelude,
basic-prelude CorePrelude,
ihaskell IHaskellPrelude,
basement Basement.Compat.Base Basement.Imports,
numhask NumHask.Prelude,
foundation Foundation,
ghc-lib-parser GHC.Prelude.Basic,
prelude-compat Prelude2010,
dimensional Numeric.Units.Dimensional.Prelude,
ghc-internal GHC.Internal.Enum,
rebase Rebase.Prelude,
mixed-types-num Numeric.MixedTypes.PreludeHiding,
xmonad-contrib XMonad.Config.Prime,
constrained-categories Control.Category.Constrained.Prelude Control.Category.Hask,
copilot-language Copilot.Language.Prelude,
incipit-base Incipit.Base,
LambdaHack Game.LambdaHack.Core.Prelude,
cabal-install-solver Distribution.Solver.Compat.Prelude,
faktory Faktory.Prelude,
yesod-paginator Yesod.Paginator.Prelude,
distribution-opensuse OpenSuse.Prelude,
hledger-web Hledger.Web.Import TcRnTagToEnumMissingValArg is an error that occurs when the
'tagToEnum#' function is not applied to a single value argument.
Example(s): tagToEnum# 1 2
Test cases: None
TcRnTagToEnumResTyNotAnEnum is an error that occurs when the
'tagToEnum#' function is given a result type that is not an
enumeration type.
Example(s): foo :: Int -- not an enumeration TyCon foo = tagToEnum# 0#
Test cases: typecheckshould_failtcfail164
TcRnTagToEnumResTyTypeData is an error that occurs when the
'tagToEnum#' function is given a result type that is headed by a
type data type, as the data constructors of a type
data do not exist at the term level.
Example(s): type data Letter = A | B | C
foo :: Letter foo = tagToEnum# 0#
Test cases: type-datashould_failTDTagToEnum.hs
TcRnTagToEnumUnspecifiedResTy is an error that occurs when the
'tagToEnum#' function is not given a concrete result type.
Example(s): foo :: forall a. a foo = tagToEnum# 0#
Test cases: typecheckshould_failtcfail164