Changelog for singletons-2.5.1
Changelog for singletons project
2.5.1
ShowSingis now a type class (with a single instance) instead of a type synonym. This was changed because definingShowSingas a type synonym prevents it from working well with recursive types due to an unfortunate GHC bug. For more information, see issue #371.- Add an
IsStringinstance forSomeSing.
2.5
-
The
Data.Promotion.Prelude.*namespace has been removed. Use the corresponding modules in theData.Singletons.Prelude.*namespace instead. -
Fix a regression in which certain infix type families, such as
(++),($),(+), and others, did not have the correct fixities. -
The default implementation of the
(==)type inPEqwas changed from(Data.Type.Equality.==)to a custom type family,DefaultEq. The reason for this change is that(Data.Type.Equality.==)is unable to conclude thata == areduces toTruefor anya. (As a result, the previous version ofsingletonsregressed in terms of type inference for thePEqinstances forNatandSymbol, which used that default.) On the other hand,DefaultEq a adoes reduce toTruefor alla. -
Add
Enum Nat,Show Nat, andShow Symbolinstances toData.Singletons.TypeLits. -
Template Haskell-generated code may require
DataKindsandPolyKindsin scenarios which did not previously require it:singletonsnow explicitly quantifies all kind variables used in explicitforalls.singletonsnow generatesa ~> binstead ofTyFun a b -> Typewhenever possible.
-
Since
th-desugarnow desugars all data types to GADT syntax, Template Haskell-generated code may requireGADTsin situations that didn't require it before. -
Overhaul the way derived
Showinstances for singleton types works. Before, there was an awkwardShowSingclass (which was essentially a cargo-culted version ofShowspecialized forSing) that one had to create instances for separately. Now that GHC hasQuantifiedConstraints, we can scrap this whole class and turnShowSinginto a simple type synonym:type ShowSing k = forall z. Show (Sing (z :: k))Now, instead of generating a hand-written
ShowSingandShowinstance for each singleton type, we only generate a single (derived!)Showinstance. As a result of this change, you will likely need to enableQuantifiedConstraintsandStandaloneDerivingif you single any derivedShowinstances in your code. -
The kind of the type parameter to
SingIis no longer specified. This only affects you if you were using thesingmethod withTypeApplications. For instance, if you were usingsing @Bool @Truebefore, then you will now need to now usesing @Boolinstead. -
singletonsnow generatesSingIinstances for defunctionalization symbols through Template Haskell. As a result, you may need to enableFlexibleInstancesin more places. -
genDefunSymbolsis now more robust with respect to types that use dependent quantification, such as:type family MyProxy k (a :: k) :: Type where MyProxy k (a :: k) = Proxy aSee the documentation for
genDefunSymbolsfor limitations to this. -
Rename
Data.Singletons.TypeRepStartoData.Singletons.TypeRepTYPE, and generalize theSing :: Type -> Typeinstance toSing :: TYPE rep -> Type, allowing it to work over more open kinds. Also renameSomeTypeRepStartoSomeTypeRepTYPE, and change its definition accordingly. -
Promoting or singling a type synonym or type family declaration now produces defunctionalization symbols for it. (Previously, promoting or singling a type synonym did nothing whatsoever, and promoting or singling a type family produced an error.)
-
singletonsnow produces fixity declarations for defunctionalization symbols when appropriate. -
Add
(%<=?), a singled version of(<=?)fromGHC.TypeNats, as well as defunctionalization symbols for(<=?), toData.Singletons.TypeLits. -
Add
Data.Singletons.Prelude.{Semigroup,Monoid}, which define promoted and singled versions of theSemigroupandMonoidtype classes, as well as various newtype modifiers.Symbolis now has promotedSemigroupandMonoidinstances as well. As a consequence,Data.Singletons.TypeLitsno longer exports(<>)or(%<>), as they are superseded by the corresponding methods fromPSemigroupandSSemigroup. -
Add promoted and singled versions of the
Functor,Foldable,Traversable,Applicative,Alternative,Monad,MonadPlus, andMonadZipclasses. Among other things, this grants the ability to promote or singledo-notation and list comprehensions.Data.Singletons.Prelude.Listnow reexports more generalFoldable/Traversablefunctions wherever possible, just asData.Listdoes.
-
Add
Data.Singletons.Prelude.{Const,Identity}, which define promoted and singled version of theConstandIdentitydata types, respectively. -
Promote and single the
Downnewtype inData.Singletons.Prelude.Ord. -
To match the
baselibrary, the promoted/singled versions ofcomparingandthenCmpare no longer exported fromData.Singletons.Prelude. (They continue to live inData.Singletons.Prelude.Ord.) -
Permit singling of expression and pattern signatures.
-
Permit promotion and singling of
InstanceSigs. -
sErrorandsUndefinednow haveHasCallStackconstraints, like their counterpartserrorandundefined. The promoted and singled counterparts toerrorWithoutStackTracehave also been added in case you do not want this behavior. -
Add
Data.Singletons.TypeError, which provides a drop-in replacement forGHC.TypeLits.TypeErrorwhich can be used at both the value- and type-level.
2.4.1
- Restore the
TyCon1,TyCon2, etc. types. It turns out that the newTyCondoesn't work with kind-polymorphic tycons.
2.4
-
Require GHC 8.4.
-
Demote Natis nowNatural(fromNumeric.Natural) instead ofInteger. In accordance with this change,Data.Singletons.TypeLitsnow exposesGHC.TypeNats.natVal(which returns aNatural) instead ofGHC.TypeLits.natVal(which returns anInteger). -
The naming conventions for infix identifiers (e.g.,
(&*)) have been overhauled.-
Infix functions (that are not constructors) are no longer prepended with a colon when promoted to type families. For instance, the promoted version of
(&*)is now called(&*)as well, instead of(:&*)as before.There is one exception to this rule: the
(.)function, which is promoted as(:.). The reason is that one cannot write(.)at the type level. -
Singletons for infix functions are now always prepended with
%instead of%:. -
Singletons for infix classes are now always prepended with
%instead of:%. -
Singletons for infix datatypes are now always prepended with a
%.(Before, there was an unspoken requirement that singling an infix datatype required that name to begin with a colon, and the singleton type would begin with
:%. But now that infix datatype names can be things like(+), this requirement became obsolete.)
The upshot is that most infix names can now be promoted using the same name, and singled by simply prepending the name with
%. -
-
The suffix for defunctionalized names of symbolic functions (e.g.,
(+)) has changed. Before, the promoted type name would be suffixed with some number of dollar signs (e.g.,(+$)and(+$$)) to indicate defunctionalization symbols. Now, the promoted type name is first suffixed with@#@and then followed by dollar signs (e.g.,(+@#@$)and(+@#@$$)). Adopting this conventional eliminates naming conflicts that could arise for functions that consisted of solely$symbols. -
The treatment of
undefinedis less magical. Before, all uses ofundefinedwould be promoted toGHC.Exts.Anyand singled toundefined. Now, there is a properUndefinedtype family andsUndefinedsingleton function. -
As a consequence of not promoting
undefinedtoAny, there is no need to have a specialany_function to distinguish the function on lists. The corresponding promoted type, singleton function, and defunctionalization symbols are now namedAny,sAny, andAnySym{0,1,2}. -
Rework the treatment of empty data types:
- Generated
SingKindinstances for empty data types now useEmptyCaseinstead of simplyerroring. - Derived
PEqinstances for empty data types now returnTrueinstead ofFalse. DerivedSEqinstances now returnTrueinstead oferroring. - Derived
SDecideinstances for empty data types now returnProved bottom, wherebottomis a divergent computation, instead oferroring.
- Generated
-
Add
Data.Singletons.Prelude.IsStringandData.Promotion.Prelude.IsStringmodules.IsString.fromStringis now used when promoting or singling string literals when the-XOverloadedStringsextension is enabled (similarly to howNum.fromIntegeris currently used when promoting or singling numeric literals). -
Add
Data.Singletons.Prelude.Void. -
Add promoted and singled versions of
div,mod,divMod,quot,rem, andquotRemtoData.Singletons.TypeLitsthat utilize the efficientDivandModtype families fromGHC.TypeNats. Also addsLog2and defunctionalization symbols forLog2fromGHC.TypeNats. -
Add
(<>)and(%<>), the promoted and singled versions ofAppendSymbolfromGHC.TypeLits. -
Add
(%^), the singleton version ofGHC.TypeLits.^. -
Add
unlinesandunwordstoData.Singletons.Prelude.List. -
Add promoted and singled versions of
Show, includingderivingsupport. -
Add a
ShowSingclass, which facilitates the ability to writeShowinstances forSinginstances. -
Permit derived
Ordinstances for empty datatypes. -
Permit standalone
derivingdeclarations. -
Permit
DeriveAnyClass(through theanyclasskeyword ofDerivingStrategies) -
Add a value-level
(@@), which is a synonym forapplySing. -
Add
Eq,Ord,Num,Enum, andBoundedinstances forSomeSing, which leverage theSEq,SOrd,SNum,SEnum, andSBoundedinstances, respectively, for the underlyingSing. -
Rework the
Sing (a :: *)instance inData.Singletons.TypeRepStarsuch that it now uses type-indexedTypeable. The newSinginstance is now:newtype instance Sing :: Type -> Type where STypeRep :: TypeRep a -> Sing aAccordingly, the
SingKindinstance has also been changed:instance SingKind Type where type Demote Type = SomeTypeRepStar ... data SomeTypeRepStar where SomeTypeRepStar :: forall (a :: *). !(TypeRep a) -> SomeTypeRepStarAside from cleaning up some implementation details, this change assures that
toSingcan only be called onTypeReps whose kind is of kind*. The previous implementation did not enforce this, which could lead to segfaults if used carelessly. -
Instead of
erroring, thetoSingimplementation in theSingKind (k1 ~> k2)instance now works as one would expect (provided the user adheres to some common-senseSingKindlaws, which are now documented). -
Add a
demotefunction, which is a convenient shorthand forfromSing sing. -
Add a
Data.Singletons.Sigmamodule with aSigma(dependent pair) data type. -
Export defunctionalization symbols for
Demote,SameKind,KindOf,(~>),Apply, and(@@)fromData.Singletons`. -
Add an explicitly bidirectional pattern synonym
Sing. Pattern matching onSingbrings aSingI tyconstraint into scope from a singletonSing ty. -
Add an explicitly bidirectional pattern synonym
FromSing. Pattern matching on any demoted (base) type gives us the corresponding singleton. -
Add explicitly bidirectional pattern synonyms
SLambda{2..8}. Pattern matching on any defunctionalized singleton yields a term-level Haskell function on singletons. -
Remove the family of
TyCon1,TyCon2, ..., in favor of justTyCon. GHC 8.4's type system is powerful enough to allow this nice simplification.
2.3
-
Documentation clarifiation in
Data.Singletons.TypeLits, thanks to @ivan-m. -
Demotewas no longer a convenient way of callingDemoteRepand has been removed.DemoteRephas been renamedDemote. -
DemoteRepis now injective. -
Demoting a
Symbolnow givesText. This is motivated by makingDemoteRepinjective. (IfSymboldemoted toString, then there would be a conflict between demoting[Char]andSymbol.) -
Generating singletons also now generates fixity declarations for the singletonized definitions, thanks to @int-index.
-
Though more an implementation detail: singletons no longer uses kind-level proxies anywhere, thanks again to @int-index.
-
Support for promoting higher-kinded type variables, thanks for @int-index.
-
Data.Singletons.TypeLitsnow exports defunctionalization symbols forKnownNatandKnownSymbol. -
Better type inference support around constraints, as tracked in Issue #176.
-
Type synonym definitions are now ignored, as they should be.
-
Showinstances forSNatandSSymbol, thanks to @cumber. -
The
singFunandunSingFunfunctions no longer use proxies, preferringTypeApplications.
2.2
-
With
TypeInType, we no longer kindKProxy. @int-index has very helpfully removed the use ofKProxyfromsingletons. -
Drop support for GHC 7.x.
-
Remove
bugInGHC. That function was intended to work around GHC's difficulty in detecting exhaustiveness of GADT pattern matches. GHC 8 comes with a much better exhaustiveness checker, and so this function is no longer necessary.
2.1
-
Require
th-desugar>= 1.6 -
Work with GHC 8. GHC 8 gives the opportunity to simplify some pieces of singletons, but these opportunities are not yet fully realized. For example, injective type families means that we no longer need
Singto be a data family; it could be a type family. This might drastically simplify the way functions are singletonized. But not yet! -
singletonsnow outputs a few more type/kind annotations to help GHC do type inference. There may be a few more programs accepted than before. (This is the fix for #136.)
2.0.1
- Lots more functions in
Data.Singletons.Prelude.List:filter,find,elemIndex,elemIndices,findIndex,findIndices,intersect,intersectBy,takeWhile,dropWhile,dropWhileEnd,span,break,take,drop,splitAt,group,maximum,minimum,insert,sort,groupBy,lookup,partition,sum,product,length,replicate,transpose,(!!),nub,nubBy,unionBy,union,genericLength
2.0.0.2
- Fix fixity of
*.
2.0.0.1
- Make haddock work.
2.0
-
Instance promotion now works properly -- it was quite buggy in 1.0.
-
Classes and instances can now be singletonized.
-
Limited support for functional dependencies.
-
We now have promoted and singletonized versions of
Enum, as well asBounded. -
Deriving
Enumis also now supported. -
Ditto for
Num, which includes an instance forNat, naturally. -
Promoting a literal number now uses overloaded literals at the type level, using a type-level
FromIntegerin the type-levelNumclass. -
Better support for dealing with constraints. Some previously-unsingletonizable functions that have constrained parameters now work.
-
No more orphan
Quasiinstances! -
Support for functions of arity 8 (instead of the old limit, 7).
-
Full support for fixity declarations.
-
A raft of bugfixes.
-
Drop support for GHC 7.8. You must have GHC 7.10.2.
1.1.2.1
Fix bug #116, thus allowing locally-declared symbols to be used in GHC 7.10.
1.1.2
- No more GHC 7.8.2 support -- you must have GHC 7.8.3.
1.1.1
Update testsuite to work with th-desugar-1.5.2. No functional changes.
1.1
This is a maintenance release to support building (but not testing, due to
GHC bug #10058) with 7.10. This release also targets th-desugar-1.5. Some
types changed (using th-desugar's new DsMonad instead of Quasi), but
clients generally won't need to make any changes, unless they, too, generalize
over Quasi.
1.0
This is a complete rewrite of the package.
-
A much wider array of surface syntax is now accepted for promotion and singletonization, including
let,case, partially-applied functions, and anonymous functions,where, sections, among others. -
Classes and instances can be promoted (but not singletonized).
-
Derivation of promoted instances for
OrdandBounded.
This release can be seen as a "technology preview". More features are coming soon.
This version drops GHC 7.6 support.
0.10.0
Template Haskell names are now more hygienic. In other words, singletons
won't try to gobble up something happened to be named Sing in your project.
(Note that the Template Haskell names are not completely hygienic; names
generated during singleton generation can still cause conflicts.)
If a function to be promoted or singletonized is missing a type signature, that is now an error, not a warning.
Added a new external module Data.Singletons.TypeLits, which contain the singletons for GHC.TypeLits. Some convenience functions are also provided.
The extension EmptyCase is no longer needed. This caused pain when trying
to support both GHC 7.6.3 and 7.8.
0.9.3
Fix export list of Data.Singletons.TH, again again.
Add SEq instances for Nat and Symbol.
0.9.2
Fix export list of Data.Singletons.TH, again.
0.9.1
Fix export list of Data.Singletons.TH.
0.9.0
Make compatible with GHC HEAD, but HEAD reports core lint errors sometimes.
Change module structure significantly. If you want to derive your own
singletons, you should import Data.Singletons.TH. The module
Data.Singletons now exports functions only for the use of singletons.
New modules Data.Singletons.Bool, ...Maybe, ...Either, and ...List
are just like their equivalents from Data., except for List, which is
quite lacking in features.
For singleton equality, use Data.Singletons.Eq.
For propositional singleton equality, use Data.Singletons.Decide.
New module Data.Singletons.Prelude is meant to mirror the Haskell Prelude,
but with singleton definitions.
Streamline representation of singletons, resulting in exponential speedup at execution. (This has not been rigorously measured, but the data structures are now exponentially smaller.)
Add internal support for TypeLits, because the TypeLits module no longer exports singleton definitions.
Add support for existential singletons, through the toSing method of
SingKind.
Remove the SingE class, bundling its functionality into SingKind.
Thus, the SingRep synonym has also been removed.
Name change: KindIs becomes KProxy.
Add support for singletonizing calls to error.
Add support for singletonizing empty data definitions.
0.8.6
Make compatible with GHC HEAD, but HEAD reports core lint errors sometimes.
0.8.5
Bug fix to make singletons compatible with GHC 7.6.1.
Added git info to cabal file.
0.8.4
Update to work with latest version of GHC (7.7.20130114).
Now use branched type family instances to allow for promotion of functions with overlapping patterns.
Permit promotion of functions with constraints by omitting constraints.
0.8.3
Update to work with latest version of GHC (7.7.20121031).
Removed use of Any to simulate kind classes; now using KindOf and OfKind from GHC.TypeLits.
Made compatible with GHC.TypeLits.
0.8.2
Added this changelog
Update to work with latest version of GHC (7.6.1). (There was a change to Template Haskell).
Moved library into Data.Singletons.
0.8.1
Update to work with latest version of GHC. (There was a change to Template Haskell).
Updated dependencies in cabal to include the newer version of TH.
0.8
Initial public release