| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Bio.Prelude
- module Bio.Base
- module BasePrelude
- type Bytes = ByteString
- type LazyBytes = ByteString
- data HashMap k v :: * -> * -> *
- data HashSet a :: * -> *
- data IntMap a :: * -> *
- data IntSet :: *
- data Text :: *
- type LazyText = Text
- data Pair a b = !a :!: !b
- type (:!:) = Pair
- decodeBytes :: Bytes -> Text
- encodeBytes :: Text -> Bytes
- class Hashable a where
- hashWithSalt :: Int -> a -> Int
- hash :: a -> Int
- class Unpack s where
- unpack :: s -> String
- fdPut :: Fd -> Bytes -> IO ()
- fdPutLazy :: Fd -> LazyBytes -> IO ()
- withFd :: FilePath -> OpenMode -> Maybe FileMode -> OpenFileFlags -> (Fd -> IO a) -> IO a
Documentation
module Bio.Base
module BasePrelude
data HashMap k v :: * -> * -> *
Instances
| Functor (HashMap k) | |
| Foldable (HashMap k) | |
| Traversable (HashMap k) | |
| (Eq k, Hashable k) => IsList (HashMap k v) | |
| (Eq k, Eq v) => Eq (HashMap k v) | |
| (Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) | |
| (Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) | |
| (Show k, Show v) => Show (HashMap k v) | |
| (Eq k, Hashable k) => Monoid (HashMap k v) | |
| (Hashable k, Eq k) => Semigroup (HashMap k a) | |
| (NFData k, NFData v) => NFData (HashMap k v) | |
| type Item (HashMap k v) = (k, v) |
data HashSet a :: * -> *
Instances
| Foldable HashSet | |
| (Eq a, Hashable a) => IsList (HashSet a) | |
| (Hashable a, Eq a) => Eq (HashSet a) | |
| (Data a, Eq a, Hashable a) => Data (HashSet a) | |
| (Eq a, Hashable a, Read a) => Read (HashSet a) | |
| Show a => Show (HashSet a) | |
| (Hashable a, Eq a) => Monoid (HashSet a) | |
| (Hashable a, Eq a) => Semigroup (HashSet a) | |
| NFData a => NFData (HashSet a) | |
| type Item (HashSet a) = a |
data IntMap a :: * -> *
Instances
data IntSet :: *
data Text :: *
A strict pair.
Constructors
| !a :!: !b infixl 2 |
decodeBytes :: Bytes -> Text Source
class Hashable a where
Minimal complete definition
Nothing
Instances
Class of things that can be unpacked into Strings. Kind of the
opposite of IsString.