hydrogen-prelude: Hydrogen Prelude

[ language, library, mit ] [ Propose Tags ]

Flags

Automatic Flags
NameDescriptionDefault
explicittextEnabled

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

Candidates

  • No Candidates
Versions [RSS] 0.1.0.0, 0.1.0.1, 0.1.1, 0.2, 0.2.0.1, 0.2.1, 0.3.1, 0.5, 0.6, 0.6.0.1, 0.7, 0.7.1, 0.8, 0.9, 0.10, 0.11, 0.12, 0.14, 0.15, 0.16, 0.17, 0.18, 0.19, 0.20 (info)
Change log CHANGELOG.md
Dependencies array (>=0.4), base (>=4.5 && <5), binary (>=0.5.1), bytestring (>=0.9.2.1), cereal (>=0.4.1.1), containers (>=0.4.2.1), directory (>=1.1), filepath (>=1.3), ghc-prim, hashable (>=1.1), hydrogen-multimap (>=0.3), hydrogen-version (>=1.4), network (>=2.3), process (>=1.1.0.1), random (>=1.0.1.1), regex-base (>=0.93.1), regex-tdfa (>=1.2), strict (>=0.3), text (>=0.11.2), time (>=1.4), transformers (>=0.3), uuid (>=1.3) [details]
License MIT
Author Julian Fleischer
Maintainer julian@scravy.de
Category Language
Home page http://scravy.de/hydrogen-prelude/
Source repo head: git clone https://github.com/scravy/hydrogen-prelude
Uploaded by JulianFleischer at 2015-03-26T07:27:50Z
Distributions
Reverse Dependencies 7 direct, 0 indirect [details]
Downloads 11610 total (53 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2015-03-26 [all 1 reports]

Readme for hydrogen-prelude-0.20

[back to package description]

hydrogen-prelude

Build Status

about

A Prelude that exports much of the standard library (more then Prelude), without conflicts. If for example you were to import Prelude and Data.List or Data.Foldable you will run into ambiguous imports (regarding foldr for example). This Prelude aims at exporting the most general functions (in this case foldr from Data.Foldable).

It also pulls in some default packages like cereal for serialization and containers for data types like Map and Set. Every datatype exported by this Prelude comes with instances for Serialize.

Longs story short, instead of:

import Prelude hiding (
  all, and, any, concat, concatMap, elem, foldl, foldl1, foldr, foldr1,
  mapM, mapM_, maximum, minimum, notElem, or, product, sequence, sequence_, sum
 )
import "base" Control.Monad hiding (
  forM, forM_, mapM, mapM_, msum, sequence, sequence_
 )
import Data.Foldable
import Data.Traversable
import Data.List hiding (
  all, and, any, concat, concatMap, elem, find, foldl, foldl', foldl1, foldr, foldr1,
  mapAccumL, mapAccumR, maximum, maximumBy, minimum, minimumBy, notElem, or, product, sum
 )

it suffices to:

import Hydrogen.Prelude

goodies

Beyond existing functions from well-known standard packages, this prelude defines a few utilities (mostly aimed at unifying functionality across different packages, like containers and array).


(!) :: Has a ⇒ a → HasKey a → HasValue a

(!) is provided for several data types which associate a key and a value.

[(1, 'a'), (3, 'v')] ! 1  →  'a'

Instances are defined for

  • Eq k ⇒ [(k, v)]
  • Ix i ⇒ Array i e with HasKey → i
  • Ord k ⇒ Map k v with HasValue → v
  • Ord k ⇒ MultiMap k v with HasValue → [v]

(?) :: Container a ⇒ a → Contained a → Bool

Check whether the element on the right is contained in the collection on the left.

[1, 2, 4] ? 3  →  False

Instances are defined for

  • Eq a ⇒ [a]
  • Ord a ⇒ Set a
  • Eq a ⇒ Seq a
  • Ord k ⇒ Map k v with Contained → k
  • Ord k ⇒ MultiMap k v with Contained → k

tmap

A little bit like fmap but defined differently on some datatypes (applies e.g. to both components of a tuple).

tmap succ (3, 4)  →  (4, 5)

Instances are defined for

  • (a, a)
  • (a, a, a)
  • (a, a, a, a)
  • [a]
  • Seq a
  • Map k v
  • MultiMap k v

fmap vs map

Hydrogen Prelude exports fmap as map - the way it ought to be.


__ :: a

A handy shortcut for undefined.


FSharp's |> (which is flip ($))

Use it to pipe things from one function to the other, left to right:

head xs |> fromEnum |> show

safeHead :: a → [a] → a

The head of the list, or the default given as first argument.

safeHead x xs = maybe x head . listToMaybe

ShowBox :: forall a. (Show a) ⇒ a → ShowBox

Wrap anything that is showable (can be used to build heterogeneous lists).


.|, .&, .^ :: (a → Bool) → (a → Bool) → (a → Bool)

Combines predicates.

filter (isDigit .| isLetter)

type List a = [a]

A longhand for the type of lists, if you prefer this more wordy version.


class Default a

A class that provides the def function for default values for types. Instances of MonadPlus automatically have an instance where def = mzero.

Default instances for most primitive types are also provided.


class Apply a

Provides the *$* operator which is your all-purpose application operator. It does uncurrying (if you want to apply a tupel result of a function to a function that is curryied, works with tupels of up to 5 components) and also works with Applicative, i.e. it also does fmap . uncurry:

data Operator = Operator Value OperatorType Value

parseInfixOperation :: Parser (Value, OperatorType, Value)

... Operator *$* parseInfixOperation ...

re-exports

Hydrogen.Prelude

The Hydrogen Prelude offers you the functions and datatypes from these modules, all with one import:

  • from base

    • module Prelude
    • module Control.Applicative
    • module Control.Arrow
    • module Control.Monad
    • module Data.Bits
    • module Data.Bool
    • module Data.Char
    • module Data.Complex
    • module Data.Complex
    • module Data.Dynamic
    • module Data.Either
    • module Data.Fixed
    • module Data.Function
    • module Data.Foldable
    • module Data.Int
    • module Data.Ix
    • module Data.List
    • module Data.Maybe
    • module Data.Ord
    • module Data.Ratio
    • module Data.String
    • module Data.Time
    • module Data.Traversable
    • module Data.Tuple
    • module Data.Typeable
    • module Data.Word
    • module Numeric
    • module Text.Printf
  • from array

    • module Data.Array
  • from cereal

    • module Data.Serialize
  • from containers

    • Data.Set, Data.Map, and Data.Seq
  • from hashable

    • module Data.Hashable
  • form hydrogen-multimap

    • Hydrogen.MultiMap
  • from hydrogen-version

    • module Hydrogen.Version
  • from regex-tdfa

    • module Text.Regex.TDFA
  • from time

    • module Data.Time
  • from transformers

    • module Data.Functor.Identity
    • module Data.Functor.Reverse
  • from uuid

    • Data.UUID
    • Data.UUID.fromString as uuidFromString
    • Data.UUID.V4.nextRandom as randomUUID

Hydrogen.Prelude.IO

  • from base

    • module Data.IORef
    • module Control.Concurret
    • module Control.Exception
    • module System.IO
    • module System.Timeout
  • from strict

    • strict IO functions hGetContents', getContents', readFile', interact'

Hydrogen.Prelude.System

  • from base

    • module System.CPUTime
    • module System.Environment
    • module System.Exit
    • module System.Info
  • from directory

    • module System.Directory
  • from filepath

    • module System.FilePath
  • from process

    • module System.Process
  • from random

    • module System.Random

Hydrogen.Prelude.Network

FAQ

How is some of the magic accomplished?

Mostly with XTypeFamilies and XStandaloneDeriving.

So this works only with GHC?

Yes, for now at least.

What is hydrogen

https://www.youtube.com/watch?v=rbBX6aEzEz8