boltzmann-samplers: Uniform random generators

This is a package candidate release! Here you can preview how this package release will appear once published to the main package index (which can be accomplished via the 'maintain' link below). Please note that once a package has been published to the main package index it cannot be undone! Please consult the package uploading documentation for more information.

[maintain] [Publish]

Warnings:

Random generators with a uniform distribution conditioned to a given size. See also testing-feat, which is currently a faster method with similar results.


[Skip to Readme]

Properties

Versions 0.1.0.0, 0.1.0.0, 0.1.1.0
Change log None available
Dependencies ad, base (>=4.9 && <5), containers, hashable, hmatrix, ieee754, MonadRandom, mtl, QuickCheck, transformers, unordered-containers, vector [details]
License MIT
Author Li-yao Xia
Maintainer lysxia@gmail.com
Category Data, Generic, Random
Home page https://github.com/Lysxia/boltzmann-samplers#readme
Source repo head: git clone https://github.com/Lysxia/boltzmann-samplers
Uploaded by lyxia at 2017-03-05T20:22:44Z

Modules

[Index]

Flags

Manual Flags

NameDescriptionDefault
test

Enable testing. Disabled by default because the current test suite is slow and can fail with non-zero probability.

Disabled

Use -f <flag> to enable a flag, or -f -<flag> to disable that flag. More info

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees


Readme for boltzmann-samplers-0.1.0.0

[back to package description]

Boltzmann samplers Hackage Build Status

Boltzmann.Data

Define sized random generators for Data.Data generic types.

    {-# LANGUAGE DeriveDataTypeable #-}

    import Data.Data
    import Test.QuickCheck
    import Boltzmann.Data

    data Term = Lambda Int Term | App Term Term | Var Int
      deriving (Show, Data)

    instance Arbitrary Term where
      arbitrary = sized $ generatorPWith [positiveInts]

    positiveInts :: Alias Gen
    positiveInts =
      alias $ \() -> fmap getPositive arbitrary :: Gen Int

    main = sample (arbitrary :: Gen Term)

Boltzmann.Species

An experimental interface to obtain Boltzmann samplers from an applicative specification of a combinatorial system.

No documentation (yet).

References