[Remove the hoogle copy -- we'll use the version on hackage instead Spencer Janssen **20080414233728] { hunk ./scripts/hoogle/wiki/Hoogle.html 1 - - - - - - -Hoogle - The Haskell Wiki - - - - - - - - - - - - - - - - - - -
UserPreferences
-

Hoogle

- - - -
- - - -
-

Hoogle

-

-A Haskell API search engine, written by NeilMitchell. It allows you to search by either name, or by approximate type signature. An article is being written for TheMonadReader, which will include some technical details. -

-

How to use Hoogle

- - -

Examples

-

-If you wanted to search for the standard prelude function map, you could type into the search any one of: -

-
map 
-(a -> b) -> [a] -> [b]
-(a -> a) -> [a] -> [a]
-(Int -> Bool) -> [Int] -> [Bool]
-[a] -> (a -> b) -> [b]

Todo

-

Admin

- - -

Short Term

-

-i.e. before Hoogle3 goes public -

- - -

Medium Term

- - -

Long Term

- - -

Hoogle Suggest

- - -

Bad Searches

- - -

Higher Kinds

-

-The following searches are all wrong because Hoogle doesn't understand higher kinds, i.e. Monad's. -

- - -
- - - - - - - - rmfile ./scripts/hoogle/wiki/Hoogle.html hunk ./scripts/hoogle/wiki/Keywords.html 1 - - - - - - -Keywords - The Haskell Wiki - - - - - - - - - - - - - - - - - - -
UserPreferences
-

Keywords

- - - -
- - - -
-

Haskell Keywords

-

-This page lists all Haskell keywords, feel free to edit. Hoogle searches return results from this page. Please respect the Anchor macros. -

-

-Some of the material below is taken from [WWW]the Haskell 98 report. -

-

-

|

- -

- -
-safeTail x | null x = []
-           | otherwise = tail x
-
-squares = [a*a | a <- [1..]]
-
- - -

- -

-

-

->

- -

-

-Please write this -

-

-

<-

- -

-

-Please write this -

-

-

@

- -

-

-Patterns of the form var@pat are called as-patterns, and allow one to use var as a name for the value being matched by pat. For example: -

- -
-case e of { xs@(x:rest) -> if x==0 then rest else xs }
-
- - -

- -

-

-is equivalent to: -

- -
-let { xs = e } in
-  case xs of { (x:rest) -> if x==0 then rest else xs }
-
- - -

- -

-

-

!

- -

-

-Whenever a data constructor is applied, each argument to the constructor is evaluated if and only if the corresponding type in the algebraic datatype declaration has a strictness flag, denoted by an exclamation point. For example: -

- -
-data STList a 
-        = STCons a !(STList a)  -- the second argument to STCons will be 
-                                -- evaluated before STCons is applied
-        | STNil
-
- - -

- -

-

-to illustrate the difference between strict versus lazy constructor application, consider the following: -

- -
-stList = STCons 1 undefined
-lzList = (:)    1 undefined
-stHead (STCons h _) = h -- this evaluates to undefined when applied to stList
-lzHead (h : _)      = h -- this evaluates to 1 when applied to lzList
-
- - -

- -

-

-

::

- -

-

-Please write this -

-

-

_

- -

-

-Patterns of the form _ are wildcards and are useful when some part of a pattern is not referenced on the right-hand-side. It is as if an identifier not used elsewhere were put in its place. For example, -

- -
-case e of { [x,_,_]  ->  if x==0 then True else False }
-
- - -

- -

-

-is equivalent to: -

- -
-case e of { [x,y,z]  ->  if x==0 then True else False }
-
- - -

- -

-

-

~

- -

-

-Please write this -

-

-

as

- -

-

-Please write this -

-

-

case, of

- -

-

-A case expression has the general form -

- -
-case e of { p1 match1 ; ... ; pn matchn }
-
- - -

- -

-

-where each match is of the general form -

- -
-  | g1  -> e1
-    ...
-  | gm -> em
-     where decls
-
- - -

- -

-

-Each alternative consists of a pattern pi and its matches, matchi. Each match in turn consists of a sequence of pairs of guards gj and bodies ej (expressions), followed by optional bindings (decls) that scope over all of the guards and expressions of the alternative. An alternative of the form -

- -
-pat -> exp where decls
-
- - -

- -

-

-is treated as shorthand for: -

- -
-  pat | True -> exp
-  where decls
-
- - -

- -

-

-A case expression must have at least one alternative and each alternative must have at least one body. Each body must have the same type, and the type of the whole expression is that type. -

-

-A case expression is evaluated by pattern matching the expression e against the individual alternatives. The alternatives are tried sequentially, from top to bottom. If e matches the pattern in the alternative, the guards for that alternative are tried sequentially from top to bottom, in the environment of the case expression extended first by the bindings created during the matching of the pattern, and then by the declsi in the where clause associated with that alternative. If one of the guards evaluates to True, the corresponding right-hand side is evaluated in the same environment as the guard. If all the guards evaluate to False, matching continues with the next alternative. If no match succeeds, the result is _|_. -

-

-

class

- -

-

-Please write this -

-

-

data

- -

-

-Please write this -

-

-

default

- -

-

-Please write this -

-

-

deriving

- -

-

-Please write this -

-

-

do

- -

-

-Please write this -

-

-

forall

- -

-

-This is a GHC/Hugs extension, and as such is not portable Haskell 98. -

-

-

hiding

- -

-

-Please write this -

-

-

if, then, else

- -

-

-A conditional expression has the form: -

- -
-if e1 then e2 else e3
-
- - -

- -

-

-...and returns the value of e2 if the value of e1 is True, e3 if e1 is False, and _|_ otherwise. -

- -
-max a b = if a > b then a else b
-
- - -

- -

-

-

import

- -

-

-Please write this -

-

-

infix, infixl, infixr

- -

-

-Please write this -

-

-

instance

- -

-

-Please write this -

-

-

let, in

- -

-

-Let expressions have the general form: -

- -
-let { d1 ; ... ; dn } in e
-
- - -

- -

-

-They introduce a nested, lexically-scoped, mutually-recursive list of declarations (let is often called letrec in other languages). The scope of the declarations is the expression e and the right hand side of the declarations. -

-

-

module

- -

-

-Please write this -

-

-

newtype

- -

-

-Please write this -

-

-

qualified

- -

-

-Please write this -

-

-

type

- -

-

-Please write this -

-

-

where

- -

-

-Please write this -

-
- - - - - - - - rmfile ./scripts/hoogle/wiki/Keywords.html hunk ./scripts/hoogle/wiki/LibraryDocumentation.html 1 - - - - - - -LibraryDocumentation - The Haskell Wiki - - - - - - - - - - - - - - - - - - -
UserPreferences
-

LibraryDocumentation

- - - -
- - - -
-

Library Documentation

-

-This is a folder for documentation of every function in the Haskell world. It will be used by Hoogle when someone searches for a function. -

-

Naming

-

-In order to find things unambiguously, its necessary to put things in every specific places. To give an example: all the documentation for Data.Map should be placed at LibraryDocumentation/Data.Map. Every function should have an anchor defined, for example insert would be on that page with #v:insert as the anchor (this is to be compatible with Haddock). -

-

Pages

-

-

- - -

-
- - - - - - - - rmfile ./scripts/hoogle/wiki/LibraryDocumentation.html hunk ./scripts/hoogle/wiki/LibraryDocumentation_2fCPUTime.html 1 - - - - - - -LibraryDocumentation/CPUTime - The Haskell Wiki - - - - - - - - - - - - - - - - - - - -
UserPreferences
-

LibraryDocumentation/CPUTime

- - - -
- - - -
-

CPUTime - Library Documentation

-

-Part of the LibraryDocumentation project. -

-

-A standard Haskell 98 library for measuring elapsed CPU/Processor Time. In the hierarchical libraries this has become System.CPUTime. (Haddock) -

-

-

cpuTimePrecision :: Integer

- -

-

-This is the precision of the result given by getCPUTime. This is the smallest measurable difference in CPU time that the implementation can record, and is given as an integral number of picoseconds. -

-

-In the hierarchical libraries, this has been moved to the module System.CPUTime. (Haddock) -

-

-

getCPUTime :: IO Integer

- -

-

-Computation getCPUTime returns the number of picoseconds of CPU time used by the current program. The precision of this result is given by cpuTimePrecision. -

- -
-> getCPUTime >>= \x -> print x
-296875000000
-
- - -

- -

-

-In the hierarchical libraries, this has been moved to the module System.CPUTime. (Haddock) -

-
- - - - - - - - rmfile ./scripts/hoogle/wiki/LibraryDocumentation_2fCPUTime.html hunk ./scripts/hoogle/wiki/LibraryDocumentation_2fIx.html 1 - - - - - - -LibraryDocumentation/Ix - The Haskell Wiki - - - - - - - - - - - - - - - - - - - -
UserPreferences
-

LibraryDocumentation/Ix

- - - -
- - - -
-

Ix - Library Documentation

-

-Part of the LibraryDocumentation project. -

-

-Controls indexing, typically used in conjunction with ?LibraryDocumentation/Array. -

- -
-module Ix ( Ix(range, index, inRange), rangeSize ) where
-
-class  (Ord a) => Ix a  where
-   range               :: (a,a) -> [a]
-   index               :: (a,a) -> a -> Int
-   inRange             :: (a,a) -> a -> Bool
-
-rangeSize :: Ix a => (a,a) -> Int
-rangeSize b@(l,h) | null (range b) = 0
-                 | otherwise      = index b h + 1
--- NB: replacing "null (range b)" by "l > h" fails if
--- the bounds are tuples. For example,
--- (2,1) > (1,2),
--- but
--- range ((2,1),(1,2)) = []
-
-
-instance  Ix Char  where
-   range (m,n) = [m..n]
-   index b@(c,c') ci
-       | inRange b ci  =  fromEnum ci - fromEnum c
-       | otherwise     =  error "Ix.index: Index out of range."
-   inRange (c,c') i    =  c <= i && i <= c'
-
-instance  Ix Int  where
-   range (m,n) = [m..n]
-   index b@(m,n) i
-       | inRange b i   =  i - m
-       | otherwise     =  error "Ix.index: Index out of range."
-   inRange (m,n) i     =  m <= i && i <= n
-
-instance  Ix Integer  where
-   range (m,n) = [m..n]
-   index b@(m,n) i
-       | inRange b i   =  fromInteger (i - m)
-       | otherwise     =  error "Ix.index: Index out of range."
-   inRange (m,n) i     =  m <= i && i <= n
-
-instance (Ix a,Ix b) => Ix (a, b) -- as derived, for all tuples
-instance Ix Bool                  -- as derived
-instance Ix Ordering              -- as derived
-instance Ix ()                    -- as derived
-
- - -

- -

-

-

index :: Ix a => (a,a) -> a -> Int

- -

-

-maps a bounding pair, which defines the lower and upper bounds of the range, and a subscript, to an integer. -

- -
-> index (10,15) 12
-2
-
-> index ('A','Z') 'Z'
-25
-
-> index ((1,5),(6,10)) (3,7)
-14
-
- - -

- -

-

-

inRange :: Ix a => (a,a) -> a -> Bool

- -

-

-Returns True if a particular subscript lies in the range defined by a bounding pair. -

- -
-> inRange (1,5) 3
-True
-
-> inRange (1,5) 12
-False
-
-> inRange ((1,5),(10,12)) (7,8)
-True
-
- - -

- -

-

-

range :: Ix a => (a,a) -> [a]

- -

-

-The range operation enumerates all subscripts. -

- -
-> range (3,6)
-[3,4,5,6]
-
-> range ((1,3),(2,4))
-[(1,3),(1,4),(2,3),(2,4)]
-
-> range ('e','i')
-"efghi"
-
-> range (('a','b'),('c','d'))
-[('a','b'),('a','c'),('a','d'),('b','b'),('b','c'),('b','d'),('c','b'),('c','c'),('c','d')]
-
- - -

- -

-

-

rangeSize :: Ix a => (a,a) -> Int

- -

-

-TODO -

-
- - - - - - - - rmfile ./scripts/hoogle/wiki/LibraryDocumentation_2fIx.html hunk ./scripts/hoogle/wiki/LibraryDocumentation_2fPrelude.html 1 - - - - - - -LibraryDocumentation/Prelude - The Haskell Wiki - - - - - - - - - - - - - - - - - - - -
UserPreferences
-

LibraryDocumentation/Prelude

- - - -
- - - -
-

Prelude - Library Documentation

-

-Part of the LibraryDocumentation project. -

-

-Todo... -

-
- - - - - - - - rmfile ./scripts/hoogle/wiki/LibraryDocumentation_2fPrelude.html hunk ./scripts/hoogle/wiki/backup.bat 1 -REM First get the library docs -wget http://www.haskell.org/hawiki/LibraryDocumentation --html-extension --recursive --level=1 --include-directories=hawiki -copy www.haskell.org\hawiki\LibraryDocumentation*.* . - -REM And now specific hoogle related pages -wget http://www.haskell.org/hawiki/Hoogle --html-extension -wget http://www.haskell.org/hawiki/Keywords --html-extension rmfile ./scripts/hoogle/wiki/backup.bat rmdir ./scripts/hoogle/wiki binary ./scripts/hoogle/web/res/bot_left.png oldhex *89504e470d0a1a0a0000000d49484452000000070000000d080000000040a22b69000000046741 *4d410000b18f0bfc6105000000324944415408d72dc63111c030100330c3e81541c6e229e94079 *08ca104f52c0fc815949494949c977c97eae1a8d4603f67b00f3642a3ba8e46eae000000004945 *4e44ae426082 newhex * rmfile ./scripts/hoogle/web/res/bot_left.png binary ./scripts/hoogle/web/res/bot_right.png oldhex *89504e470d0a1a0a0000000d49484452000000070000000d080000000040a22b69000000046741 *4d410000b18f0bfc6105000000314944415408d72dc6311100200c04c193c1a080123d988e9448 *388a7cb5cb6b55e1f43821212119b9c3aa6030186497aa1f86ec2a3b1398f3240000000049454e *44ae426082 newhex * rmfile ./scripts/hoogle/web/res/bot_right.png binary ./scripts/hoogle/web/res/haskell_icon.png oldhex *89504e470d0a1a0a0000000d494844520000002800000026080200000039964e4a000000097048 *597300000b1300000b1301009a9c180000000774494d4507d50a1c0a11026e1810500000001d74 *455874436f6d6d656e7400437265617465642077697468205468652047494d50ef64256e000000 *06624b474400ff00ff00ffa0bda79300000b07494441541819a5c1698c9de75906e0fb79deef7c *e7cc997d3bb37ac64bc65b3c76bcb669159a18ab521d22b60a54280920102250961f0dfc401014 *950aa4b094a2502a053505da9208d594260187b4719a7a4bbc8db3d4ebcc7832fb7a66cefabdef *73334e18eaaa494495eb1292781f486fa4d3083709fedf14efcff24af92fffec1f82f706c38f42 *f1fe646bd22f7cf3d4239ffa4261a1881f4584f74210142129c0d1679e3ff9fc1b0e6610ef0304 *ab3c2c8ae2fffccaf9c599c77ef50fef1ddcbb9554118808de538477478242010239323f7b6cfc *ea99f9116fe58a571f8c3451cd38b758982d1653afcd8cbcb23016cf35f43775679ce22d040582 *7712e19d9014020218c616e6ffedc2e9b363238b9654075b0be5b2f762662405a832cc3c5769ff *4053eb27375fb585f2e8ebedd33776756ee86fcac55001a0784742123f8434a154c06787ce7ef5 *e513532b85c272b9ec93e0a174904011800052653f73e572c3f6adce49261d77b6360c6ee8ded8 *d5b1a1b6f940dfe66c14ab08de8990c40ff1e6ab213cfaec334fbff66aa9544e12033482251aa5 *cba5a0cea5231101b18a8091149010a2261dddd6ddb667c7a6fe86a61fef1f6ccca429aa000828 *012144214212b732122859f29923fffe8d0b43d5c42b5515aae2604bdf39dd3c99dadab37dacbd *52196886a8a98162e05b6006239092f5ad0d1fdcb365536bd3c1be9dade9bae0ccd1541c4d2014 *11c51a8230124c847f7ee4c893a75ff6c54409e7c4a9a4549291b1d2b1c970adf9cd73c503c5cd *6e74466349234aa9a45422d548c5393a154dc2b599b9632787be7775e29be74fad844ae455e808 *96abc59999c94aa5120104488ac11408c0d1572efceb4ba782334dc59113278c449ceacc95e152 *2a3fd97f713664dffcf650f79e8d7a1b1939859819058100a9a01701dde47cf99f1e7ea23f74e7 *be507f68df1d4289cc3dfe374f3ef3c4e93ffdc75f571021548f3d7f7c627432908552f9338f7d *b1bab090d6b806a994d00922914884c572fb5d9bb7ddffb35b7fe5636e7fe3d8e58b3693571555 *75ab5453ea2289549d13e71406ef7a5a0b93e1f8b173e38b790503936f3cf562b631bd63e7f6c8 *806f3d7be24f7eedcb073fbaf38f1e7ff04bfff2f5e4ebf9ed83bdd73b286a22b1133a754eb5ef *f03da938251aab70dd87779f3d7dbe63642adddd0ed00833100255a1119632f58a78536ee6db43 *578fe5fe397364677bcfc2ecf2ece5c2bd9fbe3b9d494522e81fe8cdb455eafa6a8ad5cad74ebe *34999acc572ca3eba111449c8aaaa86a5cd720aa9144743e5d5b57bbbe377f7dacfdce9d5e11c0 *802026800002411021d53251757d7ae2c595abdf79f1486025b0a3b9fdee9fd80f2012d86d9b37 *3c77e1cb8176f4e4a9d950a8fdb9c1a82e2b2e86221238712aa2a0ae72ea40274297ce36d5b5e6 *9bfdd4a2eb6953065531d019298e80c18414d5ecb6b6a5ebb3bbefdf71e867f6ffedfd8f750e74 *6ddb314088c254a8222682a7cf9c0912b9589d1835c4444c55151571aa4e2512712aaae9b42f2e *9c9bde54bb275e624ae97495a88aae82a8881371aaa29a5dd7baece60b6f96a716a72b0bee233f *b957050244d46024020d3a7471c82943a42a2e052a2c442e165188138d449d885355271317cea7 *979b9215692dd6170c8946542f34aa184988892828109f89b0a576fcecf87f5526ebeaeb0fdd77 *a7880050102397defcf85dbfffb9cf7e6d7a7e118590796a3477be9032a5a88308e46d2aa2a22a *920e1c3d71a541baa666c656de9c2bce2d47a29188aa8840050211884204504abc39979f5b9c78 *7169fb81f53dfd5d04082884572f8d5e3a37fddcb3df4d4290955269ac581a2d3a33a84228802a *5404a2ab9cc8c2c848e946d29869d6e6e27f9f7d6a6574122e289c420422500104804044826aaa *bb6931bb9c4dd7fdd87dbb5420100122400f1edefff9230f5623f9cdcf7f0eeb3ae5e349a1a136 *9572350651a33881e06d42810d1fbfd8127a73eb5a165b875bac63fed2f5ee7ddb125550042220 *fe9708100729396db86fe3865ce7b683db850e82550aa86ae6ee431f59d7dfe7121f99d5f6e65c *6b96908a0b41150041002604e9174bd3e727eaa35cb60b355b5a3b776f5b1a9b589999131a4882 *789b601581724447b8beb6bebbb7a4ead2582558a502118108b3d91a61f0e62b0a8a2a99324426 *584521014aa05c39fd4a9dcfe55a73733ad136b0a17bdb6df95271e5c694c108023421a14a0081 *40da8b010e514ad34aa180c42ac54d02b8ae5c47d639498c34ae020d6230ae321a2146a926d3a7 *2e3548474b6f7da553434de41aeb6b724df3974735042f2405268405d000825e4820ed34934a35 *d66401086e52ac49896eeaedb552813e313312461a493080a479b1f1a13764bebea5a12d1f4f37 *6deb4d182c48cfed9be76e8c1766161898003ea94aa5e24150b80a0499cd448d71aa395b8f358a *5bdcb9670f8a252d27461234d048230d0c24124e9e18caa2bbb3bb75a561519a9a7cf025b1b6db *072af962e9da74a04908c3cf1c9d3f7311c16842c0401169acafcd3536c61a510410008a35021e *befba04b2abe9087314060128840d28287e427c60b23d5f64ca7352ea537e6aa96d033f8e01ad2 *515b5bfa9a4fce8ecd9e3a6f57e73292155aa01941639c8a3a5b9a069a3b55e00011ac52fc1fc1 *a6fefebd5bb6319f0fd5a2ad2248c21800043f71f2620b7bda3a5a26d34b514fab9955c80a59b5 *a87957dff8eb733d97dbfb2faf3fb0ee70521325a0c11848b0be36ee6a69d9d8dc815b28d61088 *557ffbfefbddca3217972cf19ef4a4199340bfbc3cfbea7815e51ba573a14b4b8aaa593504f349 *309f1bbc6dae6ee6f499972f5f7dfd8dca90eb6f37a36708602ad29e5ccb87fa36d6c56911c19a *086b0422e0813beeb867efbea3af5e44b65eea1b00173408e103bb0f6d11a62a29360c749a2795 *20051a4089b3fd9fd83f75eeb247b9637057259b725ebcd0c4daeaebb77675ededdd6880c3f709 *49ac2169e4f8eccccfffd68353eae2ae1eadcdaaa62271a22116a888426e5201042000de04a379 *a668c18364d987c8ccd765e2c10d3dbffbd17b77e43aa1a210ac51dc424414d2d3d6fed94f3f54 *5f2cf9e929148af4956025784b8cde9018bd310921093e314b8225c6c42c18cc2adeca0c95c49c *b18c18b9f6fa9fdab5fbf65c27044adc4af183444555efdab7ff2f1e7a28bdb4589a194fce5eab *1ebd16164ade2cb1e069898524046fc107efcd82d19b2566d15271eec9a1eab5a9e04332b92c47 *2e7fc0b51eba7d9700220a11dc4248e22da4bd7ee17b47ffe364a4318855df3df3ca99d75fab94 *aa6e226eebea5dd961dcd61145a046020a2002a31206d2e090144bcf5dabb90e97cbba9d99814a *ddf089e9bdf76c7de0773eb6ef83bb449c88628d7bf8e187f116838d0edf38f1c2b9c242716169 *716569b93e5b3bb06e7d2ac2747136ef96a32bd5787a39698b7d46c56090400946030369de1bc5 *6f68b501975929e0a5ca810f6ffe83bf7ae0c5678f7fe5af8fd39577dfb955c4614d84350a3435 *356cddb1c9a9022a781bb7eeda50df517bfafc50a9900fa329e95f08a88638128d204e680618a9 *20346ecb460dd335f9b1855473baa7bff3f9a78f5f3c37dad2dcbc714b27e0708b086b08999d5a *3cf1c2f9d86a0d5513c14dac2c97cf1cbbd294ee3df889c1a6dd8d27862f0d8f8d17215487c821 *d2388afa3abbf66edebcafafff91071e2d1653bff4a9c31fba6bf0377ee191a674c3effdf1277f *fa170f65b235821fc4f7e42d79fcb1270eeffbe513df7a25846066de422149ae4f4ebe36323c34 *7cfdf2e4c462b9948455493ebffc778f7e71713eef831fbe7aed4b7fffd5e24a81ef4248e2dd11 *56ad243e546b32b1488cef230840825000c15b6826a67002013c291055717827ff0370407f7f5d *a9d9150000000049454e44ae426082 newhex * rmfile ./scripts/hoogle/web/res/haskell_icon.png hunk ./scripts/hoogle/web/res/hoogle.css 1 -/******************************************************************** -* GENERAL ELEMENTS -*/ - -body { - margin: 0px; - font-family: sans-serif; - padding: 3px; -} - -a img { - border-width: 0px; -} - -a:hover { - background-color: #ffb; -} - -/******************************************************************** -* THE TOP -*/ - -#header { - width: 100%; - font-size: 11pt; -} - -#header a { - text-decoration: none; -} - - -/******************************************************************** -* THE BOTTOM -*/ -#footer { - text-align: center; - font-size: 10pt; -} - - -/******************************************************************** -* HEADING SEARCH -*/ - -#heading { - background-color: #eee; - width: 100%; - padding-left: 5px; - padding-right: 5px; - margin-bottom: 10px; -} - -#heading #count { - text-align: right; -} - -#heading td { - font-size: 12pt; -} - -#heading a:hover { - background-color: #eee; -} - - -/******************************************************************** -* HEADING TEXT -*/ - -#logo { - float: left; -} - -#logo a:hover { - background-color: white; -} - - -h1 { - margin-top: 15px; - margin-bottom: 30px; - padding: 2px; - margin-left: 170px; - font-size: 14pt; - color: white; -} - -h2 { - font-size: 14pt; - background-color: #eee; - padding-left: 5px; -} - -/******************************************************************** -* RESULTS -*/ - -#select { - margin-top: 15px; - text-align: center; -} - -#select .active { - font-weight: bold; - color: black; - text-decoration: none; -} - -#answers form { - margin-bottom: 30px; - padding-top: 18px; - padding-left: 4px; - margin-left: 170px; -} - -#results { - padding-left: 10px; -} - -#results td { - font-size: 11pt; - padding: 0px; - margin: 0px; - border: 0px; - color: black; -} - -#results td.mod { - text-align: right; - font-size: 8pt; -} - -#results td.fun a { - display: block; - padding-right: 3px; - color: blue; -} - -#results a { - text-decoration: none; - color: black; -} - -.func {color: black;} - -.c1{background-color: #fcc;} -.c2{background-color: #cfc;} -.c3{background-color: #ccf;} -.c4{background-color: #ffc;} -.c5{background-color: #fcf;} -.c6{background-color: #cff;} - - -#suggest, #lambdabot { - padding: 0px; - margin: 0px; - margin-left: 10px; - margin-bottom: 5px; -} - -.name a, .name { - color: #b00; - font-style: italic; -} - -#failure { - margin: 25px; - padding-top: 5px; - font-weight: bold; - border: 2px solid gray; - border-left-width: 0px; - border-right-width: 0px; -} - -#failure ul { - font-weight: normal; -} rmfile ./scripts/hoogle/web/res/hoogle.css hunk ./scripts/hoogle/web/res/hoogle.src 1 -#---------------------------------------------------------------------- -# Hoogle Search Plugin v0.1 -# Author: Mike Dodds - - - - - - - - - rmfile ./scripts/hoogle/web/res/hoogle.src binary ./scripts/hoogle/web/res/hoogle_large.png oldhex *89504e470d0a1a0a0000000d4948445200000126000000640802000000a4410a5e000000017352 *474200aece1ce90000000467414d410000b18f0bfc6105000000206348524d00007a2600008084 *0000fa00000080e8000075300000ea6000003a98000017709cba513c000026bf4944415478daed *5d097c5355d6efc6ae8020b81b1d151dfd70573aa3cc3733eae7383aeae7a7a3cce8a033eaa833 *6eb800b28850a040d9cabe94a54017baa649d3b44ddbb4054adbec49d3b469489774cbd23dcdfe *f29d50064bc93b79592a33e59ddff9f9abe1ddf3cebdf7fcef3df7dc73ef0b73d344134d3f2185 *d14d40134d34e468a289861c4d34d144438e269a68c8d144134d34e468a289861c4d34d190a389 *269a68c8d144130d399a68a289861c4dffbe64d2b812ffd29af155276f53d79903bdb22c7373b5 *bdeb1cd1ab232c3d84d346438e269a424a763311fb84fac33001f0df87385cf051b8e0f36b244b *6e51ac7f44ddd3e2a22177c5c8e5705bfb089783a02d752c116795e1ef17f17619b337f47675d1 *901b65220818fcdc7d6d84b1dea5e25aceecefcd5d6938bc40b7e3596d5cb4a6b7d5459be958a2 *56b1fd1f51c28fc2045e79d37cad5040436e3429fb2be3a6799a55f7d42e9a26fd3842f071f825 *1df0f54c596591cb60a00d75ec90c346c43e5a4f06b92fae9170939d361b0db951a3cdd19a8fc3 *0464fcf50c19f3b8aba98936d4314579ab0c48a71ff9bcabb59586dc6842ee933001197f43436e *2c924e68ff6c8288acd3639fd45457100441436e28a4e1241c16a2bfd305ad264d1b288fef0d32 *bcb10585dcb734e4c622d907894d8fabc93a7dd11431eb90dd6ebf2a2107238d6d80e86f27b4a7 *ada2e47ef652fd91375b62e7d62dbb51fe5994f01f6182b5f7d5193b89605a07200772c878310d *b9b1486057dc1f0c48bf1ffec4d4dc7455420e46a35dbf695c3243f6c578d13fc3049733402e2b *9de8ee0efcad5ba3355e250f310db9b14a2dd5b645934464fd1efbb0bae214715542ceecfe81a1 *fc344c40c621811c227f090db9b1ea5b9a89cd8fabc9fafd8b2821eba0dd62b95a21f75998808c *d7050db96dd11a44fe521a726397f2571990ae4f784f7feedc5509b9d50ce5e76102325e1f34e4 *b6476b10f9dfd1901bbbd426b62f1a2724ebfab5f7aa4e978cf1b8a577c8ad6128bf80899e8463 *43013944fe321a7263971c5662cba3f5645dffd5386176bcb5bfffea83dc5a867211c46d497843 *d090db11ad41e42f1f8b90f3c481cd444fb34b576dab2fb0d4b206811b8a2d863ac7a0e927ca29 *85fc554bb7478776a95d5feb80a0b4b5ff0a4c2985ab0c48ef1f78abbdbefeaa84dc5730e490f0 *c650400e91bf627420671f745b7a3d6ceb879dc69fae890151d2d4fed485ad5b1fa95f719d74c9 *44d13791c2a19a7e1b25fcee5ac9ea9b1509bf6f2cdbdc65543b0917311a6837699ca59bba0efc *8f36e6b69ae5d3a54b278bbfbb46bc628634ee0155ca3bba5a9619b6857eb2066915da174f1091 *f57ecc9dcad2fcb1ec5b7a87dc3a86f26b48bc22e14d41436e67b40691bf321490834e83b3582d *55f6f22d5d490b74bb7ea989bb5f15736b0d70ec5dcaf8c7d4475f6d2e5a633cc7b75a7b89d1e8 *6190d9a575b2beec587babe29b700152df8bbcec1af1b1d79b611a84dc835081ada7d999f161db *8a6912e4bda0ded607ebe469fd4e1b317c4accfe44bfe38986fdcf68818fbfd192fc671d88622f *eac8fda6b36c7337b888818e7d44fce36a3265be8d10a4c59afbfaae32c8c53294df42e549382e *68c8ed8ad620f25705073970d2c071caff4ebff1eeda255142e445c08b230471f7d616ac307437 *3a43883b9834ca3699626e92e36ff7cacba78899ff6c371b823d4b01b85564f4afbd4541f1bd4b *228569efea06f417deebb4bb0fbda0257b78fdedcaf6667760e91084cb9dfed75644937d7fd029 *95c4d505b90d0ce562304712de1c34e476476b10f93f040139a3da91b650b7f21a0922df2bafbb *495e1e670a897fd5ad751efa9f734bc205feea7091978409e21fae6b93d882c15bd946d3f28922 *7f5fbde797ea5e9d730872875fd0923d167bbb32fba4db680c4437f03e36df5b8be81073a3bc98 *35667d4bef90dbc8502e85fd3112de1234e4f6446b10f96b02821cb82b60646b664a11c93e79df *d30d26b523e0ce8682dad2c14d77d604a3c3455e77a3bc3ecf1c80e9c182b06c8371594480efdd *f5647d5fbb132077e4052dd9331b83805c43a1e53b5fbaa5afee3799462180e4246069dd2e71a8 *d8839213fd95bb7b6429fda04fbbd4d1dfe102bffa27c0b977c8c53194cb606941c2db8286dcbe *680d223fc67fc8f5b638935e6b5a1e2e40c452e4b83b6a9a4e59026bfa960acbfad9b2e075f8b1 *29ae936af8167f61af48ebff7ea22898f726beda64ee26125fd0923db02908c8313f6cf3a9c0be *e79a65d29006b1ba0859727ff2ebcd1b6fad5919251cf1ba1551c2d81be4fb7ed1c0fda653c3b3 *c03cfc53436e3343b91c1615241c12c821f2d7fa09b92e8d63c75c1522d05fde78b3bca5d2ea6f *a53a6bec9bef5084508d21de74bba243e9a0ae06b4c6a65b82556345b880bbaaebc8f35ab207e2 *02851cec52c4dd5ee35381b5d7498b325d0e47084c1ce62ec9b1bef89fd7ae88a054f7efa384f1 *f7abf831c6be36d7684c7ade21b785a15c099143128e0f1a72fba33588fcf59421e7097fabed3b *efaf45a405c69b6fab319ef3632701c29e09f31b42aec6101f98afe9d553ea7ca79d4879ad3924 *2f5d375dba7d8e8ab47d02855c1d7bf0fb704a0aa47edba3d7076bdf7dadce94d79abe8f08a405 *e26e56546ceb82bcd09f0272db18ca55103924e11d4143ee60b40691bf8132e42cddae83d16a44 *54307cf8196d7f17a5e606e4f396ea47490de01fc205395f1bed36dfca9ce359564709474f938b *bc3520c841ac326b612bc557ec7bea9c4810d4e2ca5867dff3a02ac89a263e73ae536e0be174e7 *1d72db19cad5610232de1934e412a23588fc8dd420079b019c4fda103941f29a0841feea6e0785 *3878bbd8be7e8a98a2d8cd3729f63cacdeff9476cf83eab81be4144b6dbc4e2ae1397c4e71c79e *d5529476e88596938b7bb3360e66ac1948fad0b8fb61f59a4821f5c6d91610e4063a5d5b6f5550 *7c45ec5449de3147c0be252ceff73ea80a892580cee77883a30bb91d0c650cacdd49783735c8c1 *c000a31ae4798029803f0d3ba7e07dc1b64f4f93ebe0e30d88fc380a9003e1aaac8175e384889c *8bbc71aa64ff939a232fe98ebdd57ef8b9e63d73ebd74f105129b879964c51e623800941b0ac3f *b5f814b5365cb0f7d186ccb5e6ec2422239dc8ca209859042bc5951933b0e711754cb86f65125f *d61950f7b2b5ca163b51e4538d03f3b5d9090ed0213bdb5d5aeaaeae760b85eef21222679379db *6d35549a05383e20c8d5a4f6af8d10507c0570caa7015e88029b3dc77eaba1fe229fbc699a44cd *318724a0e91d723b19cab5d03d24bce7deba9c14a2b3091c659749edec90d81bf99606ee605db6 *597ea2bf6a7b77e94a43e1971d791fb733dfd1a5bed498f8b4e6e043f5bbef56edbc43b9fd26c5 *e6e9d275110244fe160a90839852c263f58890218e9b2e4d7adfc03ceccc48776764b8592c3797 *ebce6311ac3db643cf36ad8f14fa9490f47687c9843574cb19ebc6c9625c48ec7851d28786cc93 *4466a6bbbcdc0d55eb85d4338bdb6c76c34566b53222e3637dec381fcac05bca52ed4e27e91854 *f079072e611ddceaf3b22e3395c8ca72cb649eb75fb21cb5bacf091d7bef57f96c13e01dfe430e *c6a6cc3f3653117e91f73fda5055e1ff1e09e13e1d6b5ae7cf8ba8f09699d2c6724bf0a0f30eb9 *5d0ce57a086390f0c609a29db72bb7cf926f9b21db3255b2699278c338616cb80029e2176ff505 *39a8b6787f8fcf37eebebf2e6ba70d86730ec75d53e3b172b8b6cde5f2e44c80b5359d23f29677 *6d1c2fc2856c992e3d93471ab9821d30ee27edb8840d51c294cfbb408ddc5c775b9bdbab289b85 *288d316e8814e2a28ebfd1d6aa2319d7fb8903ff55871787a93e33c905935b7bbb7735e0c70e99 *6de76d0a9f7db4cb7fc8f5e95cf137c8fdb204e89dbcc30e7f2fdb33d53bb6ce90e29263230407 *9fd4a47c6ccc8a3533b7583296f71d7fab7dd7cf6af1527bef53191a5da302b93d0ce506b0952b *c4db7d410e8248871eaac785ecbea736ebb0036636709cc8fa0cc6dd8a2d5d9ba284b8a8931f1b *3b3a4816271daeddb72af0e2c7ffd80e7883d97560c0472c9bb550878bda79b3a23ccfe5f2d6e9 *6dd5b6cd134548d9b809a2eced5698669b9bf129829027f66d8af4d126bbfd879cfc585f00c690 *f237835f3bb43008167ed6eec3c066c9337ee8cf4cf3381dd02f95956e8904ec84e07389f42fbb *b64e93206533de6d370717c3f40eb97d0ce526f05faf10eff005b9730596b8084c42fc0c69d65e *3be00d2637dc13807566ce9bcdb83efbefabab2cf7eec62b8ef7c7a16577dfa2c83eee0287b6a7 *87c2965a8373e7f532445a5cb8206bf5805751e2bd3d782d8e3ddf0cdef5d9b36e9fae11e4f11c *9fa7c6a5edf51372b0aacf78a9290063d87fafaaa2d48f3514cca5bb6f94a3b621cbda6105db28 *2971c326c470c9f037a4538bd20777ce26ed85ad93c45539f660dc4bef90dbcf506e019fea0af1 *ae19b21c72c8416d590b5a3009e182931f19616281a8808b821760543a765f2f43046e9f28cadd *6f1bb1f219a2dcb775785dd217756764107575541721e5cb0db8c0a4d75ae532e2f2a13defdd56 *bc60d69a017029a9201f48b4ab1b97b6df4fc8f5ea5c3ba749023086ad514276bcc56be37b25e9 *815edc363296f602de60e821cbc9865ea8cb1cd8364144da05afe8da5a430db9830ce53608045f *21de8342ce6c240edcaa408a1fb843999dec59bf515c03c0105af0411bae52faa75d1a8d97e5d3 *a1bb6ab18a5c2f631e751614b89d9437d50d0ac78e49624466c2dd2a5edec851dfb33df0881a29 *b577969c79cc05911b8ac373b7d6b57332a6c6413f2127dddf83483b3a17533ee5f536753d25bd *61a590f35a3322eaf083eaac5482c7f37106028630f69b2da4dd3a5356ce72ba5c21855c0243b9 *1d46f72bc47b51c8690b2c3b228548f1936f778207d5d8e8472b34975ae3c33195929e6f3e737a *a4a1eb658ef808acd489e7c09723d46affb2934efe4a83c8dc3549cc3eea1c71550124101ebcb5 *062995f88406962e978f1ac89ee78947d588c0047f20072342c6735a441a7b59ffbed972b27f3d *704b4d692ea5dcab41a38f76c8f8ac0ba638881ef93609be65c7385233cb5c1c78668c77c81d66 *2877c09aea0af17e1472153f1890b23b2304acdd7636dbbfa35cb08d73e46758958fcc51b1b346 *424e79ac0faf48d6373db0401ff46713155e716a891e179bb371704408c454efdc3d518414497d *ad2d33c34dfddca767e6ff6b2b22f0b03f9033d539f64d9320ddcd3aee3a315f4bdaa7e102e60f *fd545ce24ea96357a4904cceeef122e6766b7e3ea5a91e72418fdc496a12c9cf378b8444282177 *94a1dc0d2a06c6113ff29e48e19ea80bbc77bce8227bfe955cc24172c8c12a9cf37a3352366196 *3c27d9b38af36b810b16c67cbe115369a68c99e81a61b267571990227bc60999dbacb046f777a9 *5d9f3e80b770e6675db0ab76a9a9397d166132ddd47d21d0b972b51111788432e43c3b3adbbb11 *51c9f3b59e1d94afbb9067529e69ba7c057b39c120880839305d9a93e81289a8cef3ec979b48ab *cf50e66507b831ee1d72890ce55e70f048f8f06c79e6df0c598bba2ff057ddd9cbfab2975f6066 *ccc045ced966cd89bfc0ac434ef6e10b9cfc480322ff1039e4603a4a995b87944d7eac01bc4a3c *0eeed52cce2cd52362f74f10e5ecb1eb2edd13cb7bbd052992305dca4a22c462bfbba443683f30 *498c48ce58a83f75ea92224d4516e479e09c35034545fea9a14aea47042652869cd34a64fdb706 *1195f545176ccd3794d90f4c26ad75c234292fcde973495c1563c4ec6aa68c73d8592f252cddee *7f3161edf9916d7df0ed0df710db2deec285ad64a20e4c14b10e3860a73764903bce50ee073b23 *e1a4fbea60610013342c43f97c4fd210705999bba2c213081a629867603801069b53282eb052e9 *86cb9b80d39ed420f28f90430eda28f126055236fd251df87201b48574570f2216981d6f1d7ef3 *14ccb7acdf3522cf1f6328b35309ad3680e440d7911952bc8e8585974c9eeaf4014cf970016be3 *20f48e5fd4c4b320328f53869cb1c671688a984c4ec26471ce3e3b449860304d7ba41e79237351 *37d9eee8452afdb81d917020024c4b7a7496fce8ec0b9c78833ce967caa4bb2e70cacf55194fa8 *2ff231d4d2589b2c01742e29e49218ca83e04d9170caf91c4bf8d2ac278b32a0b935335a83c83f *4a0eb98176d7b15932a46ce68276d8040be04e8ebae47e44ec414f130f4aa5c34302ee9c5f9f43 *9e4ffe795d569a3b800f539a0d44225ac7f4df36413c7678be6f6d621ff27c428447794809f08b *74a76c88cc139421275c6fc26ce96175d64902fc6430a48ac59dc893a98f35082a7df872dcff6d *c63b3184ccfca27b847b1f14e49219ca04e82a124e0dfa244156b406917f8c1c723d5ae7b1eba4 *48d9ecf7f4608e0104701bb916442c302b664030ece3bae07b64cf5323cf9f7cac2133cd1d402b *59ba8813372910c9194f6b213e347c0b44b1af0779fed079c8f9ebe202e41099c9d4200701d8ac *27b056cafec00021c4a181a9b5dc7a285248f6e49109a2fc04bb153d399cfbbb46bc1343c8d9ef *1bce9c091de45219ca235049124e0b1a72cc680d22ff0439e4fa5a5c2766ca90b2ccf70d90c213 *0035155810b1c0ec3503901934cc98dcacf9582dd2212e9fee0ee0e261805ccacd0a4472e6d3da *9c1cf770e3ab39d08b297f1e7290d3e417b5145b119929d420a7973a8e8e139209393a5ec4da65 *83d4d3a12112f639d3eeaec53af75d7d13baf7c3fe8d16efc41072f69f3b8a8b4307b9930c6522 *2c9149383d68c8e5446b10f949e49003a72be506395296f94e27ac3003a086b401442c307bd325 *cb21389494f79c166ba5b9f5d9e96eea6913c337975266c910c9d9bf6d82f0e3f02fd4d425f6f9 *507ebdd95fc86973cc88c0931420074ea0709501119206bef7490216fc17ddc58a2f3bb097de5d *7ba618f32db9cf37e2ed1042662ee8c8cb0b1de4d219cae3b04426e1cca021c78ad620f253c821 *0761a5b49b1548d99cff6d0d6c9653eeeb41c402e76eb756555d624f05bf6f429e4fbbb336fb24 *11c02c075982a933a48864e68b3a58af0e9fe5ce31cdb8f2ece57d1483e33f462c0ff72102d329 *400eb2cf731eadc73a6b61277895c383226da76d27a28464cf9f8814e66e3023d9e1bc579ab176 *08179c18274c9a284a9a221ec1c9d3a46075233875963c75f6484e6328d3eef470ee4746989f43 *06b90c863209661b12ce0a1a72b9d11a44fe49749320e7813aa46cceaf1a2f3a2a7e6d1288571b *11b1c9e345ec3d7608c30e27fe9b2d582dceef1006d04a46b93d15ec805c32eb5dfd88bdfef6b3 *76e4794f910f0c1046f6ab41aa97ea1181191420d771d69602f64d262442907bdeab1c5e11fb00 *c17aa81eebdf9774aa5ad269aee21fed98ce77d772b65ac19585f8fe483ee204931bc9290433d5 *3d82210a3dc4303f871272590c6532d819093383861c275a83c84f23871cb873c5af342165b3ee *ace56413fe9eb0026785ffc716446c3aa874d409fb1cc349f4bd0129923a41c4de670f202da891 *6d4e09172092d99f77c14c3e7c58312a9d299142a408eb95567e09e15783f07edf88b5b32fc879 *bcca657a4442f67d1eaf1222522372f9f1564dbf5e56c2244dfe92ac352265336fad61a678764a *61b30ab2f0463064c381c98d60d8898549780443b007c2f5c01473c429412e9ba14c05a321e19c *a0219717ad41e467a0095f959f7620654f8e1771125dfeb685e7acda037588d8ecbb6a61601b91 *a35897d08b1401ce5dd94f3dadf147bb8931fa101b6781a4964bf64e3a5c99e0f69017613e50cf *c9f1235b02bc09e6cf6ab106f1053990903b176b52f642bdd77447bdc89e3e598c14e42ce925db *7ad1a40e607605c90989aec0eede0c2179875c0e38ac30db90302b68c871a33588fc2c147260e8 *4859e0dcaf7bfcbde9d9a472664c102132d9e71394476cc5c2c2232d1cd5e48fed22a17f9a402e *3cff95264466c66431a4ef0c5f550e6578e43e508794cabc46927bc4493ddbb3b5d48a572dc717 *e4dacf58d3c709c98aa783a31e6f05f7f8f2db841c16a2e0970d585f449f1393e4371ae58ef428 *f297822bbbceacd3516a013834e8f918581f11f28f3479871c8ba1cc80de25e1dca021971fad41 *e467a39033291d5993444871f6131a51957ff96fd2d546442030e713130cc9233685063a08e675 *52a454ce1dcad23cff34e96b763167ca1099acbb55e08f8d388007874d4ebdd5e2a30adff6b4b4 *50f52aab3e69c7a5b17c414ef87527561c4c289518becf399c14715d48d9cc89225ea2f7db1960 *9b21f7ee5acc745fd6c9a4048516703724f6654f93e4de535bf84b4de9abcd509d9a2d5ddaf481 *4ea1a35bed845bd603fe2c9977c8e532945930db90302768c815466b10f939e753cbc9200771b0 *fcb97548f1ec09a2c26d83d49773904496ff800a13385e94bbc306cba711e081f1aff0175845b2 *22049cb5037e052debf6f56002a1f15f6dbd7cbef598e906135e30f721b5b092929574291daceb *65b834360a398882e4cdc19a340fbcca743759025777839339458c15ff9bc16b1a2dc0a062a10e *29c89c2a294df67da61b66daa2a71a48854c1297fcae29e02b65bd438ec35032413409e7050d39 *5eb40691cf4621e719413fef408a0373e6d637a95cd44674774dac89198e498381131672c3b78f *2e92f8db4e1f9a3ca2ae5350ed1bd80229b85f85090c17e47ddf0f87bb2f1f50f4d5b69c4922ac *6c84a028a6cfeaebde7738db56f1a716bc529e7aa1906b2fb7c2ebc8cae68c17e6429a3b8bf4e4 *2e8c65fc67b5d8dbef559d25b99da131730079b5c77aa3357a9d8f1e6938d28b090917142ced81 *a4e2c03e82e71d72790c650e340d097383865c51b406919feb0b7206b19d05a9fde412804bfed2 *6e1d247c7a5046a18d73bd0c17c57dcf33247bbd50b1adc4c28a12e2c54b57f6d86c549c19a266 *9d1117957ba322e7980b3adb6bb882f7509d8fe2b728d4a7b16b396196506e30e644faa811701e *39e43cb1cacf3ab0b2f7d5c18e257ec04a7db01753204ac8dd3ce835cdc062220aeea9c5950727 *dcd2e522b9e38c682b3473664a91e29c7b54d9c9ae1199e5c1428ecb50b2c0e126e1fca021571c *ad41e4737c410ece32953da7452478385c20faa6d34efebd3868af2eb99d374789cbc98553d809 *8e11db47c33da8a247ea71099ceba475b93eee3f849e6e2f1ae44c95e0a2f25f03afd2ed350aea *d95a5cd4e9a34dc204850fd575d579bf0019623075f1ddb99084e54b0830971c72305717de5b8b *d5e2fc0e7867a78f356dde4c1926e40fba3a15e1b51d1431469ffaf3a3d52db96638ad43b87e9c *defb5b5c35eb4d9c69582fb0c70939b166d03fe04f8e7a875c0143990bd646c2854143ae245a83 *c8cff3053968565d9e99034b2c72211e8e109c7e5e6b92da2f0f3a8123ae3dde57708bdc878430 *41c11f74b07622cb96f2f8a5eb4c3e85e4df2c6f2b1a240ba4c0cf6d05830537fa508633c1b3a4 *84542f32e7b0e394d5f38c2f650aefa8693cd96f1df63d27b036f04bab16347320bdc357f10bcd *420eb9b6620b679c10e914ce6edb8893105e23b715af35230a7067c9f939de672ab3de0575f459 *0550b2e8dedaca052d820fdaaadf6b3df5bc367fb66f7bc87fc3734522381a4e67482157c85072 *402712e6050d397eb406919fef0b72433b69956f3423422e32778af8cc8b8d307eebf22d1d15b6 *a64c734d8c91ff687d5ea4d077d9a912f65e3bac9d10afbdafd159788bc2a7a8fc6b25f2e5fa7e *9d0b8ce9a2a1c0df309ccb16ebf3a7887d4a287ca6093a7bc4def18865d8e9df69a9b409d4bde8 *9eda8ad75b248b3a2b17e8f8f31ab81344540afea80c09e4a06e92cf3bb082f77a76c08514f64e *1a53fbf322301d0abeeb25f36c613cc5cb06c079d089bf69cc4a2120a73cb0c3a918e4780c2517 *0c8e848b82865c69b406915f4001729ec09ac2ce9b2d43e404cf05ef1bc0caf1632fd0c1b5eb4c *140516ce949d7db949fe9dbee67b837c891efe2e9c21a552301f36d676d9e0f434ded9ad05166e *847054db648879249083c9b3784e2dd6a4efea47e45592114c5645b7d5603accd3906dd0c1e823 *faa0951b1e526378ea5cf6712774416b1037ea9142ae88a1cc876e26e1e2a0215716ad41e41752 *831cd87a534a7fc17811222a18e63d589f9de41a9140ec7d9bc144f0e7d48e921a17dae41db8b6 *8c8063a6f89a10a2dba7ff5b139aeacf9223ff5a4402b976beb5205248560a3a8b136f85853195 *efe9c02a4bf47e2ba243c14451d1513bd96e90b5c775f6456d489a026a54f87f6d30bfc1850301 *a41351825c314359006f22e190400e91cfa306394faf3809c5327d418400911618f36648d9e7ef *7b0635a804a6da0b077953c42157e38232732f80df67fa08a8aa3f63e55d13ac26bc1be5fcbf9b *301b20819cf4cb0ea454d11c5536f90eb8976561a1a510eddcc2f7f4c83d3780baaa052d05e1c1 *3505787c2bfae0e6115845432ec1a87c060496499a84bed39f198a5e6d2d7ea6a9789ea6f81e55 *f10df2a2eba4bc49625ea4901f34e4caa3353ca80c091751869c6739642794df1b78e3848840bf *f95a49deda01c01bf59bc220bc5eb7dec88b1484528da1d6982963efb18132146fda004d6a96eb *79e141bc74bc88fb7d5fe117ddc83325de2007f15bfe3db59864cf5c4dc9abbcb0f3d14794cec1 *048265569460f93db64142baa5a7e86685df8d102e00b796f7ae9e99e482c687cb9a8231781f90 *1ba2da5a371c7a85940b36d30dbb28cc54026090bbd7ce8db3146cb164660405b953d19a223026 *122ef10772437b0675dbbb8ba74a1099d4b9f85a0977592f78717087925f77a8c05055f36d4751 *b820246a5c5066b2386fcdc0d0c74ca88faf108fad7eb931c097860b0aff0afb9004efcb6ee431 *be37c87594db90ea178f13e66dc376c0bd277f7ddd89691b292cd868c6cf0183135b7fd659fca9 *a9648eaa284ae8b3054a6e9097fcbab160496fce09170c1090080ad74c85e4abe53e2037e4a540 *ebc0cbc05d86901d9c438189b5a1c17357170cfff87764703af36b6d4994b03852581c21280e17 *14875dc27c3f213734b46b8bada50fd78f10e52f97cc96e7c50d7a0c8ee77b09e775d5aef8bac3 *53afe0d4b8a0cc143177795f00e0f72c2ff5aeb3f31bfc7e2900e68d36f8001d0043b6ae1b79b2 *f432c881b5c8bfec408af0ffe555fae59be92b6d25e3b0f62cf97d0b7282eea26e3ddd44f56922 *7f9fbdf0b3aee2ff6b2b9d77aef4e186d2fbeb4affabbef4d106fed3daa2051dbc7f9ab85b2ce7 *91e659b6810dc0cacddf836041416ef468a09d9096119c434eee366bc1ea0188f6162eea2efac0 *50fc663bffc596d2975b7392087fb71aa1590dadc499a55dfcdb6a4aa027fc64fe3861c9b34d2c *f8f863861b6e890c006f3f4eb9fb7b4b67cb02d0e1127d66c9b8310330ca824b139832837a57f5 *ebcd259142aa6f8474e1bfe961d1024170185e1bb675230f97c195812789e19083a4fbd3f7ab90 *22c57feea018ab1c1110aaf845037fb2983f5d5a3a53567ab3a2f4ae5afe436afe53e7f8cf34f1 *5fd4f1df37f23804c543c9301f028ae09a2070df72986e66a61b6e6183468638246c05415c073c *3b7028c08787192584df07bff2900302bf142aaf52793ee70973269c5986ed45a8305c69c8c9f5 *3487bfd7bf5ee878ab5b7edac5ffd454f6407d292c3bc1927c716994b0f4f186fc7566b036687a *98c383f422a0fb9b2aeca77edb583a8e920223395cc09fa761eff7046fe09ad0e1779cf8dd1a66 *42b4bebbf4f61adf8df0401d779d79e8bb9343a7d10072c8f3e577d7665d0ab9ce726be9781152 *29eef9d33afe4ed79e094ae5a8cab2b38f9d3fa69d72fe44769a1bae7202a8004e86be8cebef09 *49100b0d0bb8824d17280ba9e78046a7f3a7b0fc2b0639b286007b058b878e09b8fe2004da5158 *4114c65b8adfd397cd3b57364beec15584a034fc5f1c292cbb5652feb0baf8edcebc1d36b01eb0 *6ff8308dc9149ab1cd934d6620ceec192c9ba7f1bc1a6c9a0a870bcaeeac2dfcae170eb6803eb0 *1f18c0859c237d5d07515be52afeaabbec094dd914f18546187a5d84a06cbab4ec292dbc11be55 *046f040ff6e27a012087a85afe403d34daf0f57c53d6a0625147c9bbfaa20f8d45ff30f1bee82e *5cda5bb0aa3f7fb385bbdd9ab7df01239a5f2bd2e104fd020b2a987c868e69c3ffc24a07865768 *1fb0163095519a91c63ee4424b308cc1017b9828b81904e738c1dd69030bf01841ec20f8b4ac64 *22f3fc07c4615c87691686f690771b9882a69ee01fb295fca9a3fc1e55f935923270c92ee74861 *f90df2b2679a0a7ee8679e071bac22a87c1d863ac118545d45e4a7111e4f7e553f6f716fe1ca7e *ee0e1b3402cc15b06e8163e62322e09a6ddddeb51de2273d9ff219919403d3056472c1bd5790f2 *0bfe30b82de0a2c34d84b07e83e1432e0f59d0ef3f9ac2c67c0dc18c60380444c118091f550574 *c1580bff85bfe11730821006a3c87c5d70a14f15119c0407800a668092b73bf8afb7f1df6c8739 *81f75d2f77b305d6ae43a60ff30c2c624743a521570a3227a0e2d002a74f7b2eb4871349a01b40 *e5f2e1461d6b2a87d98c84cb9e83ecb39157068287e272d198baea21f7ef837c5830009c60bc07 *5cc13c00b32b30ac43e07fc1f44775c91e80b6aa65fa5370ce8584cb3c2765477db4a22147d3bf *2fc15d1d866a7b7fb3cbf3f9182b1124743d47603e6a3b1d2620e392bfea2174f11fb482a22147 *538809c0567193a262a6ace20ea560be46baa045b558df78b0b78d6deeaa71c0352d708695a0fe *7d391751fd94e64c98808c792bfb297e1b91261a726314723a57c5f5322ff088109c9928aab84e *5a75bf4afca7568a3776f435ba2aa64a4821374194b7d306a1111a7234e4ae5e822f199cbd515e *1126c078ba5451eaf4b9b10e539cea9b4e4cce0d9e8ba8877ffa8b261a72571dc112ae6a4ead0f *c8410ac8a2eeb6367c1547b4b3cc67af1523424effa629804fd5d244436e4c11249a495e6c3c1b *26c0b962965c99e53dba023f9a3b5df52b0c955325b890a2a5bd90a6134c922d0d399ac60235ac *375586097cf314b1e22fba96a47efd199bb1d2a63f656be70e6a3698646fb654ce96fb2c7e162e *444b2620c1805ec8d190bbdac924b6574e145142dd1047092bc78b2a23047e14817df0b7da213f *06d27a68a22177b5131c1d92bed0e8177efce65972f6210795cb2968a221775590bed452354154 *152618158e14147fd10581134819a389861c4de783284e42f549db2841eed40bcd992709c85aa6 *f3bc68c8d1f423594d2ee9fc86ea30410819f076e6d78d702b38042ac9beed46130db9ab97cc3a *a7385a1d32bc4d16972dec84237c80377a2f8e861c4dde69d0e0922e6cad9e280a0a6c51c28a79 *1aee560b9c16879009be874e130db9abdec31c2424c9d68a175aaaa74afcc6db5449c5b34d85eb *cd43e7e5e1641dbdf14d438e26df04bbd5cd4dee3296ab7845dfe9d7da2a1f6fa8bea5c683c0c9 *62c144d110574f127b7e9921ab9aa33afbabc6f2773a793103ec13c4d0cd2290bb7cc53fae4d43 *8ea6ff3082fb20e0cb52700a9697ef66a711ece32ece0147de1efb1073f6d9e117b8c9076eecca *f8d7cd1470661c36bbe14c2d9d6242438ea6c0096e4980bb18baba2edc470ad7ab5d64b88e017e *846824dcc10e7b0034d268c8d144130d399a68a289861c4d34d190a389269a68c8d144130d399a *68ba1ae8ff01a6081a92386508e50000000049454e44ae426082 newhex * rmfile ./scripts/hoogle/web/res/hoogle_large.png binary ./scripts/hoogle/web/res/hoogle_large_classic.png oldhex *89504e470d0a1a0a0000000d4948445200000126000000640802000000a4410a5e000000097048 *597300000ec300000ec301c76fa864000037414944415478daed9d099ccdd5fbc7651d860c21b2 *ef4b94252453318528a4b24da9844a5a7eb6ca2ffda44431494cd6b11b0a63cb28cb4861c63a08 *63cb586b2a658a34bf1afde6ff3edfe77bcf3df7de9971efccd45fe69ed731af6be6deeff7dcf3 *7d3ee7d99f274f9a7ff8877ffc8d238f7f0bfcc33ffc90f30fffc81d901bf8eed9016f9d620e9b *f8dde8d9e7b330474c3d2757e835e468ecce9f32bff7a4c81f78e70ba34ebd31ed5cd66e37ec83 *efe4769dfa1d58bae69cff71fe83c6e5cb977ffffdf7ff5a83177ffef9676e845c8b764b9ab59a *d6bcf58cd2d53f0c2837b948b5155582b7dddd2ba1c72ba71ffdf7d97467b721a79a3ef45589fa *9b022acc2c58f2cd80d26f36bd7b2ab359eb599b62bf632bd9d9fffdef7fe9defbd9411b9bb59a *debc7544955ba607dc3435b0e6a7d5eedaeecded8ad65a1f503ea240c991cc06cd2759b79b1931 *6f77e6b7f38fffdfb1f5fcf6774e4e787c5ffffb63bb3fb0b1dbeb5bdf4a3873e83b6bfcf8e38f *3ffffc734a4a4a6e78764ec871cc70de5cb87081ef9f9494f4c5e6832fbdbaae4cdd858135a26f *6cbcf9b62efbdaf439d2fee9637ab6ed7bb4d63d3b8b545d0638034a0eeffed8f4254bbf3ce318 *67cf9efdfefbefcf9f3fffebafbffef1c71f9e5bc96f40087fe53d6c7afcdea323dffda24a93c5 *81353e2dd7740bb8baafdf51f376f7f43e5ca3d58e225597162a3ba940f161adda84cd9ebff5d8 *d727f51db988dc8ecbfa5177558d943ffffbfee929ff3a3dfce96383bac53ff5406cf7908d0fdc *b6faeedaf31b4dfd7cc6575f7d75f0e0c1afbffefa9b6fbef9e5975fae7976e7845c6a6aaa0000 *a840c16cc1e1c387376cdcddb4dd6737dcf245cd901d0d1fd8d3ec91fd2d430f329b3efc55e596 *718135d716ae30bb7495318b3e5abb7bf7eebd7bf7b27d090909478e1c494c4c6407cf9d3b27a7 *17ccc7edc6dceed2a54bfcf5871f7ee076c78f1fe753f17bf677edbba1d4ad5f02e6461df77217 *b95db347beaad8221634c2dc0a971af1ee7b2bb9dd9e3d7be469f1413ece45b81417e4b25cdc4f *e857c9f8f37f7f8e38faceb35f0fe9b1a7cf5d1bdadfb2fcf69ba39af2b3c9aabbea2db9edc6a9 *55462c18b97efdfa2d5bb6403f900d14e8492dd73ee44e9d3a051d1f3870805d88fe2cae76ebad *0ddac73779701fa47fdf0bc798cdbbef2fdb644b60f54f6071234745ae5bb7eef3cf3f8f8d8d05 *09823a100b06bc819c20fcd8b1638067dfbe7ddbb7ef0ce91e2bb76bdc796fbb0147b9dd9d4f24 *c06903abaf84c53dd67bf2dab56b376edcc843dab56b97a08e8f73112ee587dcd536a61f9fd36b *ffb30f6e7facd1cae04a91752a2ea8557141ed0a0b6a565b54ffe6a54d2bcdad537c4cd90f2226 *2e5bb66cc3860d3c5028273939f91ae67599416efffefd4008203dfae256a8bfd9c35f215e0a06 *6eedb4a74c2330b0aa4cede99191914b972e8d8e8edeb469d3f6eddb814d962107e38a8b8b7b23 *6cb3dc0ed485f43bcced9a76fdaa74c32f03abad0cb869da0793e62e59b2e4934f3e0175bc998f *f82177d58ed3bf9eedb2a357e76da1372f691a34a95ca1b1c50bbe53bcf07b254b4dad58715eed *aa0b6fae1ed9a044f84d4dffd362faf4e98b172fe6ec86e4203f483157e87260c394f4102cc10f *901b367a33cad5ed5df7f3f39e678e8081baed76290c545f79eb9decd5f4850b17ae5ab50ac871 *4a09004e9e3cf9edb7dffef4d34f172f5e4c57b93255474450240a0139a09d39ff0bb91d08bffb *c9046ed7b0f35ea44dcc3925abcf983a75eafcf9f3972f5f1e1313c39bf9889663b91417e4b2b9 *c7fc75958f37f7bffb406c8fdaf31b161c54345ff742d7b52d705d9bfc791f2e94ffa52285c796 *2837b31a902b37b37a8111c586bc399427cb61ca49ca33e5f4846cae7d8ba5d86d3960001e6811 *76078426466c6bfec8fe3bba1f80f384f43ddceef963e85a02b9bb3a4c89888860a7900a389f00 *9ba870704ba8ffb7df7ecbc4980130f8abf03ab91d5007e79faedba16f17dceb2090ab7fff6ef4 *49b85ca55ba74f9b36eda38f3efaecb3cfc01b6f16e6c6c785bfe52a73f3553e7ef9e3c23d1b3b *35fe38b84068e13c0df3b67dbcedd0b7860e1f3dfcf1e71fafd3a95ede5e0101634a949b551dd9 *b2c8b81b5a0c0e0e0b0b839656ae5cc929cf190afd5c9366b00c5de17c5b2c8dc00f66f5d18afd *f09c963d0e8084564f1d6afb9cb255c276805cfb87a7c1733efdf45300803009d2b2c664b81d80 *07a2f0d87dfb8fb4e8a66e07e45a3eaa2057efbe5d400e2e57b779c49c3973e0a85bb76e85b9f1 *663ee2770c5c9d23faf4dadb578414ec53b462eb4aeb36adc32ec041b968d1229e20cac82b635e *29fc7c50910937549853eb860fcb171958226c7cd8071f7c0039717ca3a273924281b908727a80 *bacf3e3f0ecf09ee795020d7a6ff51cde53af598098bc37602330400d9df23100bc8f5ed0472c8 *b1c2e51ade35132116899fe7c7db78b39fb2afda3130eed50ae36b94babbf491e3474e9c3881e2 *8dc28f9964c58a15800aebd7fbf326141c5eacf4f4cae522902d8b3e3766407878387a0a6fd8b6 *6ddbb5aad15d1972a068e3d633f09c3b430fc2ebeeee6d426e55b72767a3562109c0e210edb2bf *20f8155222b77340ee80404e31d56a2b9bb49e05c2bff8e28b43870ea1b9f999dbd53cdaaee894 *ffc9c2f397cdc702890ab079f3e675d6e0054c0cd19143b3f7ec7e8527dc507e76cd8077835abf *76efdcb973511c385539c4f90842d3b5a7265c1972886d5f6cfbd6805c8209b9eebde7603c44aa *e418cba93309e8eadbdd11aa2057bb8d2dc736693d9b639203f2e8d1a33c483f595fb523e5f27f *ebcc6858be7345247f747b8420ce65ce4a7ef21a855f8216befbf9bb926f952b37ab5a8949e582 *06948e8a8a9a630df821820ce10dd79e11e5ca9083936cde919411e47a3c3567f5ead53b77eecc *413100bd3923c8dd16324733552215fc947dd58e13174e950babda67445f847f82998019b222b2 *2536702c5ea646f06af46b25a6942f37a35afea18113e74cc43606afe360bd5665cbec42ae679f *b91c48f806d81d0c867f03e4c4a205e4789b9fb2afda11ffc3deebdf2c33f9a3c97039781a9083 *48b0697b2a20a77e3e5d38ac6485d9b5f2bf59eca9b0bed8c6102c3ffef863644b6419de7c8dc9 *963900b9356bd6b09ba74f9f667373644db8f232871c87256e433fe4aee6b17edf867c1d0aaefe *7c356c0ac889d315e0b9b1381921f3ef439d0b0c2bd5e495e6b85bf189c3eb3083f31184d26bcc *6ee955be9c1f72fe91e501e4c4c10b7f2340020879aa6753b7cf2833a372a9c9150b3e13b8e9cb *4d3c622007bb83ae802b111ab91072dff921e71f591b004cc2fa000f6e2410e819fd77fa9733c5 *c2cb54985513756ef2a229f037181d4a3b76b21c34cbf921e7875cae1828264892a04e52ab320a *7fbd7576b32af3eae51f59ec9909fd89f9c27c82f512211357c135a6cef921e71f7f13ea208f4c *c2cd5ffc6c10915f45c34a371b7607cf17a912072cec0e0f5ebab2a81f727ec8f9c715509779dc *c2e2035137cdaa5e6672a58067afdfb67d1b6670644b5cbe7fa73a97929490b22e2a656144cae4 *5129a307abc90bfecb2f9312d2e4b8484d4b4bf5432e2bf7484e3914afb6526faeb1c5693b63d3 *ce25fdbd34999c969a9876313a2d6554ca895073f21bf57bfe7a4d8faf938f979c5abed2ecdaf9 *0707ce5d318f201532c278d604d3fed5ea9ca284c9a3927b862405576526362c2b2f92da373267 *42bf50f5b6a4ec12462e83dcb9247568f57f881d64679909350298ce5d766c340f40b638e958e2 *5f8b340b63c9717593d7e5f19c697b9c93f724ee0c4bfe8bcf82e40b2947bf498b3d94161597e2 *39233726eb396a718a734e4f9039787c3c33724d42166e5d6d66bd6a0bea136c3968ca1012c196 *5903bd0e07c35fa4ce01b6b4a17d78e84206b165f344d70892e9a40a8d3aeb6dfc32766298e2ba *a97ec85d5166183d5890269b1b554aed6f4cfdb232d3d965ebc053efef179af3c04b4d541c6c8f *c255c2b23cb1b3f2c44cb6e6ac2099fc86df334decc9ebc47521496773723dd00f180339a16393 *3bbc9ea427ffed33d965ca1b5a0c4c6cd42fa16acf84b21d63d56c1f1d101cc90cba6d54507078 *f8ac68158be73b4576591fda2cba75a1778ab77efd5e6c95e00d758ee403bc73c4d3e6b0778ec3 *d7410f36ccda34024bf1cb2213d644f393d7d13d3b4018e689ac8987376799247201e4d85c9895 *036c82b4d8a103d8d6f8b8d8c49db1f17be2ed5d1e3ac06d8b6597d962b5d143073829295bd27c *b2061bb88a1e9f276a7c50f4bc3ef19b238f1cdac9643d2c8cfff24bb067024f4f7e03c74bb998 *924dbd22e99c421a2872e2a7632caf9980ca44dde0794ec839f1d6264a212d385cc0f6dae8a8a4 *334916867d5ed857e70fdcb7f911ca10157bbf4cc967cb7cf9e597089684a1a0ce11b392c35923 *3b6395a4135c353eb82ec410deba114f3fe95c321c9e9f892792128f25261c3b1e7f30217a71a4 *82a245005a26e2bf4c4805e2f143ee0a9b1b562588d38b0db537f78cda5c269b2b3366634c44bf *50e178b2cbfa60637291c44309d9fb6ed169c98dc01b9881a729b02d0c4b3c91089893921c0f7b *7f829a87d47a6237c6003ce1786e9063c62fab9b657697929a8670e8045b9ba8875e8882412113 *321111f9af000f9ea6f99ef037dedfa2773400eb336c819eb171f12917f91649a08ec171e013f0 *86ed1dd979fba32dd7b6bd6172857c2f169ebb781e315fe4cee12a20be2f07832d51e095dad6be *114f93f397c70d19400c6ac377c6cb8cdd1ccbceabb939367a5d2cef11d49990e3b3a02e0bbcee *5a861c6a9bb9b9ea308b8b056c42d66a67e362d5b476969f31d6e445d4e430c5093d7659647d58 *62569ff6a8b4e400c15bd4e83c8b273682a725837cc77acce71d63ac0758bab13b79adc4d15941 *5cc4d785a0adc1b56cfc5860db199f0060d438a7d00f925952e4b218a0257c8f773a995bfb683e *053e138f25281941ce08f90ad67f35eabc5ccff10b27eedfdafdfeaddd6e5dd182dcb9fcff2e3a *f0bd41e08d2471181d7a1dd5068862cf7eae963298f57f08aa30f1a6ce5c3762301fc19a98e855 *d108996ef4c0c795c4d4a611fbe69341f59a859c9849f4e68237c5d04eb86eaeec6f7a1bad51a7 *375a9f6d4c1b753e598d5df116313ac466b01ec8b7ffebf865cc3a352317466ad4e909e44409f4 *0975a86d8888221f821c989570271bf97be2f59278c15600c8a036d15aec149628c2249fe50d50 *2474a9d6692d9e4fc131e0d8de6b746f1f0883c5b58ab9bfcac2bac437171855accdabf7cd9c39 *73d2a44924f250d08de04c3ce9d9ad2265893c623c13799275b275420931d656f308f4c1a1b742 *be2384e406b9b02035c59ae2c2d253731fe44cbc214c0ea85f55e8c06d73655b458a63eb9dbbec *e0759ab9e9299063c230b3c6df22dfcc336a680bb96f460fdb5c8fa2fecdd6535f18a66d2a6e90 *4340f5127582375432589cf0374ca0269bb5cf2003f0d16ba26dd4b55753bd70408e396a74b862 *026b14ea78bf7c051195bd54357f4839d7716b0faa12355c7907c5f62acdab53785cc90acf56f9 *f0c30fc78f1f3f63c60cd4b91cc89dc3d23bb48f5005022150899c17c952e50beac5b30f2c5ead *ff9c2d243b6522541243d1d09083c0788ff77a75562047ed93461df7dcd2211ee00d18b173ca82 *9d0b561e5eb5f19b8d3b7ed9bc2725fb73fdb6e4c75e3bdb7180aafed0f2b183be420ee1413657 *0e33d95c365376d6dc5c917f64679540654db6db497f430764843a5b8e4ff582d709de92031008 *e16fa3fae7412997f5b83d6cbd1ebd18f5c84f38241f4baff36474400e1b0c622a6fce5cc21179 *52585cdd2ed1c0866b7271cdde158fda93ce191fb52c8af73bb95c7b0375c1e1910ba384b969a9 *92957bafc8851f99de695b68c8c68e5517d503729517d4a5fc5ebe670a8f7a67d4b871e3a64c99 *823a470e3429085939d31d6bc0842654a14ee1a03caf750c41f95487052cda71fe2aceccca2d41 *d11e175344d8965d328d705c6440517b468e7e0d85c54bd465057260a075dfc3b73db48f72405d *079f7a72c4b7393b7bbf91f4c8a093773d9ad0a2c701aa89f90439f1b430f561666d6eac6c2e24 *2ef4cd0e7aaaf8f6163b685d71459e8a65b0f2841c574613709728d2b79704088b031be00d16a7 *1fb6bd9e3df67adc28d5f1d4e52048122e8dc9245dc8c13c0164264f1d7b09c6496171889440a5 *43ef70e731ef900945fc16f06bb433d1dc5c644b0375721df5154cb07987b78ba9bf76dad2a363 *5ccfdb3eb90bbc29c845d62933ad32f1cd4f0eea3d76ec58aaa190558001539eb8cfea5caa2d52 *0a558019a802908c7a7d307691a8c5513c0576559d148a1e6cb079385152e4112887788d0039c7 *4dc82146299bdc39af187b1621a7aa6eb5df45e38ec295e617ae382f6767912a8b29875eafed2e *a91beb03e452d270b6380f33444aeb048293c8e6425ef6e6660a15c19e42ddb1e370a48c20c7c4 *b89cee43323c028d4c91b24f973ce1387cd644bb3f6c2fd783550dc79107a3539e86d1eafab816 *327aea38b2c5dc6fb3384b26549c734d06c7fc45e7192fd63ccc9265bbc4dbd31575185a94c935 *39d957f7c0fcc48f6071f76eea5cfda306023966f95935f28f287aef736d801c35bfe6cd9b4779 *22e29bb97ed66aa77b52054f01d6ad48c27804995f0463b5788cdc581cf3b57e0fb13f4acaf0c2 *949245c835ecbca768ed8d852bce2f58f2ad022546e4ec2c5476229d40905a1b76dc2b956abd84 *9c8894268be3f8c1f010b59819259b0b55792900282a4fb2506758abdc50a7ac32996cb421520a *8b0372cef5ac73395cbd584fb2ac0757b8bbdd72b20d395bbcf4f882883d889422550a8b0ba8d1 *276ca252c3a03cc15b46c897331e1b266c41592c35ea5c199d6271c9bed9eefe7bf9bfddb7f506 *72cda25b69bc294637af0e0ef19a7deb00b9f7df7f1f3b0a2197598f6f76b038932a226645f014 *d4a9b7395634cf4c459564ac03b03877bcd5af0ad804bdde4337bbe693871f9b316bd62c5c28e8 *b81c459b7262105f9715f389154f20e7996871eaf8e9180289a3cba9cdc5f1ed8b9a2ba8e36128 *c6e230559906626174b0c10c54976493c58916c71342f36149f0167d2efab21e853a5899e9a033 *21173e2c0f4876598f25e3c1e204724895c2e2805cc4f4082f77464b563d47a60fb9baad07d85f *c717c82d3bb5aae3b69e6dbfe852e3e35b84b9151b53baeceb9529991e34b15ce1a7ae7f77ecbb *efbdf71e35bf28b327f1cd597088aba05987542932a17510aba7604a3d99c751c873b7c106d23a *86209ab28132651b91aeff0ec83d183a8dc283e2b20475d13931b84e1620675b4d460f761a2a1d *908b5ae8388484267c917ca072a5cf78188835e4c4b7e38ebad4b4e433e15a8b03158001162790 *e37c95f5d89ff229742559e999687426a3332127ee07f3cabc90484820a7a54a20a78e6707f3bf *a2c1435017be2c11b0d9bccef01628d97271946da8f4ee1bd191e7f1edcfc2e26efff41eab3748 *adeb2794c9fb44a1fa5d1b04be5feaa6881af95e0a1cf4daa009132648e174e29b492af7d921ce *8966e14da44a39886dd9c762ef6aafd265717814880873845f6aa1063d45f4708d37a693c0bcf0 *465e439073b038a7fc50d449e2ea20b714155f0391c480611a883d6dc43c395181d2d1e21c52a5 *408ea3d1662cdec83399301ce29b5d199d5850b80bbc942f6b321cbe386013db89f80604722258 *8ac9e48acc56644e0262c421ae6356047272355b6ef7ee50dbf4fd964edb7ab6dbfc70ed258d14 *8b9b5bb3c07f8a5dd72affcbff79b9d2845a55e6d6cb3fbc68b721dd274f9e0c8151e3396bd587 *549640ff87842ac443abb99cb077b753587d49cb5deee20ca8a2220471c68a3d494c0388a63c4a *511394d9d99214bcb1a05c2382a5b2d75b2cce457e10c861a85813ede5099411b5114de716d8aa *21c75df0e0d98607cd5848af72b03820011e4491d390f35208c9c8f6a8c2563c2007a313c8d941 *648ef5c4ef4fd252a5b8bf0524e25273c3e715d18e6ce98c44312037785898d82dbd14959fd9f1 *2f89f0aa18590bc895f8f0a67c4f17aed5ae369d095a8cbb9b0cf142638ab7fcd79d50d7ecd9b3 *811c5481439cb2c23ec53783130d390e6203720a27f214d295217570891d2168c9d5b6ab060558 *9de3511203209e156d03ff4b2c9626e4ba3e318beda094252578e93b9590138330565f21a7a54a *2d3f68c8f9a4da6644e2ca826fe453b9410ed992e3df245c53aad48a9c40ce5d96cbd211a0ac83 *7175756e81962d0572083fe67a4c45ce841c20d164e7ed4a52549e0eac92a920d73e5aa44ab95a *acd7df6bf74f7b685fdc7ecb2375973651269379b50a8d0abaae7d817e03fb6132e936a6278d0a *8a7f50b67cffca24aa4a8d3d222e20305f1de25a91f3809c7a0aeaa0bc90c2f9a565489d62226c *8dd84b1d7e292e4a0906324317b44fe52ff4cbb9958ea52c0c5578c9b0c059f9634e0c62587d86 *9ce5e874971f0472962dde4564cf826c999ac63390a41ed3196adfa5638888675a9351b90216de *d2859cfb7ab2c878c332829cb8fee46ce6bd842f6bf780cd9a2c9084f61f0ee928b3872ffc9fa0 *67097136d16b0378a3b7571b123f1c1677e7bafb2a45aaf68ea5a756cef762913277951d3b0ec4 *8d1d3c6e68e9e995ca4eaf96af7f9145518bb09d88da4231595f1de29a30c423673fb52a4122fb *48868ee9fe71b2352bf0dd0e0092d840d738212ba82d1d6feadf116389f645b566545b30703927 *462605d2d3859c32b25b22a5fb61e606b90bd94a7551f91d46aaa209394e4d37db57caa1ba1a72 *487d26e4c41dc7d372d7fd7c1c9943ce64ec1a72366bb270c26cdf95c544f96a6984d8740a8f09 *391153bd31c31ebdf07587addd3a6ced5a7f5933f056717eadc2ef94c8dba560d7be5dc75a63c2 *c409652657ae3ca74efe9703c74c7f078585631de065c121ae834edc20a78cfbad1b499a9c421d *61460eb6a602df093c3023e0363a62d9046912b7909c9c91ebfcda0f6b56dfd9c25b3a90eb18a2 *21976d128fe5e2929a20798d26e49cd4e60a39498a33c19053eb5141958ebc5577c8a1ce19eb89 *de9ca8536f4c054ccc8cbe420ecd10c8b9c9a80e634c9437907be3ab772488b9f2c23a40ae6c44 *d57c438a14be2370f43ba3c11b415ed84b9a4e0dae3affe6fc238b3e35b62fb64a1eba743696de *20de3bc455650d4728b3137241f6d9e7724aa6a46494c2e3992191dbb3c2531c866037f9216721 *872f588262d3855c94156728bc142b83829c030f7f11e4084736d539f32ee27097f5404a317b92 *45fb5220b1fc696650b28e42f69286128e25995c4ef0865f0e0b9e3796d86f2e25a93c9dd86eb7 *2cbf5d6971f36b06be572a6f8f42f7f6b8d766711326106ef2f8bca72acfab5b645cc916afde09 *75612c900c711ce214c3f45e9dcb08722a05ce08b8914823cf942e5b5bd3b16c1793b303b66b07 *726a2f2cab94dbceba81219b39d48a8c1ca1e8c8966e905324eed0d0d483c91c7296c7229beb51 *6efa38f7bb08de4cc8490c8dd3b2df25de4c0568d97392d642bd5c8c70391d182d90432d54463c *cbd39539cf7c2f6152e7eda1ad631ea8b2a8aeb8bff3fd3b305f7081d747be2e2c8e3866f2c1c7 *2e0fa3a171a90f2b043e1324bd20811cc0f3b5e0970939531de02c269846c794aa69245269b6e6 *8c80cb7602feb50c3917454bc0e046e259aa8b261a634690d3ced0742187055f8b7c36384f64cb *7c621b755cefa2d2821c9033d7c35b5da246b43f4dc22371618ba1c5bbc520a64aee8f76a98b57 *dde9fcc838de20f9f79f3bc7863e10d7a3d1ca602bb64b9925f3f50e68d2b189b038c2bb4890a3 *7ce5c66d9f979c52befccc1a74155f1cadda62235866a1e097a4298b6c621206ea9c9cc50a57c7 *12cc647cdb2ee27b8876ae122c534cfee366db801a7284abd8de7639321d90d3b1762ed1431793 *4dfe238a96f65313ac90335c2e254d6aa8787239653472754580934cf2002439dd4b91890014d1 *094d16277e61a7ff33032e14f1f55cc24deef9bc73b545372bc8e1fe1e51ecba7bf3bff4f24b02 *3972e4f00a6026a1aad7cdb36f53f59b87177d3d6204bfe1b96344a1e0974f0e712c2236e41c84 *a16903578a2d5b1e4bd0395ca605d2fbacd35c6a3e71db59d369a62ce6bec4225d594a71859c68 *8ca68f8bc8e38c6c1bf2a4b3e924b0b99c0139097071819c19367d31d94c3375c9340d0e1f3531 *5af200aeb81e8e09319c681687d9d30e7aba92f3e352ea6f0f6fed05e49a38f2744a4e2e4f5e5c *b57baa234f8237c229717c8bf48833e089d57dab2eb839604cd003a33a932f879300570119e207 *0e1cf0de214ef4896967361daa582c631d6180b66c72d103697fc1b82620979a267103a605df73 *67b310ede52de4c4e16e4433785af03597534eb39c5a8f07e444aad4de3fcde534a3036936f0ac *e25c32ebb60fe714f026a1017f8329522abccdb2e20c6745a8af9fa9b97251e212f2e2da7cf160 *8d8fad3c9df9b502de2e71ddfd059e78ee096171945d90c02eba5203aaf09d532bcea94577d51b *0694c3090e99a1cee1912252824df6d282a2b21f1d310c9ef1b1123694e5b0a45c0d39e551c920 *200ba9ddc5829f9a5dc889b7dd849cf6b6a10628c85931cd99c4403acdd3d978d2eaa07140ce8c *2993943c3be6e65082f0763b2879960bd25c50d7251a9f93ca38cc7850c4419ce922528237d421 *811c5265e6e70841cca1717d3b6d0f6dbe2644585c996955f2be54a4647029d205c01b715ed45c *e0e1c2d0a49e577cd21e3a6029756e5091156b5710f00597a357816f05bfac1806b74a6d66ee95 *334c27d50f395f044b622c9d955e3d0e339700a8ec40ce613e910017adc849f2951d4064895578 *1432811c87ab5b805836054bbba48a0372cef518765a8912a4409086995d82d29a82ba8caa2c73 *11a9c0a77d71122c06d2b416e76071e9ef70f4d9b5b0b8b65f3e546b7143717f078ebd21ef2305 *3b3dde4958dcc48913098ec74c226d1ca92c74f97f976f9c564579e7de2c3a64facb703f2c28a8 *733abed92b87b8751ceb2a949e49c63c0b64ea6c3a6c721de46c46d72f34a3fc1a0e338ef06c06 *a02874187e0853aa74262b386ec19bdd1249a55c826874e4d7c87a7c4a96cbc86229b6132d550e *e83fc00a6f77cf4c116f01961234375db6c49c0a816da2b16d023c9c6f1022937229924e6ee20d *6e09c060a4124a2f78cbfcebf4de31002dee8eb56d48d251eeef99d5f2bd5c2420b8c85b6fbf25 *be0192e2a40b7c62622204209f6a17d5a95a64fd22e34b36ff4f4b6c9504a0205ba2cef954bf59 *65183a72af3c53fb85d1655fcfcf75904bb302b23c8b7b9a89a476ac77567756894cae558c0472 *4871e20576935d7522a95bee36d86012a8a16320b30ab9640d3937a9d2653d0e184830b4f23ec5 *c5724660a8146fb83d2dd4291daf4b3cda1a36128984d6e589b4c94439150ea95a4972d088fb5b *49b01947337f91b4851a95f76d7eb8ce92c6e2fe2e36be74dec70addf5c85da6fb1b2ceddbb78f *e68f5a4f1bfee51b55e6d783d71578a9e89a0d9f22554ace0af476f6ec59cfdb7dfb6b52fcf77b *618f4a94fdf34ff259b9146449d8a45d72dba3529bb8c525ceebef912dbd82dc969ddf05f73c98 *1ee43ef98b20a76f9739e42e5db8e43cccce2573986554a4c40ef6cf86fa24995766feabd82add *ede38eeb43df6669205d174850a76a751d4acc963a27858c1c61d38237586e3af67a23192cd90a *d5b53250a208d10278048e68e029058f4acc03138199ce6a354d94c8a598d4b185c2e2a47688f0 *f6ccbfc8a0bdff368398cbcfae91efb5c07c77177cf5f55785c5911407fba20f01cd8dcd12b16b *8e7c76d3cceaa0aed0dbc507470c85d2801ce2253e03dee9196cf9f2b6d70b0c2d2a78bb74e912 *bcebc2f90ba0eef8d18326dedc50c774d6a2bc7a20070054c9ad6e40ee9040ae4ca3cd81d55777 *ef3defaf801cf76202b9968f2ac8d56db74b98ea6d21735d2077e992295baabe02199506aa1204 *a164477dd2b59f4da952588a9bdf59d3378cceb3e6a456eab2b91ec90f32abaa6816a715394f79 *498b9752688877f27eb0876e2613502137aa1e3a4656ab049a004ea9ababca013a6ad1b965a07b *8e833f1f2288b9fd96ae372f6b2a86138a2ce47b2aa041fb5b84c551ac52dcdf9ebd077efaedfc *0d532ad45c746bf14965abbe517bddfa751f5b03538a56f9cc7b3dbab14fa18703056ffc95abc1 *33bffff67b60bcf58371995425fd3b51e7ad607977af0426906bf5d421ea58d6be77e78d8d3707 *d658f3e0a3390fb91f7fba20b7b3b89caa6359efbedd82f05bef9a9721e4ac23dcccc570931ff8 *53d612c3d31cd15e6e2c0ead49580ae7bda77ddc4edf5e17a2f166424e6ae089ca9495501828c3 *d1db400a87896fc0598723237b7daaa36c9183d769954c2738f371ddfdc3ccf7c1972060d3b5d2 *bc91d5a5d9c0dd1b3a548aac23eeef8223afcfdb36ff73839ed3ee6f5044fe17ee6f4296dd7cdc *b7cd6b593db24185d935617423e7bd05338c8c8cd4864d93002efe71b1f9aa90320f9783ada1e9 *91da0227e427a03bf7ddb9e389df7ad647742312bb8bd5d500b94f377dab21d7bacfe176039c90 *bbbf7bce43eeecb73f6bc8b57c5441ae7e8778815c9ddbe76702398e7014155dd8dced1813f394 *4b894faf637974ef0867f2ab25529af67137e2d3eb91ce556ea8b36be0590d5fb21086a2599cd6 *e244a4745f4fbac25eaab358989de66cb1bb28a983b42a1afb8a6efd618b948e9a421a965e4666 *9ef8f554872d5d51e41a58793acc52532ae6eb5fb842ab8a8237dcdf341e403d23ff2bdd5cb8d7 *368ea838bb168caed4d48a15dfad11b93412ad0f8862b724491c6869882e3bf54983c5cd1bf46e *089fe452b04162a071f1f11a8e77fe87f3982e4dda48776284cb42d346f5dca923e69dd9f3ca90 *435c5ef4c9d990270fb77afc1018b8e76955e5ae4e9b5dd4bd0bacf959c8830b721c72fb12ceeb *dbddf584aae1774bc7f8b24db604d6f8b472e30526e4fe48b9e42a35294aa20c81893473b2e360 *c057f941f5a6d386ca2a41da3160b2947462261d940daeecde71c614d451d81cefb9cf90a3a3aa *c5e2b4fb5be1df2835e54d6115295e966436c170d4b40472d270c7aeb6e09a7900638c313c9099 *8fb109136071ad373ea09a0d486adc9892793b16087d3a54bbbf49fa268c8b6a00b8bf3db372b6 *9c8c2d31f9a65a1f35c27459724a85e08921b3e7ce0675a01446877953ac68bf5d4ee91d3fa0fc *87353a0f7c10ff010c130c432784448b134fbe2c7ccc8d243c51c753f69edd49ad14652d37db54 *641f72efcf3edda6cf1160000650e4c040830ef1156e8f2d5a6bc3adad16131000e4dcb87c76c6 *dacd3f70bbd64f1c6afec87eca42733b2a43976fbeb568adf5c5aa2f59be7c25a664d19eddef98 *9a26891838e232449d34e3f33e56d58a26c3e9e782b7744b3b6550e517e951b5cef1409d4c2a4f *2af37aaa2f4d452cbc39ab8609deac23c0d7aa13d26dc72ac39e28a1bdfc94284a97be8d8ed030 *644b49b1f32646f4a7dfcf3f40b381b81eb75acd0698374eaf92ef5f45aebf2368cc3b634cf737 *e9de1979b7313f569c5c8bc8af3a8b1bc3ebcacdac76fbb4bb27458413a782138fa8143e883b63 *f8e151dd76f70e78a9f8b0b061fc263e3e9eca205859780197834e1ccfe278bab4e1093c658a23 *3d9c3a5fe97e4d181a7f9a3c4a8222bcc79b57908371bff8f6890ecf1c03722dba1d90f2c94d1e *da5725785b89fa9b826aaf5cb17235274a0e76007b7fce37dc4e2087dec8edb05b566e191774f3 *262c28e327d9904327f6849c360f648e3a6f9bf159bd234cbce9c2986e2c2e235faa5d038fe680 *0bc3e06ce94e419d9712a5ea72ecc81b50fa1bd9404608883396df17dfae5d95d91a7c90d5ea6e *a91a7232c5631ebd26c69bccb1f0c3d33a6f7bf49ecf6936a082982b2ea85d745ca9bcdd0b7608 *ed202c8e4accdafd4d165c467eb657d7be56667ae55a1f35acb7a46983a8e6372f6d7aebe2168f *2c0afdf7b211ef6e183f267efc8bc786f53f3eb4f1d2e0fc9d03162e5f88a701b0616281790239 *8c2872faf0eda4445726b4e12e67d60850916284e90e1d609690d3f56fc09bd092ee629003e586 *8e9c4ca14340a7e78f03b960ab290733b8d7418c96701e50f7dccbeb60f139d543fdfc2f977b0d *3b450f1020777bb7fd72bbd67d0fd50cd97153b3ada02ef8c10d589325fe201dc8591a94084bec *2c38512a5c7a12e6158507d1dfd85c6da2c4d3601654b345b84cdd6b42cdb21e25f18e0f122d8e *9f1a72d2afd8ee8a9aa95700479c767cab704d29acbf309df564c10c20255e6403b158ba404e92 *0f1cc1d0bc801366ee51fc35f5d78eaad9408f269fdc292caedcaceaf95e2952303860c4c811e2 *1ba04025167f717f67d247e9d8b9af8b8c2d59696e9d5a1fdd5a7749e3a6ab5be16f205613df7a *cf7dfdfa1c7eb1f7a1174236762af4eaf5c5ef2e813019131383d809f30475664aab6dd03a9648 *1c025abdd0861d839231f632f22ed8b5baad169f1238ee6502eb152077f44ceabfa7fe4c6b8e07 *5f4cc49ed1a07d3c5a1cf3e676bbebdfb79b17d85178f1cae81d0987bf0603d9c4dbf7c97f8e9c *91fcc47fbeedfc42226e09b90593174cba14703b6efde490f89dbb55e4ebefbffd9a2ee928db80 *d5c4038ec4be64b4b3525b06879bb3983e95d5f0bf59fe000911127b89aa19ba50b5cb71865c18 *4195de145d95f528a3fce810b1580af0047ba00e20e1c753c04b4a302c8dc94a734b1925609358 *4a85b7a12d54b384384708c83c8ff5646f90876a0a96660a82c6dee0f1f199dcc8add940f9f935 *ae7fffc6bcbd0ab5e8d242bbbfe7ce9d8bfbdb9b4656bd16f42e3eb12c7db0d009ab2daa4f4639 *d5f8eef9bc13959e69d943f65dd171a5f37529d8bd7f779046db109827b64db89c4be1865417da *50cfa25fa809bc4c10681ae1ec8245a35f93ad56293f3aebc78b702217c89dfcf68f9349a9a7bf *4b3df3fde56d07ff58b239f5cd79bf0dfce0fce3af7f43931d980c66433db158d668b5e3b62efb *94e7e0f1430fbd7074f2c233bb137ee52227bef923f1ecefbffe76858ca6a41f534f396eb7efeb *d455db2ebf31f7d24be37feaf1cae9c69df7622ff1bc5dd387be92db75ec7f74ccf4935f6c3fa7 *6f977ce1b29bf749d9c1693c4b28e0e8d74ce0997baa0577a6242288cca00f333ec889c84352ed *a9a480e1c22817faf6c2f8e1b61ee53d1b1d2261284cdb67e0009e8d3de2c5e2eaaa69544197ae *03704b2919e0b21edd572087f297a530b327def47f1132690c627178f7f1c79fa9341ba06c5ee3 *55c19523ebde34b7062c2effeb8154861d326c88404edcdf685c7448bd62c064e20f274a0e2f57 *34acd48d33aa549a5f5ba2c6289dc2ac38bf76e0d852799f0cb8a145a929d3a660ffe4ca240189 *8ae859e0d9ed592090a32c08f010643ce1e736556e2421bb2a6524d94c6c956a5fde58e65c2047 *57b7e7de3d3760ecb9411393874dbb00d8d0a92074c23e8a548d4a7f565b51bcdee7487df4827b *78e0c95ec3bfe937ea3b2e72ffb35faffbf2a7cceffdd68c73bcf3f9713f0e9ea46ed7ff9d1fda *3f7d8c9e3b57bc1d322d6227e22eb77bfaedefb908eb5cfce979775e77c640dde228764a6fee15 *cf3390a6025630e25b1dde54bbac35d176c8c59a8ce93b330b61b2db7a0478f0ab74b1a70d9b5a *dfc38f876f3dc3f578c16fafa0265e4821a2924229a4f98037644bd553cea1c5d9d395d7813a3a *1b631f72bbd4d2932beffcb45dfd79cd8abe53aaf0db250a8f2e51e8cde2f9fa04d46d5b57bbbf *4105b66edcdf5e761a88deb5a648bf207a1a177daf74e9291529528431e686f00a05de2896b757 *4081c6055f1efe32ca2157c6d127c615a44a337cccfd591c723e0b2473a474c80344a53b958daa *5fa8eaf2299d40a51891357523482ff7df0572cf0f3fd8ffe5b86787c4f6fbd7863ecf7fd2fbb9 *958f3fb32cb4cfc70f3f36ff81ae116d3b7fd8aafdfbc16dc6b5bcd739ef6cfb5ec8fd13efeb32 *b5738fd9dd9e58d8ebe9e5bd5ffcbcefc02ffbbeb47ee7de1f701bf085333ac0c64f3ba26e37d4 *bedd5303563ef1ecf247fb2ee9fa7864a7ee33db3d38a575870f82db8499b7e3bffc923ff18647 *7a2d08edb38cdbf551b75bb77cf561543b6e278e1abb5f8c93ca1581cae6823db68f4d0457e6b4 *8bab4d0c9352d849fae356815e67fbbfb858eff99bab9bce685ba7d7333d4255316049a343f404 *60823105b36591f156416569f8a6ca2a5a8462af47da419aebf161492a1f87140189ea729324cd *3c033b02d31575c2eec4a042f09a6963bc635648defe01d7b5cd7f5d3bc7e4f51df99e1df8ec04 *6b50c30b1687fb5b043f2f53bc0f9f38dcb8df6d0467e67bae3096cf7c2f14a188c3756df2976c *5af285212f880914bce12b07cc3b76ecc0be906e053ebb799883d729fddcf249468a216a967a22 *7a4a74911c6d9a0c841264f3b136795faad905727c6d108256c3c180f9119320db81f107ed1681 *9b0de258c28bf29eeba058054a30a2337c1cef24df13eb131fc46f262e48be73baa8e3767c7124 *0ab45bde29b7e3584218e07c22338a2020695d6bde4ece30fec41b781bba321fe1837c9c8b7029 *2ec86535eaa445a3544a8b91608bc551228c41ee51aaa9a2a38929452fe823050fb1a6b3d8936b *815e31a37b29b57b92b8ac47ac297a3df2b01deb89d60f123a561636bd9e3d7699379782c17be2 *9df692546fc10fd208e6b2930374b3380b3f92478733c09cceb8e78c51c752e5fabffff1fbae84 *5dbbbedab57dcff64db19b56af5bbd70e9c2f0e9e1a3c346cfb6065e35797cb0385f4bc1f26497 *7fb6bcdbc06e753bd5abd5be56d3ce4d7bbfd0fb83891f4015c89348952872c48e411850058ef2 *4ccaefc9b350f6646b634de0495292e794bfbaf75ef5056f2e90c3444b702336098caa1c0fb8ed *a166acff9807811c89151c1ea02ec263a004130d4094379622f0c93ef2417c91e016b598330ce6 *e3f9cdb91d42367f65b908dc82373e4b8ec6faf5eb49d34036e0f178de8e5fe23ce50dd8a3581b *2e41411d17e1525c90cb9ae66693ddd984eee030023f7d62693941d754d324eeac3b7fc651c630 *2debf29bb91ecd42f5625cd613674cc77a9c2db9a5d89bd78927bc4d32714c37b7608c525f2866 *38c169ce08135680870358e22b7486075c012f3dd4e90473244cb7603a9e02072e0f85a7030678 *5e6bad01d87870b8d43054fa5494d2e6a2972ff3293e0b3f4015e4821cf76018e327451c309940 *b4909f37b5f7346d8819d3141f047ef601edf8694a3aba8c6cd6ab35a70b3930c066d19a832ff6 *49c6036f38fb8833046f015b9965c8f159ae204e15b62fa3dbf127de8058024b1484670239a7cf *d7d18e586daed4bbb678853473d07cc39db245523fe6281b9a43e9c322d8483b62b7f5e8c5b8ac *c75a92733d270cf07bb71e389b089066181740228e198ca99cda732a438e1752e54a56a5cf7e04 *6095ef63a5d5a5cbe824cf40a51439f02fe933c81d686b387574cf092d95f0b0b2d2a2d1421d60 *8650b90e52153400cc387ca11fe816c253d66cefaeac854cf5388e253aa51b830c9cc7ae931e12 *353d64bd5ab31be4d81762d8a0669c897c9fed5e0cf9ce7c846dc50ce513e480289f12d4711d6f *6ec7aa046fac938f670e39ad4d8942a5b1a74bf39a53cc50aac2a12533b8d49dcfb9942a3962ed *53f6446286ebd9634f395345c9f4a945b0ae916e3bb87b470bbf0221a20472a0d852ab66a7d68b *180b72e6910f27f4449db35e5870385fc15c98a00e789cf718193d262f07aa8ae0593206ce5803 *7a8380b9b2af9cd38536ac525f4aa43f9128ae737b4ab94ba3b265d6cedf3c9eca15ba1cab3f91 *bd010038db10a633d1e5d8322248d832d20d797f366fc745b81417e4b219a9e3b6abd795d68dfd *b5f7d474b3f86a93c81af6327adef25a7eba3c695f72202407c7ec120e73b3ca46d82aa566b0d2 *e9c245c0d6d8b3e1172542a60bea2c5153e230c56d606e1acf2235bde1539bb84c543ba88b0de1 *584727e4d10363ef3b1664441ebad9801994a37f994db7671eb79383bd60d1ffcda1a12a585cbe *9cd116f07bfeca7bfe9edbb9877e9bfb6bc588b86c6b8e16e8f50d7b7ae85565753dd090a475bb *e0adf5004194538215a46db4555617a6ea98da7ec3a73024d8fe03372e6781597c567f67019f7f *d6c8e3df826b7868fea67c00bded7ae6d8dcecbe84863dc069b335c4a7e473c9cee16a82e2220a *c02872e22b375b8b2c8bb1829e93fd90f3432e770dec25804db89ccaec6e1fae7bcae99815dbcd *b8dfa52478ba5a8a16c8451c05b4aa449f47ed67bb8371b6fdf27ec8f9c73f92c549bd202d520a *1e240c5ad27cec4c53afed31a2de881319073d0618edd6d39053dd7ccc06977ed4f921971b86f4 *07d7c54bec4a0ab4a49aee48ab5b1763bbd17d04468a23385835aadf18a39de966d37067405c4a *8aff59f821972b868471e9fa5ca2c509e49c697ed9e88b207e4ebc0bd4bdb463c40c2ea73b18a7 *f911e7875c2e19c425bb489506e4a4aaac332c334b43781da823fad90d72aa9dea9a9ca948ef87 *9c7ffc3306842e8a9c5912cf162c5daacaa6e772f425509b7f605bc99616e4cc76aa7ec8f92197 *cb6c27d313c437a0f120167cb89c6871590b564a979dbaf5be125ba8af2dc8fd90f38f7f3ce4a4 *9282404e1bf173dcb6c18d74af0251e42465de0f393fe472cd4875321ff7125d8e50af9cf29b91 *15e1d6fe4a925cec5e737ef3891f72b9077224772bb0399a839b3d5309839456bdd96741f4e831 *a54a3187aa1ece39876a3fe4fce39f624149c67c6f16e7d2f1c74424ab4ec5d9eee14ad5066d9b *119152e795399aa1fb63befc90cb4d43752a76ab11645431a13e57765007de1029b5a152757874 *c4912155e66ce1233fe4fce39fc0e52eaae403b8999d65935ec920029d8165161adc915aae225a *1c8650c2be748747d3c9ee972afd90cb5dc32a4e9c88e6663607378127790080075b4ba2b22e26 *5f11c6800dc783f67d4bbd746a63db99ac6679763f8bf3432e17323a893f860b6556ab0b65af4b *3c28027b489bc00fa308d617121198bc20760cc7ba940013638c14ff02cc923bafcbb7d8719b7e *2dce0fb9dc6a417154138b8bc5704f4121f736c51a7816ea329b0e338c808d22281466a7568a2a *1068649467336ed30f39ffb81650e7ac4c4ce3b8d1e15232287dd4b94dd7025e2eb589ac6a11ce *220e6b6224cddc8f373fe4fcc3a532b1d5c32452da14ab2ee1568d4acf22795aebc301c07ce885 *28cc30b035f7da441b5dcb697a5daed80f39ffc875a8b32b135b85a24120dc0ff625137431c9f8 *a69e0230936a28aa46c37ebbfa98676d2281a2df44e9879c7fa4634a71af126d75ed9117aa77b1 *a30cb85b2522cfff3a6bf11f4bcca908693fe4fce31ad4ebcc2ad15236d7ac46ec2c1defa81b2d *76486968ac4bd99ae574fdcccd0f39ffc80c754601cf2469d560c3cf51a65271396b9a9c4dc3cc *aca8eb6b6170fff0432ef702cfc49ea879a2ada53f7541cb134ea4f9c5483fe4fc234bd8bb98ec *322c10da684c7294b23c97c3e58afd90f30fff702d5fed47941f72fee11f7ec8f9877ff8871f72 *fee11f57fdf83fad9c26fc260b84f30000000049454e44ae426082 newhex * rmfile ./scripts/hoogle/web/res/hoogle_large_classic.png binary ./scripts/hoogle/web/res/hoogle_small.png oldhex *89504e470d0a1a0a0000000d49484452000000a00000003a0802000000b850c55f000000017352 *474200aece1ce90000000467414d410000b18f0bfc6105000000206348524d00007a2600008084 *0000fa00000080e8000075300000ea6000003a98000017709cba513c000012714944415478daed *5c6b785355ba0e050dc8641491e1e8a870601e153d737464668e8ece39a3ce3c8c5cf4c888caa8 *a3e36d46404601011551140515a520506e96a285160abdb7699b366d53b4b79d9dfbad4dd3dcdb *a449d3266d9a26d93be7ab69d2bd57762e8c730618b39ef707ecf5ae6f7d7bbd6b7d7bdd1a5628 *9dfea5132bdd046981d3292d703aa5054ea7b4c0e99416f81249c151f2f42bd6c28d3d351fd95b *bf74c9cb3d368dff9217982443011fe9b111413ff93d179824c9ec9586bfb0b028de9a23efeb25 *2f3d8183fe507da6a360ade5e0c3dd1fdeaedef823e9daa9789794480f6249a1fbaf2c8c8a9a63 *c32479a909ecf786d671c42fb3b028564dc2ea4ad302877c1e72fd55126acb643e6c1e1ebea002 *8763accb18eca81b167cee38bbd60a5e2615783d47bc9a8545b1262d70244ae7fcd1406d994db3 *645a1579c104f60f937bff5bfbe66cd9dfa608d7804e2cec3536dedc905ce00d1c71981fc62b69 *8123495ae4a6b60ca0629fe79f1ca52704f6b943ebd8f85a161605fcb789975ce08d1c31b5d4df *2661fcb4c0dfa6510fb9798684da38bb17193c9e0b27f00636fe2a0b8b62436a026fe688a9a55e *4b0b4c49b97f34501b67f39512b598b860026f64e3eb60e046b0293581dfe488a9a5d69fa7c010 *b248e25b7c87d84504480beefb66bfb3749db5e00553d11a4be3a77d86e61198529cef4a6fa88f *909e19acfbd05ebdb5b739cbd9231b2589bfdf3379919bda3880a21d03ffcc284d1378331bdf00 *033782375213780b474c2df57a0a02c31bfa060949fe60e15fcd07ff47fbe96daa5db7aae01fc5 *6b2cea4acf79a9025b0a6d47fbc1c2eb141fa2d8395fd17cc099a2c19101a2ec35eb168e886a61 *630676e87ead55ec1beb8864a8e039cbe1fbb5d94b745fadd09f7ac6d89eed4aac1644e9ad5749 *a8063fbb57e772911746e0b7d8f82618b811bc959ac0ef70c4d4529b93090ced58b3a5f7bd9912 *6a292a3e5ba05495c16424792bb8f4fe83f776c4b3130570068c81a4a676dfa68c6761eb7491bc *70103cdaf7730df579d652a3c592c8acc7167cfb0a11b5c8966922594bf0efd8448206815872be *a39f26f05636fe260b8b626b6a026fe388a9a5de8a2f3038676af17e3a5f41e533624b0656bda9 *870826aaddaef4edbc4e9ad45418bbe6cafbbbe36e167a9dc1cc5b94892dbc3315d7f2870ffc5c *437d78e041a3c190a87dda8ff4c79a2a78c34910297f32ecc196fdce138f74efbb43bdfb2665d6 *2f34798fea053bedbdd294be1d3481b7b1f1b7595814db5213783b474c2db535bec09d559ef7a7 *8ba8e4c4a8da608df70ec37dc1ddf3e4a99b02ecbf43ed1d241917ac679f36a662e1e3ebe59937 *a9a84fb2120a0cf21c7b401b6b67cfcf3afbecc9b581feddb2d7f1c155624667a09d8fdcdda1ad *194a3ca869026f67e3efb2b028b6a726f00e8e985a6a5b1c816d52dfce1f8aa8cca4782f03c373 *07191beeec4a036311a87dfb547c5b1c83c5abadb143c7f48d172a8a25c37bedfdcf8ecc9bd5db *2fc7e3797828a1c083a62063d9f72f13e275fea4d3c6b2174ddb526822a0f9bd644a02ef60e3db *41d70876d005268220273932400ef791ce8e8015f319055ed519f7ce69226aa90f980486a9d0d1 *3bd5545a18bb66498f2c31e53c6b3bfab0f9b3ebe4b184cfae95f5998858493ec840991f71c4c7 *5fb0971c0fd457918222ff89e77a91d7197ba3a97847b31f1dbe2bf4080d5ee18b472da5a788d6 *d6904241e2fc40f603ba58df0047120adcb6c7c1580a90bfda1e4cf821166cb3c52b1b8b938bb4 *a3434472813f66e33ba01522d899811dfb4d77de6fbb8e2dd464cd57eebb5ebefb2ac9c797e3f0 *7ce7248ccaa49562125892ed8a657eb1cc54729a108b433d3da1bebe90414b16fdd91c4b2bd9d0 *870cbbb38f74239c4f67480af68cb4b7874646c6975b50445531f4c9341c619e58611e1da5ccf8 *5cc4aee9228493fdbfe69a6a92ba23e11f214f2fd531bc427c81a1eb7c797747bc56da7fb3da6a *893becec52df275351cff75c2fcf59d993bbca71ec514be6757224b7f459539069ca4213f83336 *fe090bfbae881118a24dceed6a8496fda0915b41badde857a7e4313dc23c304769314eb8eeb106 *774f43fdcc7f63402462584937efb023ccbd33a55d940d616db90721ec99292dce2310c7be8db7 *81cc1f8810f2b1f802f76b03bb260be3b5d2ae0cacb5d8174fe08a3f1911fe917b743018148a90 *c3111a180819b564e11346c4a0a4703889c07bd8f86ed84efb8e9884d5d305b6b68ec0432a67ff *35d2e293417094e1bb65087c3e5d8418fcba60a22d94b903488d4716a8abb86420c0bc0c3df823 *29c2e71f9a6888735b7a91dce34b4c4221f3882c7fc28092e30bdcbac34e6566666048f3e63f69 *a5c6126a50d97fa5186dae3c02821cf2d5cbbfb7834acbb9bbcbed261309bc8f8def853efe1d11 *2370cb361bc2c95d618501176fe659b6bc1be117ac7544f5e33d6f4272f35eb07774c4fd98c5f2 *f39fb741241f1f2b2bf448eee98d2e9b2dceb654b60b217f15476098fc9fbc434d651efd89eaf8 *af74d42787af931bba1882aabe7a086daee516f89031ac4a8adc54dabecb7169532091c007d9f8 *010889141c9a263afc03f1618ef8c89512c0d16ba44767c9beb8569e7d83227baef2d84dea9c9b *d45919b4220762042e5baa43cc9eddeee9ef8f2b8938d381f04f2e3341680aa782bb3a90dcc25d *dea1a1f89b8587fb117eee6f0dbdbde39de9cc3d9d486ef13e1fe3c082d4d33282904fc411b84f *367a80de2c798f5b8bd7a1ef2538c4e0b7f0233b422b58df6fb733d432d443644d115299e5dbd0 *7d509ac047d9f861e85911c07fb9798480477ecd27cf35869acf01c8b666b2ad85c4da42422c84 *e321717b289b23a6963a4c1718eacbbf5945251c992c2cff329060a5afe70ed10c82c0f7e8babb *c7ad7d75bd9c666d8a909b1f4c60cddce845ac9d58a8edea1a1f67f90b5488f3d5a783f116966e *338198ca8b2370dbdbbd08b3f0e3e1ee763f784b7d98bfc810db3505abcc48d9dcdb34dce5fa9a *157adee386baa78d80c6974c406b7cc97ce4329ac1532b7b90d32a9ac0c7d8f81730338ce0586a *ebe0e31c31b5d4177481894028ef463962b6be3291595bbb8f6610da71a156ad0e7f7842b9b3a4 *d4ac9c2b440ddc44db42360cb576728106662be1395dde5c05352b3b03ab2b8cbb7c81f52162ea *1493c030a92cb84545a57d395bc62d238301b268a186e63c47dc1173b854fbb81ea925759c7ac0 *60b5c617f84b369e03b546f0556a02e772c4d452c7118183a182b98af3326bc77c543ee0f442ad *5c3ede5df2ff4d46b3365d74ae36a135a1ef38dddaa9051aa9745ce0827f57a0ce17c715d86321 *10c70a9804860e0a7668b425a6f09c43b4dd8658e0bd8b1e57d42dd7239cd471fa5e5d3838310b *7c928de7424088e0646a02e771c4d452b93121baf816159570628a50509a68916fe60dd10cb2b0 *33bfd2299591afe60d0a9a9397e34de589acf53479516b91ee0221baf4a76a24b72e77349e2987 *6414219f6512b8fd752b422bdeee094fdc5c6a3fbc3edd99cee8f4229c9a9e3222c54fcf5316fc *acb360a1368c33f7eac6f1ebee33f7ebc7f180feec2263f12a0732dfa4097c8a8de7413c8ce054 *6a029fe688a9a5f263265975bfefa212007507125d3ed31c7422fca2a5a6cecef1dcaabb3a90dc *faec9104d63a735ca8b5df19349af1eec2bb4f8be4723f74c7fba2ebf20751533102c3eaa564be *82ca29b8465a5942866d4297aaba9be67ffe14a1b496b6b9866fea416a297dd70d2147a51a077c *ada035c2d06a433add38f4fa90d1184256f03481cfb0f10270288233a9097c9623a6962a881158 *f89a9546606165cfdbfcf1f7629b9f3122fc92971dd153b96f9e3420b915af3a03f10f03dbd758 *506b7fb641438caf565f34a1b94ff678bdccebb7b6bf9851728cc0b6afbd2867b10966a3d1a4de *e34008dce77ba9db96da1c1742287d6e625d87acf2bd7d0474a904c70d34818bd87821ccf72228 *4a4de0628e985aaa30466053899b46008fe72aad4666cbbe7ea274a6043158ba77243adb54673a *506b77763afa98ad057d64e51c39cadf31341839c2e8d8e74473e7a94c7a066b3e2751364b8a92 *6304c6d75a50cef621eac2da630a144fa5b573e91c85d93051e34087bf70b29046f889aac7c4e0 *12feaa054c95cd96f1166ace3dd42d5c6d71a9fc89042e65e325d0e322284d4de0328e985aaa64 *12d640171834ab9821a1715858cb667b6cc78327d24d3d08b3fc7a450d7782eb14fba00a1a2703 *93e5332f8475d92ec45ad9d5126e31190dc2036a3f1447386d1ff523ae4168c5579911da986f74 *81032364d58d725a7594f81c8d044d8bbad01a8f4fdc892783247fa10625acef454e4efb4523e5 *d345b4ba6649f9950472864113b8828d9783d31154a4267025474c2d551e23f0d8ec71b599c601 *4c117666f5539d867feb8ef6574c1122cc8a676d32196dbf9a7fbb1ae170e72adc06344c0faa47 *ab6649506bcb683b915069dd7fa850ce74919972a50462a0626b2fbc17fa0a2cac922eb0ad7e18 *35b584169fc3a9fbb80bf57fb1d14b39f2eb3ee68aadabfd4983a36dc46b273c8660d7a1feea98 *572b5fef92481286682e1baf04a723e0a6267015474c2bc524f09031507d258d16c637f769bb0e *38ad159eeea3fd2dbfef82b208a16aa6b4f46410d90dd01d74c69ae2cf935b4adc01efd8bd16ff *1069c81de0cd96221cee65c2d2ac51a793664dfbb923d61a778ab065b14ef5ae4df69ab57e8132 *96304ea30b2c596d4608e51f0cc56e428d3809a435a00d3b6504f5cbd2f45f1ae61a2f13c6b6d2 *18969aaab964eccc8626700d1baf666151d4a426700d474c2d55cd24f058af3cdc0f593466524c *c22a36b862b76121120a6e553116a9bd5ac29fa3e0fd50cc985bb5dcd2d4841e3af93d64ddb5b2 *54fca9998aa30f29028357fc1be4343ec4e75232764e0e0e089f3020a69adea57d17dc9da3fc6b *a529b61277b9a5bc841c1c4c38c91a1d22cfdda3adbb41513b43c29b2ce44163a526702d470ce4 *09c41118069672630f8d990cd5cb4cd5d524e37cdbd9eaad9d869f9735de3c259ce133b682e9c4 *40f2e293b0da17fa9087351481ed0dc368ee62636c7c1e3f612bf3a0f661aae8a0b5f6a06654b0 *5093d8abda79ca8a6d1e1e8f8c3ddf44051eeb35ee90544a0a5bc9967a5270265077c0db94c29f *aed473c475b0b48d228ec0618d3b3f75f0a78968fc38e02d32941733f7caf020b09e1de4b3f154 *4c8d6196b4f4e0282c16e31dcecb579b135ba85ed95395e5439da408ac586341722b22fb1b0ced *364c365e2ba392f99385f21ab42f7b3d24be77b0f61e5dfd355268d8712647cc9fafaa596602fb *dc7212d6f4092e87b0925dd54c7e314c57e1ad7acfcd5ddf5ff5b2a3e6a95ede720bbf828c6f93 *b4b6f804f7e9ea33b07a16331aae9454ad71c07500972bc98dc35ede50e38f65f1ec4c60ae123e *bdb0ff9ce075600359b1ce5a3f59c8e0cf1461f533366e25693ee743b26a179bc202c357f3dc8d *725aa9ab99e373d479f59bbdf5b76af80bb575bfeeae5d6c8476abf9dc1bbba00726dca356cac8 *563ed9581ce497100dd564f337246cc641ef497a3bf31ff007e0e0015403476c3015824340a835 *7c1897e86ab49754568fd63fd3d3707b87e01a69e3e5384030535a7f6767cd4b7da5278210d946 *4753aa7dd04ab4bcdcdb3843d2c8c218009f8f277a2032c30e6df2ce4a905d5c6fc3eff48259b2 *c629c2c6c942012c3c1ed097678e080424ec7ef4e33ec47eedc36693e9dbe0d715687bcc58fb90 *b9f60f16de53bd352fdab9efb8e3c5e7896f9632040b04d89902f7c00e5c5df2ffa37f07e042fe *8403bc8cc9444a45d03789a64a42c027dbda48d87b83a63cafebddd0bdf41aa2f993c1ba3f581a *eeee6abcbdb3e197daba65a6aad75d65f904d83cafbff7826eaa92932d35446319d1504b62d858 *bb87fde96ff735c16c8882daa77aa3a737303987d16c368f5f3183be9e621ffd7f4dff3abfd101 *1a8090d0c43020201ac39e7b784024ee2bf089813f6c49b13ff5f187cfb1302a6a5639909b3417 *5bfabeff088b471f6c992dc5eed0c8967777aeb71af7396de59e6113f3d6b671bff36b164605f7 *7d4f82cb2469812f7c1ab612cd2c0c8170993e36aac37e16fe0b0d8d0997497283c1605ae08b38 *c172a5e52a490bec8d53d07c85a8abc23bb1394c92c386806aa51ea17d7daba6b1e162ff3da1ef *bbc0209eec415d2b0b43c1c6a5f769d5cf18958feb45bfec689d8ac7726a5f71464fa9d3025fbc *c956e2661038199ae728cacf123e5f5ae08b7f100749c543ba3638924b19ad57882a760d27b88c *9d16f8e24aa3cea0f42e4d3b1cc9a580961fcb2b3f196e6b0b91645ae04b68b6e521641b6d6db3 *6571a59d84b5dea0e03f6f2f3b4dc0529bb8447e67262d3065d3830899bbc9f61c6ffd2b8ec6c7 *ac82a526c11293e01173fdd3bdbcd75d9559a3bceab11d60c61b5b69812fa9d1ec1fdb68846b7e *b03f0c80cd48d886bcf8e7536981bf8f292d705ae0744a0b9c4e6981d3e9c2a4ff032ee4249028 *b1d4af0000000049454e44ae426082 newhex * rmfile ./scripts/hoogle/web/res/hoogle_small.png binary ./scripts/hoogle/web/res/hoogle_small_classic.png oldhex *89504e470d0a1a0a0000000d49484452000000a00000003a0802000000b850c55f000000097048 *597300000ec300000ec301c76fa86400001a234944415478daed9d075854d7b6c735f992fbe2b5 *c486d81503a2d1708d0545c15eae2dc5dec5165b346a2c895163d4d85141b140440504c402828a *62a1aa208aa2147b8bd8252a2ad8f27e67169e9ccc0c23e6beab3cc3fef637df613cb366eff55f *7ded33e6fb3d6fbcd5235f1e0bfe16008f9c7aaa4cbde88a0df737e892d069cc857e535307fe74 *edc5bc3a60fad5ee132ed8753b56c12edabc4e54a50611696969f7efdf7ffcf8b14a688ad3f9d2 *75a32d1c62ecba267cf9cd79c71faff2419588e3b4d4aee32f38f43a5ece36a254edc882d67ba1 *70efde3d2d85bcf1dfd5e0478f1ea59c4c5de47aa06aa3ed964d0f36e99bdc7af069a67dafa4ca *0d238a7de4316cf4fa2d8151c78e1d4b4e4e3e77eedcf5ebd7f51082c29973d797ae3a60d36c3b *483bf44e120a4dfaa658d84717b558356098d706ffbd42e1ecd9b3d7ae5dcbc3f8f5019c9e9e7e *e3c60d90db177eb846cbfd36ed8f36714c6e3638a55cfdfd052af97ffbbdc7faf5eb8382822222 *22e2e2e2525252ae5cb9f2db6fbf656666aa141e3c7870f3e6cdf3e7cf47ef8fff579b689b76f1 *f67d939a0f3959d9e1e03f2d368ff8c61d0a5bb76e85c2a14387c0f8d75f7fd5a3f0b68ee72fc6 *9b04f8d9b367e8d3d5ab574168d8e42375be48009ea68352cceb4496acb6dec9c9c9dddd1d8063 *62624e9d3a75f9f2e5dbb76f67646468170d05ecb65098302b1e0a0d7b270270f9fa51452cfd17 *2c7472737303e083070f9e3c79120ab76eddd2a3f0968d3d77c2a79e9efd55ec379323a6c727c6 *b36538fcf4e9d337166481100613a63baf396fdbf978c35e890efd934ad58ef8a89ed7a2458b7c *7c7ca2a3a32f5ebc88aea3762cd4101ba1c0bfaef6bf54bfcb71bb1e279a0c482e671b55cec607 *11f1f6f68e8c8c047e1314de9ab1fab257b7f8012d77756c10d0acd6a6860d5637d911ba03bb75 *e7ce1db8f486a368afc09bf5bb2a00dbf74b4283abd6f75aba74e9962d5b4e9c38013639a1bb2d *2cad41d7130dba9f4044cad68bac5cc7c7c5c565e3c68d09090968f95b6f930fa71d6db6b7a385 *c7c7e55d2ccbb95429ef51b5c22fd66d1776c40482f1ebe480718037edbcdda0db09006ea403d8 *c6619dababebb66ddbce9c39837ee7846e48445ac3ee890dba2b36a0ac6d14002f5bb60cfb8c71 *26167b8b1597ad61c306440d2f31adac4def5a1d8676b4756c50707cf1e2abca179b5f66c90ae7 *3d7bf660ab5f9ba1360ef0e65db7ed0c00deb1630721580e632201d8ae870ab02f000707072322 *00fc9afdd06b06f8f6c33b95665b7f3d6f341e2d303070f7eeddab82dc8bcc322bb1b47cff0503 *fdfdfdc9237268085f1fc02b56ac080909c17dfe6580c506901d6103de6280196197236cbeaf4d *284a3809c6e82bc9c2d46dd38b2c31af37b711a10c79044966ae02d8138077eedc79e1c285ff04 *606cc0df01e05f62d68cdb30914cf2f8f1e3a74f9f9644ff7e66bad9b20a857f36f3f6f54655e0 *c3eb09b55e37c018f9b73b356284c687ee39b2e7a26e505a50df1fb46358d185a5677bccc55511 *6ce6309af97f09f05b1f45c3a534dda0f8a3beb93d25a4847339c765837055586ff225d3be3c0f *e0dc3ba41ec0d0dae1f4c7e9e6cb2bd55960071fc2c2c22805e61e80d7bd36809fa5dfbb1f1672 *cf65d6dd59e3995cdcf75ef5e85014efff85c2c8d327f71e3f389a7967fee34b636572fde84e20 *efffe5324bc6e3e7e98ff4e7dd07cf9837ef3dbd7233e3c99327d9516eecdfbaf08c9241db8377 *edda454261c20d6747013ec00d7802678439b02bf3da95ecb6935b3498c53d493af660d290847a *95f79779679b7509e6b1aa1ff2e7257b2b65b6ad7be1a7f1ecc404fbb4035c81f35ed83bc9fef9 *0f7abcc3e422757b7ede791afb6e7a4c851bc786dfbd7309257b29356e8849793863c3a3ceb3ef *b79e96ceeba0e519a33c3278e5fad3d1f74bf7bc5ea87d62f156db6dba6d5ee275382dedb7ec3a *28a3a326983b575ee2e90c2b70c3269869b82af60ea2b002b6fcc19cb675853f3087e2b1e17672 *04f0270e6bff22c0dd73043052294b67dd01437a47787944ee0e65eef6f7db326dd216dbaa6c86 *09f06ce974e0c6870f1f9ad0bfe7cf33515350dcbd2cdf8eb59f45eef13a10b92f22223c34c46f *e7c689895b6b08ccbc727d26fe1713d4045a50043fcb5e095d2645371e11c7c5a7c3af80b4ddf8 *07405baa7d945dffad40db6ee0f280908367cf9e23b082a621b5874f1fb60fef66b1fae3212e43 *29ea51d5277dca616e9d11b2092c15fe746923fc31644e482bdbd4e444d94e4e01a65459d6767f *ad56413f2ff0f2dd1219137fe9cce58717af3ec9765e535e2fa43ef60b496bda2f25271a8c6062 *8a41779965c9c0d5cbb15ddb5f0c0a7b9b366d727773631b6c40a67fc9fc27962f923ea3212a8a *ed7dd815fc36ccfd70c796257bf6ecd5a3e6e5e5b975c5bf449b45b90fed99253aa7478d3f5d77 *65561f760f08d14b3a604809cbf358bf0d44813c7fcbd3f99bc416b2f7193e61316421cebf721b *c133cb33e4ea868b5b5a877d517d5dedfa3f355ab3664d7878380dd39ca08b1d1674fd962e901d *05e9861e73e00cd77cbb16e39700dc7ae4e94f3f3f46ebb0b9e3c98e23cf751891d3d96ee8d966 *fd535a7c75d234c059e8b6ad0bbaacdecfcf4fd8447de0906e70c17ef4b6c1448a0d5141774117 *ddf5fd393fd436e986213515630138d8291f18ebd937411735c5f0ae5c132062b74b37020202a0 *80ca82ae32ebf9e7afe904c62c1eee53ae0736430d7ef2fc499f98210edbdb5879d97c38c18cda *3ed930dc30ed204477ef0deb0abade6386cb8e5809a2461cce2bd7ec543418b63817cbcf6da9a9 *a92c4028bf04e016434f56b68f2e55c3f7e3062b6cecddea345d63dbc2d3b6e5cb662bef4f9a06 *5ab78c73e89f6c0260a44c891474ab9fd0b10d28c2387844250f31bca61bf48ca9cef3e6bab93f *6b0146208ec7c569bb6fec07cbfcfbd98258e659e3eb0835f0d05263e71498e00ba6420066723f *ea7e24662712838317523be2d271b15863db2fe68ad8b18623478e801faf905deceaa92a31189b *39b8700fffc457183dc5107265779bc8ce15d75b57f0aafac1cca293674ea67993949464fabc03 *0a405c82024cb62cadee886fc111c019f625cc89e9dc02ce80eeb8e2ef317149b462652f2ff3c1 *7d93cc6b47e083e7cf9fbf6ad52af6109cb331d329b4de97c7b3ba49c600562c4f5888a82f6bfa *79d40836803cb262e9343fd50df60fbfd809a8e063548cd90cde9a7d8aa82a25fe07477fbf5114 *e3bc70ccbb33a70ce4eb3062e0c156c56431d833d7b006558ed9f2996aa5d1789f651da0261243 *303cce2703f5c5fcb6ea35471626aa891040903ba1804b56006e79fa9d863b51e2efe66e427a84 *82a15e0e8e1bd57c6787729e96e61e950b2d34ebf5431f5f5fdfc3870f9b284a6b1560b4ad0d3b *82ffc8abf878f622cc3977e2383c8427b0b14b91f7b873f37a6f9533398ba21b7b2e5ebc18b701 *cbf6eedd1b9e83b1d8eda0e928fad9e34cd0453c593d2bfb71fa8f8827b209ba7a7132fb64adac *18b5d3da22849a5883ddb24f05bd875d515fd01ad5e37f841a3619300cccf873a82131045f00cc *1480110ba230206479a82f001349015b87eea300187bc817c9c2643d50f0d9b4ebbd0e37558011 *0559bf612136eae641d4b7d2fa6ae59caa941d52b198739946df37f6f4f4444a3803f352f565b3 *62e190722c84ba2389ab093c6108dce8d3b4eeb03eede6cc9a811ca027609f638075dd244c4a6c *6c2c085dcec1581f70d674a93233218ed5dfe9d152448f65a12570cd68211396a13a08af2409aa *395a397b024a831288fae27d71a802309e529562239a71ef1e1a49142d79149f0260a8c117be68 *61f043b220ecb3008c8956f9a547012100e37cf611dc69d3620cf613f3606875471f99d466f797 *e53caddefdbac0d049432b2cb3acf4bd155d877dfbf6c1ab6c63abb01005607b2b0118918503b2 *0ce19ee44bebda37269c86bdf090891cb08c57d4605da10378c8cda9bd3dc9c1d81676db04c030 *88c850ecb340356ffe3cc4130532da8750628d8c0ce03f36b21f1b1625e653f33bb51735a57681 *fa8216ba08c0ec13cf84b08b1f3292253f7eccbfa6848f947c4900c673a3522084fa4a6a24b0a1 *1088915edc241406cd3b4b98adb8e19a4e65eb4f347ae7f1b4a436919daaf8d6acec5aadccc00a *d8c2466ecdfe31bd88df46bfd0d050ee375aee10164961400056e42ce1306fa215522ac049912c *b153c90e2492878dd05463c63753c9529c87cb2c75f540b578f112cc2050651755b261164d8284 *4c20b90230fe066905786a1a000c542ac026c44524064d250946e9f9147196002c41c0c8a5b7c9 *7115806bb9031b9c35844de9fbdebeede47b913b1580ad26210ab018b5d6cb91a61c9fd9765fe7 *f25e56ef4f2cd46d5477f830d0fbab224ea59c3c17490c4883dca8088a0366b3b0889d121e1385 *802baf44ceb8273565e2956b649d75aa519eecfd0d54b2d80fcc52ca90c3baaa00030900c3b2ec *cb17cf31c529bb43905f94580518530c240fcff614a8c49b420d5dc46b9ae84bb2864b670ef029 *9458004632c0123f8a5e52c15002285d0a347dae9bc0a6b736de71dbaa00acf860ab4918734380 *2f3eb8dc26a25335ffda55dcab17ee5e1443c5c134d7901566ae15862e1f01c0ec9a9e84d1e509 *8b04605cac92470407923bb042e094cc8d0b28f0a54839eaa178ab17d0beb15a340003a476f512 *450389090d568ac01919a9b107f8941a3402b04042dd510016634b146d5a8345459403843115b4 *008310fca2acf147785ccb9de809e5308c9ec0608edf2dcb015711821235fa7f3bc188ae2f38e9 *d2364c51dfc23f966c35a835c75a6825c527c7975d65e130af19201190720e353b80916615609c *abc009a3d81daf6c5c54166b945d3dee0d002c2128b55359bdea4d5f0a090e95529c1660e24689 *96558055630b2f8cc63b5a9bcfd7dd3f5a438a9aa04b082a00435089b09ac42ad1134a5ccf9f5a *876100c84670d55442447dd14ef1176aa27f2bf376db882e9f6cae5f698df57bfd0a4c9f399d4c *64fffefdc8b19d6fd3a2534ac152dc30cd7f4360d0454cb49645e88014094ee986349b556b9c9d *62bc1980599fe24d7521b1e43c7f785393902855401dc07c849c0f484483f1a6122e91f3784c53 *52613c1391a489ce151c81d100ac86660230d4b0f9d423515f99000c8ad49951146d5d8560dbbc *eb1989b489dbd13089f8d47bdccead6d1fde15f52d35a7423d475b6767678e68419c558ddc3ba6 *d07c33373f77b8cac10f43ae2a99e1c6f55a162daa575dc2636c09b89a2ec8bf61805925de549b *d422a1a4b986b18c1e24a2c1786e49eab18af8603c10e1a524b56ace4318022bd103134e5de926 *9db3e653629fc5c6ca2317c04ce1824207265a993a8ca7b85fa6f740439057226dd0a58005b4e8 *2ebb43bda40e2cdf98fee441c7e81e75031dcaafb37af7ab0fc64e1ec793039cc6c26c70834782 *a7f94a0b47d7c1f084e4d3b0eb001d2a18d25b93e21d5c6253d9e57e6fa8e1dfdd38c07090854a *814dc5182b0d5bd112138134a921568b481274b1cf621521a5507b5199c2dea2c46ef3fe6dd471 *6a0156b2e717b511a8a9b938fac10a7119c4f6942a4111350563e26aca5ba4c858665c2fef53b0 *447125f554cb5842dfeb821ff6b9bcb755c54556968ed64b962c9163e172c623e5cec9d26e1655 *e655c725533bd236ff9de35c2fdcbe48e405c1039d9a6b5984121f8e89d11a92bf08b04ff02de0 *916e52e9ba51d51b7abf2ac0dbc3d31af54842831b3b26ab00c33efc0d4116760c41a661a05d3d *e5656e904a8d89d29d6a9f5138b18a37748362b2b67f00c654a64cb861a84957913b01d871443f *5628b1b79400111a9492af00f80123a6d04e40a709b001582972d5f3972aa6d4cf0143dbfcc878 *96d9ed80a3fdb6d6e5bcacdefbe69f03c70e5cb972a59c8856b3de1a5e758ab99499ed3d176f42 *515af52656ce358f9d4fe0cec4c4c4c8c0cdda0a3c93b2c62b29b17180d705deb2ef99d4a85712 *fac743a155ed7c5ff5d8ecc69d771af7496ed833b1c9c0e4f20da22bd5f1578fce0330bc904a10 *a9baba746063f57a3523bdd29daabef84b295789de30b8a0dd2bbd7dc1989691242d46e55d39ec *71ce5ad457a8692b560474520327e6e25b444d99404b65435264945bd55dbdd656d09590d6e15f *56f0ae6ae15addac7b69a7454e549eb14fda0c6a50e8f04aebaad558fae93a1f4f9ee8e1202dd8 *27fc9658748a79524a128e393e3e5e8f453269091bf67df5d28d9700bcd4fb46933ec90efd9278 *b2a87c830315eb04bceac1f7d59b6fd22eb4ef93c4f38995ec0f96a8b15d3df8ceca24f6435931 *8380aa5d3de93c6a6758b0a4762d8511bc2f651d096aa4442ca79f3009e81f3d034cb43a69f86b *fde29fecf3a5b1a83bde57d065836aa5576e909a33f4c10f6c201ebc7d17002b29b2ae83848726 *45d696a9b396fafc59bf9861cd76b42be765f9c1c4225f0eef0471690e6a2b6b41a7b6975b6355 *c5bb66638f568b363ae389c32e46f53f3cfce3b1367cd781030740575844ab540f63f840946a78 *be8577789f6492f72504330ef09879575a0e38d974604acb61a72c9b1e32af133e6fe12a812787 *47e6263b5f6d35e814145a8f3855b5f921b34f2367cc762786e4b4304e48b44ad40e0385f7457d *9959123aa43712aa622ca55769aa900e922d60336199b6e22a6510fec4c8e37d898a99283118e3 *9b296868e51dd74b6144d02563c691e36bf9a09e13fdfdc573287c165f8e007143566db2e56932 *2889b127bb44f34f5af5dd732dbc7564275a0b95dcab15e85d78f6dcd9f415c04fef1865e6d34c *4bb79ad57c6adb06347508fdf76731bd98159cadba4fe841d99f700c7b79f7ee5dbe940224de57 *cb22a69c6f812d72728db4939806160130e6442a1e46006691bb6233ba7c7ba956c763555bc659 *358fabd828a64a93436dfa46aef10ac66ee4e4998bbd8733ba4eb85cf78be3d6ad0e5bea285838 *c436ef1dedb666ebd1a34759b498415600e348ecd800b0019e760f2cf7fcb8414cb536891cb8ea *86da58d4861bc82c7f2a362d2080b601a930ce5560c60ed357205766921749a48d1c4047a84963 *511a5946c33151686e088d4a5652235d8aac4efa86dab6d5e0d8af6b07da9bafb5f870aa59b3c1 *2dc4748193a1f15b17e35d704ec9aa9e3615bdad2badaf5ed6f9a3829f1799bf64017d0834189a *4a327deb16f603f7a1aa811ed2aa834308086b600b464b7db8370b60bfe01bdfcf3f3fcdf952a7 *af93eb768cac62175cacea8682957d9985abf815b7f62f536bab45a3bd6dfa440f9978e4db1949 *f85196abad920786de9a38e7ec77f3cf751975aaee67073eb20b2a5ecd9f8f17b25066316bffb2 *b5b75a34dcd3b67fccd0ef8e0cfdee28145881d840300615d4089831bf2c94804b26d6099743b7 *84aaba1ca590a6b7b48df5ce60f027ec002a000339b4139899aba697a7a5cfc42b63b471d5c45f *dca35293b6b1d133409c982429e27407b1152134265aad7e2829b2ee5007ef70564b3c4bc4e9a8 *e2c3cc0b742efccee7efbfdbfcfd197367529b04adecda822e5b96161d62f68f2185deef5be0c3 *76c5464d1c453625d50fa951c3222c04b12418e34ae00f9a208d7d99fc09f6c8343b925217c2a4 *3e7b9d05f0fe2377d76d4a75f7b9b0c42d71f6e2fd3fcede3571ca96a1a3d6f61eb8aca7e3d29e *8e2e3d07b80e18e139f6871d339c0e2e5a79541edfe6bb558c0f25dc5fbbf10a149cdd93e72e89 *9d0e85a901c3be59f782c25228380e5f3be687909f16ee9fb538f6d2a54b523b85081772320176 *030c48f3ca3588ca291929a9f327176c00539cdd292ab10aec106a7044a849acab5263a8d4f076 *dade8b96d4a92b199ca4e4d024211510caa1494e6371b82e2b777a81b198eb8e5f07ca5919741d *fe60ab78ec8cefc238937d18ed28c809ead46ba91b776f5ae9bb2a2838884087800b57889d93f5 *888f0063d480654b544f062153cdc2d54361a83ba2a69e3bf8d34f3820652c053bcc49036aa43c *edb9e9cf8348016124ba9312a8e14f380015f64128e0450c29b0016a75c823cf910a85ace6922e *64650f0023c7c918d22761d1bc49ac21dd12b6ca52b33b3c2b184b228b5ef22913d4902ab5f7a2 *a5c6890eaa54e82bd698486ae077fef4f6f994ac0d562234301798c158acb414bcc8a3e44016ee *968b0bba41786ca2de22187303f79fd10d4ad3dafb0527b824828b7ccb1ac4bf888be14fddaf6b *84c3404157dd513eedd3162c8b8c1bdfce23536466278c0df9fd142414d3ca3ab421893caf01cb *5e4a0174d16095827838f6805ef2711494db8ebd185c4be955fdd116d369be4a8d9bf988516abc *29d4a439ade53e8a2bd698c3944048cd524f3e78156701cc6833d00ac672324baa2bff87bf2ca3 *469ac8b4fc8e8aec084de5bba4722ebf6b23ae57af84994fef899af41c0fa379d87f424180118b *04eb019be5f22a49b39c42ca7989ce909a3a4d50e3e904e9f6832e9d60c97d31f562cce5d05db2 *6ec0533406982980688f5752db92d8febff1448cc0ace58f0cd991d1ae43de0fa1fd897dab231f *6515aa6a3a51bd4247a550a5365c453e84bf52b2469bf1be59bd45ab49e02d27b35ec36ab5e3d5 *2a597fcf81b9467d392d8bfa0295944241574e5beae987f84509daf1d0786bc54a5b4d422ca4ef *994b369507f0ef5aef0bba785fd14500568f276677524c4de5b3d227dda7e4e85d1ec0b9ce3e9f *bd7813746913c9294974f1a52d6ac118381b8ebb8e0fe65c8734b8f200ce8d00635729432a479d *7511d3476dddb23b06abf7412a214a815ad7f9c76de799e85c0a300e9552b33c8d22792dd1939c *413011c560bd9533b6f63e9caa447de54c0821581ec0b90e605021ad24c2520feb480d92fa7376 *e76370dba0cb6d64cc5273505b207900e73a80e52c11950d8cb35a6d56fc71cbd3b858ceeb78ed *4de7a9160c32af54a7b30ec7d7f3a7d445ae2ce524022e13c748f2007e93437a151486808ad31a *4ab559771a2baba9a03b48fbc76c124b751a1b8e404835946208c6599e6eca3d3f239407b0be12 *135561a8c118874a200dd2f41898986e2617808acace5bb99bfebf942d1972a0550ad1b9ea47a2 *f200d68f9840887a38ba280f9e131583b41c0a502bfbf2c430b8a2bbf27482daa1cb6dbff19607 *b0718cf1a3f86379480414c5c5aad04ae755fb6c41763f299107702eb5d52accd2dda29e252d29 *107df15f1228cfd8a3b52f7db6200fe05c0db3f4a3a481a30e6985e5665cf300febb8c3c80dff2 *f1bf9815a7911cb820dc0000000049454e44ae426082 newhex * rmfile ./scripts/hoogle/web/res/hoogle_small_classic.png binary ./scripts/hoogle/web/res/icons.png oldhex *89504e470d0a1a0a0000000d494844520000002a0000010d0802000000f67f6036000000017352 *474200aece1ce90000000467414d410000b18f0bfc6105000000206348524d00007a2600008084 *0000fa00000080e8000075300000ea6000003a98000017709cba513c000010694944415478daed *9d4d681c4716c7ebe8a38f3afa62f0d1471f7cd05147f9a6a3c1b018f6a2830e5e58d6818d9009 *09ce06110536c40eca622f8475b484d8048382c322e31844c88222421024a05988411811b4d91c *667f3d6fe6cdebfaeaea995192431745e8e9e9aeffabf7f1af57a5ccb3ebffaacd4df0cec9497f *7bbbea1b1bfd9b3787d70707a70c0fc6f272ffdcb9be73f17ef66cffead5febd7b957c338367ac *dbb7fb737349d4b09f39d35f5a2ad24703fc9d3b91e95ebcd85f5cacd4ae9d49cfcf57a8de9368 *abd79b08fee8a8bfb0501bebd2a5cad8f9393d785089e25904abb583dfdbeb5fb8509beec3872d *1c0a11518f1502f395c2efec5422abeccc78b2c638c86d0dd10c8fe0ea65587d7777aab0c66df1 *4195209c89f39e5679b9c0fc3369f8a64684e7073578951405e45d6c7fbffffc797f75b51a8e8b *c66647b6b13086c7b95446cc966a409e3fef071877ae5cc979387a2570e4614489c0abdaa33e42 *639621b0d7112ed588267d4c5dca69bcaa72a22647db1e361fa5974b70fdfaf019c2b206af0c93 *0a5074eb611c1e8ed782cb976b62e9575ec3eaca8ce2014e0c2377997acad12cf6fa7ae4192bc1 *b56b4905dcb8317c063a1fc2b346c92df832e56e3a3430133f23aa9267d0f7105ea322c5ac2893 *d1e98c1b9d7a393c4d680d7da375677dbe7c9dce2b1f4729e100fcdfa938d0fbc4cd73cc0c01d0 *086c5576052f1f58e22668d8c5ce3bef77d2d6d6c6dee72057f940bed0b68544d4882d298c3c5c *ad05c4df64f0211195605bf84a0daa7c96d7897d2d4f76a905b09283cf92cd1109ada66eb13737 *5bbcabd45b71009f752dcaa785b611fd8561163625f86a110a89b0a4599229577b48f02e24c2c2 *d9637be9291e8c368fe09d4784e5fa9fac69062c043f84d7e41cbf683bfb72db934469022d043f *84afe83748450a6d4ff417b630a172e14aa0a9c86ce135a162ea6a62174d455239cfc4f050bb6e *5dece0b5449b6d800e9adf55b5b23dc9a36ed9a076bbacbb1425e5b786adf67b6a72e8d58b2c17 *d20202366e0dcb4f2454e75836746a17d59595002e9ae0e08441944c33ba74296a542b281f1432 *929c86e8a465bb989a40ee74034ff40e2cd00a375372c8d982770c433c6752c886c315903c3568 *c7999186ae0b667806d3e8bcaed07b11a2fc7409e2626999fdb91eb3410e66ec9d3761236ea2e7 *56a76a131e2bfecaa79a1d7c07dfc177f01d7c07dfc19f2afcc1d1c1ed9ddbd73fbe3e7f779e7e *e6d533676f9d95ebe547cb7776ef1c9d1ccd1ebe77dcbbb97df3c2fa05f78a6bec88b2f1c506af *cc009ed9dc787c83599600db8e5690f8e4e793c9e1d133a3d84151004ade3ed8c60af6c9dddeee *c36f1ef2d5b937cfd9e7e75e9fbbf7d5bdd6f0488d81ed404b1f2eedfdb057948e1e6ca37ffb2e *62b580c76c97debd646dc9e4dabaf483bd07d6571824ea952e9cf7c5772eea6b38d13471c5bc75 *a8850f169ae117ef2faaefa0c6e9231bdbabe78656a8c1e3e4f21c2fec7cbf332b6ec110aa03b8 *210e0f9e3e9471d7fd17fb2b9fae5c7eeff2f9b7ce6be723370f8f0f536fad7dbea613b35163fe *8e3732393e1f1d82d1afdcbf928975e44088e489dec8ac5cf8f0aa1f4c1e25ace787cf19bd8470 *d044149ef05127d0501ac26ba44135518587d8aaf9500294940f0458640c8f31e42e9c15a54926 *e4cd6ff3cb4d2bdcb5ad6b9e045b5f6f4519456814350850054f70cb3bb074f80e4825baf52448 *29e0ea4757e501487a08af1c190d363b75549d716f7d5262e1f8a7e3280dc833c8318457cd47ad *6ee7c41473678dcfd6579face6c90a9d8b0342c915b41a1e1d4447b4f033e1415d152b78651bd1 *867f76fb64d5c2a38ce9e1d5d678a2d38887711b0d3f130e26ea34fa2b12ceb8fd69c0abf363ca *2a003249c169c02bfb92bf0c345067a2d3865786250119d83fedf99eebc1fcb3f27cc26f18f71e *1166288f38ccc73d1a821b32f1a971ce023b84f788d05b64eda29262dca8a5a2ace711bc0b89d0 *6bde1a1f5d4b68dc2f591a3c82779608f96fb8d857e1515f67430978c65b79ed9268977c8fe09d *170c51ff0fd7535482a5f14460c26f5353579f578a739e5c3615c92cf9f9942bcacd4aaf56c7e3 *5c4fb73598279a7484b38c6247839310d75d07696724d5d45424936d62f5941a24e4a2de4e638f *114da85ccacba2499f2601b2b4230a908d6bbc06366af7368a2edcd5966c0d0b1b3ab7db4dccdf *bcc5b47b5b5e2e3c28081b916df7dbd6e40d1b6cdd94e84141ab53132456858bce53db2697d998 *d9b3050e0a10a2718b4fd062327b1a820232fbf3dce906604a47f68003d2401416083c8ececcf8 *181e6d088be7d5d67cb4149e56947422ade450a2f4600d4d941c6e2128b1e39dfcccf2581139d0 *071848a39d65949b13c44877a8dac177f01d7c07dfc177f0bf61f8ff9df4f7b7c7fd9780ff6eb7 *ffcf9bfd3f5de8ffcec5fb1bf3fdc7b7fb2f0e660acf4419f40fe792a861fff3c5ea9519c0ffeb *4e7f65ce1f1d0530d1b7172b65d0b9a687f2f1d8ee8349e15ff6fab72e45e6d4db6b671da4fcf1 *a8253c03d94903fcef36bf07fc6ca3f63a0225848ec1a3b1df9f19beb97cb6ffecde84a18126ec *38b10009e0bfdd19bfc3a4dbb871a4319aaa010982d19c6f6ff5a0bf2c543398be3126d3d0f9d4 *c7743575a59f9b56029dd5db8b0978bc3aada5d1a9e095fe1fcf37f44f56e356509b9a68746301 *d54899607ded7233e77c92f8b1844e8f4018a97604fff7e5b1da336d1a78207586234e1cc1eb17 *f9f89e065ef8409e81d0c6f044a47a7bbe4d094f534e7cd91bc1ffe3c6f0d6671ba70e5fc71ac0 *6b54bcec9d3a3c21a0ab73058f47d4ed71baf0ea672b730378423c4608a708afe456c1abdffded *fa2f048f83cb932f0e5cb5a0c90716a85f06feeed5e193dfee64e1ffb35f8d653b9cda080f317b *6ffdf7380dafcabf1bfb15eefbd75aa478d1fe34f8ab0a3e3f56beba5e8a73a691e0e9668e796a *819761fbc924789af88d222bea38f0ac3899dca6ad0429ec3ac1b721dd72099e6e36932e29fc10 *5e89b091f84a022f838da1eb043f5a70f56ed3c6a04182a7d9dfa46ac6f1c67c7dbd579de4d38d *bc04796c9b6e8cacec32dfb593a091ec62334ca49abdbd7612bcdff4fb671c3e976a8a02948f70 *851f8f4a2568c4269e25d6e97f5d4a6f3380541f449412091a758e22955788ace436439f564911 *a557f47fa7261b7ab6a305d9546c8b49b2abef70f178a25f24a2394dde8562bfdb2dde605b8d89 *e08d7ce09d86e80444e7892cd2e5c4574f542198d077bb39f72665f28e39b893de2eba66e38567 *4984901ca830349ecc85770ea2f1dd74e85576b20511697e58d291a6ec50a2cdc11ae18b51a313 *1595902bb38efdd8e28fcd539c6a228d9c29be9cfc47f3dd996e07dfc177f01d7c07dfc1ff26e1 *299e418d01296849510c2d7149e187bdbd5383a7584dbea6a81684a0de467149c602780a2ed80a *9185bdac1866161e657aa53d655c544df90d29e56a8bbb8652f27ad62269786c694b8750f682b2 *5c8de54f78c0ab3942558a74158c04bc96e2927a2900b7aa672115576cc99244c1c618bcad3382 *f6262eafe9d58e8995710ae06dc99fe5e51984b6d6b38b951575be9397173c2a6f0c95282b6ae0 *29efa22e93aa774531356a1badac248b47a69aad62642ad6b8889628211375340ad8d9fa4eadea *bad9b2a2c6a66e4ca5aaf690b300b6d8a9ca723c23953ea3856eb49697297b3482cf54d9f20ae9 *313a65ae282c48b7f0fa58462b5ae26cc9fc1cb0d28c581db93c6209b1a30564b54a5cde220c2e *3a1e55391bc06b31d9a5a586a93716f5b4f03869286bbd88a7abb9a565c794bda312d8aa632281 *c81dc26b85bb41700de0b5bc9d129c37e9bc04618149f918ad7e0684e87f50cb7100af4b593815 *9d90a7099520536537e507ba3056f05a58d3d616f4423cbc2912e0711eb6965dcb1499d245fc80 *3f2569cd3daf9eac8245a3cb2ab96d614dad25b8b3e3c66ecf221bb24da8c0945b1462dbd57c7b *db8d4336554d376ca104ad8a5beaec2bf8a8ed332dea6b293a6ab67d5554b7eef96db1db4a60ea *f70e024f1857cb3d868de555483e1adfad2450821fd4ef752111461c5069c4f3b5a84079daaf13 *bc0b89b0d6bc3ac1a19f47cd919140fd6e40f0ae4684f554645c37562a39a662ac5c024da84604 *3f5aef3525b5e925e3da815482b0886ba1049a50cd7b7f4654eeb34b3eb3b743e0808211ad211b *4ae0ad4cbad80ff82ec8f53415491180cc3e53a4dc4a10aecb3afee2622cd5b47555d7d6924c97 *776cbe8d626bf9e87a7d4b97dc63d820c40a52467cbfe007f05b5bc9600b761a2ee91dd9ade124 *7b8cd8b629b6c7b31bb369f659de3fdcb05050f265f89afd672fdafeab199ad3d9a39044794dd7 *bc2a6ba4160ac1635ea9cdf476d1350ce41de69094c29a9c3c9025685eca051fa33545f9982ded *e99aede79d5614f6b24389b2932de647c05897ccd714a52077d9a144cb733d066568dc020ca9a8 *2a1dcfe266db9aa2dda16a07dfc177f01d7c07dfc177f07efbf9e4e7afee7db57d73fbeefc5dfa *9be7de7cc5bdf2eea577b9fe70e9c3cfd73eff61ef875381dfbdb37b7ff13e608d1d991e2d3fea *edf66603bff7604f66d9b6236ea33272f0cce09d8befd8116f9dbd8592d1fff73bdfdb278f7bc7 *541addb9bd83153c21d0c424f0df3cfc06301d65fdc23aa825fa4414205f3df3aabe8b4c274727 *2de09987befcfadceb5f6c7cd1d6a58f0e8ed0937588a8215c1e3b237849b32ae402991ae07941 *b13fbefe319136656433690ca716f426e33c5f5361c19e15b7e00d1a3b1f2c7c9084573fe7a1e9 *e73dc43e3cf626867123f038b6fada34f6b6edc9ea93b7cebff5e9caa7a9f19db22977e5ebc200 *cb3768e0bdcbefc9805bd786a73d28d52383213ca1255fa0ff29817f3afe093c198da97fb9f9a5 *f52db90f2b880286f0ca56506cde908cc8b4ee5fb98f6219faf079ed8cefebadaf7940278d28de *08ba70b0880ce11144ad929f19c08cceb872214872811cc824e3f02dca4f3181ae08437804915b *1f5dfda811db9bee8bfd17dcb1a23c5b7f965fb2858ff92fd7153ca8028f68a9d7989962a37334 *1fba180f4898e59b9231ef3a6bf89014adc9c589882241120f506d33696ea28c4678b215357f05 *afa4987a4186161df01812208aba9884b548861c25998bbc487654c10b1f65fc0e54bae8000c55 *80c556ff689440bd8fe8afe0754d4cbd0012c6161b0b2ad2488ca913a8278a5d320e88c9d5d32b *78e13b74107d1a3d2baa5c802d51c0470f5e1c85c81463a5b23719eaf18dc7ceae34d16546e24a *e35b2e0040ac94a3c92b29786558d61e67a938f47c5933e8a85ad55bb8d2347a3e8b4b058f0b58 *22b47ea4a90723322789f814a369cb2b5fe39c25c0595f80103c6c6131dcdbda5ee35e4ca05c24 *01222ee945c4f88cf8e844584f3cdd09114aec09118af8e2bdca622c1ed6f3d515541a090721c7 *0cfd69d04b36355cf194777107de4cbd8c40cc92f961027986ffa23ceeab4f70471d256ceae662 *41e705036a20353ba50da5fabc529c0be5caef4b266e36a1d2746f0ccfbe495391c20d62ab06c9 *6842a504e3a24b216e395b13689ee92debced38fae7eecda67956b83a75b3e3827b7cb81f83421 *474ba90ca0bcd92d9b24580d7b3c42428545944c0a946f308cdd655a9337ec70713df55291baad *3332693b0272444de9321b33cc6f0f0aa0a67c1a2e6fc16bde6988dd55b538dd405e3cc51e3288 *399083fbc06026e97c94f326ef680385e7d7a7e6b39df0b4a2a4a3796ffd9cea640b3f2a39dc92 *63adc61579f26345e4607439ddb39d9b1370e5ff0106bdcd38add8e7e40000000049454e44ae42 *6082 newhex * rmfile ./scripts/hoogle/web/res/icons.png hunk ./scripts/hoogle/web/res/quicksearch.js 1 - - -function quicksearch() -{ - if ((typeof window.sidebar == "object") && - (typeof window.sidebar.addSearchEngine == "function")) - { - window.sidebar.addSearchEngine( - "http://www-users.cs.york.ac.uk/~ndm/hoogle/hoogle.src", - "http://www-users.cs.york.ac.uk/~ndm/hoogle/hoogle.png", - "Hoogle", - "Computer"); - } - else - { - alert("You don't have a Mozilla based browser, sorry"); - } -} rmfile ./scripts/hoogle/web/res/quicksearch.js binary ./scripts/hoogle/web/res/top_left.png oldhex *89504e470d0a1a0a0000000d49484452000000070000000d080000000040a22b69000000046741 *4d410000b18f0bfc6105000000324944415408d72dc63101c0201004b073d11a60ac9b1a46c93b *8806066e4a02e60fcc4a4a4a4a4abe4bf673d568341ab0df035a53276a106e2524000000004945 *4e44ae426082 newhex * rmfile ./scripts/hoogle/web/res/top_left.png binary ./scripts/hoogle/web/res/top_right.png oldhex *89504e470d0a1a0a0000000d49484452000000070000000d080000000040a22b69000000046741 *4d410000b18f0bfc6105000000314944415408d72dc6310100200cc4c0b800038cb8c17095d441 *3430f4a73b5eab0aa7c7090909c9c81d560583c120bb54fdf506276a9b7addab0000000049454e *44ae426082 newhex * rmfile ./scripts/hoogle/web/res/top_right.png rmdir ./scripts/hoogle/web/res hunk ./scripts/hoogle/web/about.htm 1 - - - - - - Hoogle - About - - - - - -

About

- -

Acknowledgements

- -

- The code is all © Neil Mitchell 2004-2005. The initial version was done in my own time, and further refinement and reimplementation was done as part of my PhD. Various people gave lots of useful ideas, including my supervisor Colin Runciman, and various members of the Plasma group. In addition the following people have also contributed some code: -

- - -

The Data

- -

- In previous versions, all the data was taken from Zvon's Haskell Guide. Thanks to their open and friendly policy of allowing the data to be reused, this project became possible. More recent versions use the Hierarchical Libraries as distributed with GHC. -

- - - rmfile ./scripts/hoogle/web/about.htm hunk ./scripts/hoogle/web/academics.htm 1 - - - - - - Hoogle - Academics - - - - - -

Academics

- - -

Sponsorship

- -

- The main author is a PhD student supported by a studentship from the Engineering and Physical Sciences Research Council of the UK. -

- -

Related Work

- -

- A lot of related work was done by Rittri [1] and Runciman [2] in the late 80's. Since then Di Cosmo [3] has produced a book on type isomorphisms, which is also related. Unfortunately the implementations that accompanied the earlier works were for functional languages that have since become less popular, and to my knowledge no existing functional programming language has a tool such as Hoogle. -

- -
    -
  1. Mikael Rittri, Using Types as Search Keys in Function Libraries. Proceedings of the fourth international conference on Functional programming languages and computer architecture: 174-183, June 1989. (http://portal.acm.org/citation.cfm?id=99384)
  2. - -
  3. Colin Runciman and Ian Toyn, Retrieving reusable software components by polymorphic type. Journal of Functional Programming 1 (2): 191-211, April 1991. (http://portal.acm.org/citation.cfm?id=99383)
  4. - -
  5. Roberto Di Cosmo. Isomorphisms of types: from lambda-calculus to information retrieval and language design. Birkhauser, 1995. ISBN-0-8176-3763-X (http://www.pps.jussieu.fr/~dicosmo/Publications/ISObook.html)
  6. -
- - - - rmfile ./scripts/hoogle/web/academics.htm hunk ./scripts/hoogle/web/developers.htm 1 - - - - - - Hoogle - Developers - - - - - -

Developers

- -

The License

- -

- This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. -

- The work is intended to be helpful, open and free. If the license doesn't meet your needs then talk to me. -

- -

Getting the Source

- -

- darcs get http://www.cs.york.ac.uk/fp/darcs/hoogle -

- -

The Documentation

- -

- Haddock generated documentation is available here. -

- -

Contributions

- -

- Contributions are most welcome. Hoogle is written in Haskell 98 + Heirarchical Modules, I do not wish to change this. Other than that, I'm pretty flexible about most aspects of Hoogle. Some projects could be easily embarked upon are profiling, writing test frameworks and new front ends. Contact me if you have thoughts on doing something to Hoogle. -

- A wiki with the current development status, including bugs and things todo is at http://www.haskell.org/hawiki/Hoogle. -

- - - - rmfile ./scripts/hoogle/web/developers.htm hunk ./scripts/hoogle/web/download.htm 1 - - - - - - Hoogle - Download - - - - - - - - -

Download

- -

- Various aspects of this project will be available for download, as well as for use online. In the future this section will contain links to the downloads, however currently they are changing rapidly, so if you want a copy email me, or get the source. -

- -

Firefox Plugin

- -

- A Firefox plugin by Mike Dodds is available, to install click here. -

- - - rmfile ./scripts/hoogle/web/download.htm binary ./scripts/hoogle/web/favicon.ico oldhex *000001000100101010000000000028010000160000002800000010000000200000000100040000 *000000800000000000000000000000100000001000000000000000000080000080000000808000 *80000000800080008080000080808000c0c0c0000000ff0000ff000000ffff00ff000000ff00ff *00ffff0000ffffff00002222000022200000022200002222000002222002200200000022200200 *020000002222020000000000022202000000000002222200000000000022200000000000002220 *000000000000022000000000000002200000000000000200000000000200020000000000022002 *0000000000022222000000000000222000000000c3c70000e3c30000e19b0000f1bb0000f0bf00 *00f8bf0000f83f0000fc7f0000fc7f0000fe7f0000fe7f0000feff0000eeff0000e6ff0000e0ff *0000f1ff0000 newhex * rmfile ./scripts/hoogle/web/favicon.ico binary ./scripts/hoogle/web/favicon.png oldhex *89504e470d0a1a0a0000000d494844520000001000000010080200000090916836000000017352 *474200aece1ce90000000467414d410000b18f0bfc6105000000206348524d00007a2600008084 *0000fa00000080e8000075300000ea6000003a98000017709cba513c000000a24944415428cf8d *92c111c42008457f7914440174e1851e2c818b4578a381f4e01e9291c495cd321e1cc7f7e77f00 *23cab5000214f59116e27b2308ce43cd5f01d7427a4c92ed0d30ae1677b9e05f96ee653575b505 *5c0b50ed6fe050126431b0f50301921848e4d3e622910715dac64022cf368c77311e400cbbda7d *9419602c8fb8de286274e69eedd2b4de7936d7eaa5822f799c4acbe324b1ca2fbbdd7951f90059 *1f752abb4129f50000000049454e44ae426082 newhex * rmfile ./scripts/hoogle/web/favicon.png hunk ./scripts/hoogle/web/help.htm 1 - - - - - - Hoogle - Help - - - - - -

Help

- -

Your first search

- -

- The Haskell API Search can search for either names, or types. For example, to find the standard map :: (a -> b) -> [a] -> [b] function you could search for: -

- map
- (a -> b) -> [a] -> [b]
- (a -> a) -> [a] -> [a]
- (Int -> Bool) -> [Int] -> [Bool]
- [a] -> (a -> b) -> [b]
-

- -

The results in order

- -

- The API search tries to find as many results as it can. For name searchs, an exact substring of the name must match (so ap would match map). For type searches, anything that will unify is returned. In addition, arguments can be reordered - i.e. [a] -> (a -> b) -> [b] will still match map. -

- Because lots of results may be returned, they are sorted in order of usefulness. Those which are closer to the asked for information are given higher priority, those which are further are given lower priority. -

- -

Further Information

- -

- After you have found the function, you can click on it to view details. The information comes from GHC's documentation. -

- - - - - - rmfile ./scripts/hoogle/web/help.htm hunk ./scripts/hoogle/web/nodocs.htm 1 - - - - - - Hoogle - Documentation Not Found - - - - - -

Documentation Not Found

- -

- Unfortunately the function on which you requested documentation does not have any associated with it. -

- - - - rmfile ./scripts/hoogle/web/nodocs.htm rmdir ./scripts/hoogle/web hunk ./scripts/hoogle/test/data/Makefile 1 -# -# Simple Makefile for tests -# - -GHC= ghc -HC_OPTS= -O - -.PHONY: all - -all: runtests - -runtests: - $(GHC) $(HC_OPTS) --make -o $@ runtests.hs - -clean: - rm -rf hihoo hadhtml runtests - find . -name '*.hi' -o -name '*.o' | xargs rm -rf rmfile ./scripts/hoogle/test/data/Makefile hunk ./scripts/hoogle/test/data/examples/Basic.hoo 1 -module Basic -func1 :: a -> a -func2 :: Bool -> Int -func3 :: [a] -> [a] -func4 :: (a -> b) -> [a] -> [b] -data Data1 a -Data2 :: Data1 a -Data3 :: a -> Data1 a -data Data4 -Data5 :: Int -> Bool -> Data4 - rmfile ./scripts/hoogle/test/data/examples/Basic.hoo hunk ./scripts/hoogle/test/data/examples/Basic.hs 1 - --- | Some basic examples - -module Basic where - - -func1 :: a -> a -func1 x = x - - -func2 :: Bool -> Int -func2 True = 1 -func2 False = 0 - - -func3 :: [a] -> [a] -func3 x = reverse x - - -func4 :: (a -> b) -> [a] -> [b] -func4 f x = map f x - - -data Data1 a = Data2 | Data3 a - - -data Data4 = Data5 Int Bool rmfile ./scripts/hoogle/test/data/examples/Basic.hs hunk ./scripts/hoogle/test/data/examples/Classes.hoo 1 -module Classes -data Data1 -Data1 :: Data1 -instance Class1 Data1 -instance Eq Data1 -instance Show Data1 -class Class1 x -func1 :: Class1 x => x -> Bool -func2 :: Class1 x => x -> x -> x -func3 :: Class1 x => x -> x -> Bool rmfile ./scripts/hoogle/test/data/examples/Classes.hoo hunk ./scripts/hoogle/test/data/examples/Classes.hs 1 - --- basic class/instance definitions - -module Classes where - - -data Data1 = Data1 - deriving Eq - - -instance Show Data1 where - show x = "" - - -class Class1 x where - func1 :: x -> Bool - func2 :: x -> x -> x - - func3 :: x -> x -> Bool - func3 a b = func1 a && func1 b - - -instance Class1 Data1 where - func1 = error "todo" - func2 = error "todo" - rmfile ./scripts/hoogle/test/data/examples/Classes.hs hunk ./scripts/hoogle/test/data/examples/ClassesEx.hoo 1 - -module ClassesEx -class Class1 a -func1 :: Class1 a => a -> Bool -class Class1 a => Class2 a -func2 :: Class2 a => a -> Bool -data Data1 -Data1 :: Data1 -instance Class1 Data1 -instance Class2 Data1 -data Data2 a -Data2 :: a -> Data2 a -instance Class1 (Data2 a) -instance Eq a => Class2 (Data2 a) -func3 :: Class1 a => a -> Bool -func4 :: (Eq a, Class2 a) => a -> Bool -func5 :: (Class1 a, Class2 b) => a -> b -> Bool rmfile ./scripts/hoogle/test/data/examples/ClassesEx.hoo hunk ./scripts/hoogle/test/data/examples/ClassesEx.hs 1 - -module ClassesEx where - - -class Class1 a where - func1 :: a -> Bool - -class Class1 a => Class2 a where - func2 :: a -> Bool - - -data Data1 = Data1 - -data Data2 a = Data2 a - - -instance Class1 Data1 where - func1 a = True - -instance Class2 Data1 where - func2 a = False - -instance Class1 (Data2 a) where - func1 a = True - -instance Eq a => Class2 (Data2 a) where - func2 a = True - - -func3 :: Class1 a => a -> Bool -func3 x = func1 x - -func4 :: (Eq a, Class2 a) => a -> Bool -func4 x = True - -func5 :: (Class1 a, Class2 b) => a -> b -> Bool -func5 x y = True rmfile ./scripts/hoogle/test/data/examples/ClassesEx.hs hunk ./scripts/hoogle/test/data/examples/Data.hoo 1 -module Data -data Data1 a -Data2 :: a -> Int -> Data1 a -func1 :: Data1 a -> a -func2 :: Data1 a -> Int -Data3 :: Bool -> a -> Data1 a -func3 :: Data1 a -> Bool -Data4 :: Data1 a -type Type1 = Data1 Bool -newtype Data5 a -Data6 :: a -> Data5 a rmfile ./scripts/hoogle/test/data/examples/Data.hoo hunk ./scripts/hoogle/test/data/examples/Data.hs 1 - --- | More complex tests involving data - -module Data where - - -data Data1 a = Data2 {func1 :: a, func2 :: Int} - | Data3 {func3 :: Bool, func1 :: a} - | Data4 - - -type Type1 = Data1 Bool - - -newtype Data5 a = Data6 a - - rmfile ./scripts/hoogle/test/data/examples/Data.hs hunk ./scripts/hoogle/test/data/examples/GhcExts.hoo 1 - -module GhcExts -data Data1 -Data2 :: a -> (a -> Bool) -> Data1 -Data3 :: Data1 -data Baz -Baz1 :: Eq a => a -> a -> Baz -Baz2 :: Show b => b -> (b -> b) -> Baz -class Seq s a -element :: (Seq s a, Eq a) => a -> s a -> Bool -class Foo a b c -none :: Foo a b c => c -> Bool -func1 :: Int# -> Float# -func2 :: a -> b -> a -func3 :: (Ord a, Eq b) => a -> b -> a -func4 :: (a -> a) -> Int -> Int -func5 :: Eq a => ([a] -> a -> Bool) -> Int -> Int -func6 :: ((a -> a) -> Int) -> Bool -> Bool rmfile ./scripts/hoogle/test/data/examples/GhcExts.hoo hunk ./scripts/hoogle/test/data/examples/GhcExts.hs 1 -{-# OPTIONS_GHC -fglasgow-exts #-} - -module GhcExts where - -import GHC.Exts - - -data Data1 = forall a. Data2 a (a -> Bool) - | Data3 - - -data Baz = forall a. Eq a => Baz1 a a - | forall b. Show b => Baz2 b (b -> b) - - -class Seq s a where - element :: Eq a => a -> s a -> Bool - - -class Foo a b c | a b -> c where - none :: c -> Bool - - -func1 :: Int# -> Float# -func1 = error "" - -func2 :: forall a b. a -> b -> a -func2 = error "" - -func3 :: forall a b. (Ord a, Eq b) => a -> b -> a -func3 = error "" - -func4 :: (forall a. a->a) -> Int -> Int -func4 = error "" - -func5 :: (forall a. Eq a => [a] -> a -> Bool) -> Int -> Int -func5 f = error "" - -func6 :: ((forall a. a->a) -> Int) -> Bool -> Bool -func6 f = error "" - rmfile ./scripts/hoogle/test/data/examples/GhcExts.hs hunk ./scripts/hoogle/test/data/examples/Operators.hoo 1 --- Generated by Hoogle, from Haddock HTML --- (C) Neil Mitchell 2005 - -module Operators -(++++) :: a -> a -> Bool -(***) :: a -> b -> Bool -data Data1 a -(:|:) :: a -> a -> Data1 a -Data2 :: Data1 a rmfile ./scripts/hoogle/test/data/examples/Operators.hoo hunk ./scripts/hoogle/test/data/examples/Operators.hs 1 - --- | Some basic tests with operators - -module Operators where - - -(++++) :: a -> a -> Bool -a ++++ b = True - - -(***) :: a -> b -> Bool -a *** b = True - - -data Data1 a = a :|: a | Data2 rmfile ./scripts/hoogle/test/data/examples/Operators.hs rmdir ./scripts/hoogle/test/data/examples hunk ./scripts/hoogle/test/data/build-hadhtml.bat 1 -pushd ..\..\data\hadhtml -ghc --make Main -o hadhtml.exe -popd -copy ..\..\data\hadhtml\hadhtml.exe hadhtml.exe - rmfile ./scripts/hoogle/test/data/build-hadhtml.bat hunk ./scripts/hoogle/test/data/gen-hadhtml.bat 1 -REM %1 is the name of the file to convert - -md hadhtml -md hadhtml\%1 -haddock examples\%1.hs --odir=hadhtml\%1 -h -hadhtml hadhtml\%1\%1.html -move hoogle.txt hadhtml\%1.hoo rmfile ./scripts/hoogle/test/data/gen-hadhtml.bat hunk ./scripts/hoogle/test/data/gen-hihoo.bat 1 -REM %1 is the name of the file to convert - -md hihoo -md hihoo\%1 -ghc -odir hihoo\%1 -hidir hihoo\%1 -c examples\%1.hs -perl ..\..\data\hihoo\hihoo.pl hihoo\%1\%1.hi > hihoo\%1.hoo rmfile ./scripts/hoogle/test/data/gen-hihoo.bat hunk ./scripts/hoogle/test/data/gen-hihoo.sh 1 -#!/bin/sh - -if [ "x$1" = "x" ] ; then echo "usage: $0 FILE" ; exit 1 ; fi - -mkdir hihoo -mkdir hihoo/$1 -ghc -odir hihoo/$1 -hidir hihoo/$1 -c examples/$1.hs -perl ../../data/hihoo/hihoo.pl hihoo/$1/$1.hi > hihoo/$1.hoo rmfile ./scripts/hoogle/test/data/gen-hihoo.sh hunk ./scripts/hoogle/test/data/runtests.hs 1 - -module Main where - -import System -import Directory -import List - -main = do x <- getArgs - if null x - then error "Expected name of data to test against, i.e. hadhtml, hihoo" - else exec (head x) - - -exec :: String -> IO () -exec x = do tests <- gatherTests - mapM_ (clearTest x) tests - putStrLn "== Generating documentation ==" - mapM_ (runTest x) tests - putStrLn "== Checking generated docs ==" - mapM_ (checkTest x) tests - - -genHooName mode test = mode ++ "/" ++ test ++ ".hoo" - -origHooName test = genHooName "examples" test - - - - -gatherTests :: IO [String] -gatherTests = do xs <- getDirectoryContents "examples" - return $ [take (length x - 3) x | x <- xs, ".hs" `isSuffixOf` x] - - -clearTest :: String -> String -> IO () -clearTest mode test = do b <- doesFileExist file - if b then removeFile file else return () - where file = genHooName mode test - - -isWindows :: IO Bool -isWindows = do x <- getEnv "PATH" - return $ null x || head x /= '/' - - -command x = do res <- isWindows - return $ if res - then x ++ ".bat" - else "./" ++ x ++ ".sh" - - -runTest :: String -> String -> IO () -runTest mode test = do cmd <- command ("gen-" ++ mode) - system $ cmd ++ " " ++ test - return () - - -checkTest :: String -> String -> IO () -checkTest mode test = do gen <- readFile $ genHooName mode test - orig <- readFile $ origHooName test - let res = compareHoo (lines gen) (lines orig) - if null res - then putStrLn $ "Passed (" ++ test ++ ")" - else putStrLn $ "FAILED " ++ show (length res) ++ - " (" ++ test ++ ")\n" ++ - unlines res - - -compareHoo :: [String] -> [String] -> [String] -compareHoo a b = map ('+':) (diff eqLine a2 b2) ++ map ('-':) (diff eqLine b2 a2) - where - a2 = map saneLine $ filter usefulLine a - b2 = map saneLine $ filter usefulLine b - - --- list out those items in the first list that are not in the second list --- do not allow entries to be reused from the second list -diff :: (a -> a -> Bool) -> [a] -> [a] -> [a] -diff eq a b = f a [] b - where - f [] _ _ = [] - f (a:as) done (b:bs) | eq a b = f as [] (done ++ bs) - | otherwise = f (a:as) (b:done) bs - f (a:as) done [] = a : f as [] done - - -usefulLine ('-':'-':_) = False -usefulLine [] = False -usefulLine _ = True - - -saneLine (' ':' ':xs) = saneLine (' ':xs) -saneLine [' '] = [] -saneLine (x:xs) = x : saneLine xs -saneLine [] = [] - - -eqLine :: String -> String -> Bool -eqLine a b = a == b rmfile ./scripts/hoogle/test/data/runtests.hs rmdir ./scripts/hoogle/test/data rmdir ./scripts/hoogle/test hunk ./scripts/hoogle/src/Web/res/error.inc 1 - - - - - -
Invalid SearchNo results found
- -
- Error, your search was invalid:
- $ -
    -
  • This is probably a parse error, check for matching brackets etc.
  • -
-
rmfile ./scripts/hoogle/src/Web/res/error.inc hunk ./scripts/hoogle/src/Web/res/front.inc 1 - - - - - Hoogle - - - - - - - - - - - - - -
- Hoogle - 3 - [β] -
- The Haskell API Search Engine
-
-
- - -
-
- -
- Example searches:
-   map
-   (a -> b) -> [a] -> [b]
-   Ord a => [a] -> [a] -
-
- -

- "Roses are red. Violets are blue. Google rocks. Homage to you." -

- - - - - rmfile ./scripts/hoogle/src/Web/res/front.inc hunk ./scripts/hoogle/src/Web/res/front_gtk.inc 1 - - - - - Hoogle - - - - - - - - - - - - - -Gtk - -
- Hoogle - 3 - [β] - -
- The Haskell API Search Engine - Gtk2Hs edition
-
-
- - - -
-
- -
- Example searches:
-   map
-   (a -> b) -> [a] -> [b]
-   Ord a => [a] -> [a] -
-
- -

- "Roses are red. Violets are blue. Google rocks. Homage to you." -

- - - - - rmfile ./scripts/hoogle/src/Web/res/front_gtk.inc hunk ./scripts/hoogle/src/Web/res/gtk.txt 1 --- Hoogle documentation, generated by Haddock --- See Hoogle, http://www.haskell.org/hoogle/ - -module System.Glib.Types -newtype GObject -GObject :: ForeignPtr GObject -> GObject -instance GObjectClass GObject -class GObjectClass o -instance GObjectClass AboutDialog -instance GObjectClass AccelGroup -instance GObjectClass AccelLabel -instance GObjectClass AccelMap -instance GObjectClass Action -instance GObjectClass ActionGroup -instance GObjectClass Adjustment -instance GObjectClass Alignment -instance GObjectClass Arrow -instance GObjectClass AspectFrame -instance GObjectClass Bin -instance GObjectClass Box -instance GObjectClass Button -instance GObjectClass ButtonBox -instance GObjectClass CList -instance GObjectClass CTree -instance GObjectClass Calendar -instance GObjectClass CellRenderer -instance GObjectClass CellRendererPixbuf -instance GObjectClass CellRendererText -instance GObjectClass CellRendererToggle -instance GObjectClass CellView -instance GObjectClass CheckButton -instance GObjectClass CheckMenuItem -instance GObjectClass Clipboard -instance GObjectClass ColorButton -instance GObjectClass ColorSelection -instance GObjectClass ColorSelectionDialog -instance GObjectClass Colormap -instance GObjectClass Combo -instance GObjectClass ComboBox -instance GObjectClass ComboBoxEntry -instance GObjectClass Container -instance GObjectClass Curve -instance GObjectClass Dialog -instance GObjectClass Display -instance GObjectClass DragContext -instance GObjectClass DrawWindow -instance GObjectClass Drawable -instance GObjectClass DrawingArea -instance GObjectClass Editable -instance GObjectClass Entry -instance GObjectClass EntryCompletion -instance GObjectClass EventBox -instance GObjectClass Expander -instance GObjectClass FileChooser -instance GObjectClass FileChooserButton -instance GObjectClass FileChooserDialog -instance GObjectClass FileChooserWidget -instance GObjectClass FileFilter -instance GObjectClass FileSelection -instance GObjectClass Fixed -instance GObjectClass Font -instance GObjectClass FontButton -instance GObjectClass FontFace -instance GObjectClass FontFamily -instance GObjectClass FontMap -instance GObjectClass FontSelection -instance GObjectClass FontSelectionDialog -instance GObjectClass FontSet -instance GObjectClass Frame -instance GObjectClass GC -instance GObjectClass GConf -instance GObjectClass GObject -instance GObjectClass GammaCurve -instance GObjectClass GladeXML -instance GObjectClass HBox -instance GObjectClass HButtonBox -instance GObjectClass HPaned -instance GObjectClass HRuler -instance GObjectClass HScale -instance GObjectClass HScrollbar -instance GObjectClass HSeparator -instance GObjectClass HandleBox -instance GObjectClass IMContext -instance GObjectClass IMMulticontext -instance GObjectClass IconFactory -instance GObjectClass IconView -instance GObjectClass Image -instance GObjectClass ImageMenuItem -instance GObjectClass InputDialog -instance GObjectClass Invisible -instance GObjectClass Item -instance GObjectClass ItemFactory -instance GObjectClass Label -instance GObjectClass Layout -instance GObjectClass List -instance GObjectClass ListItem -instance GObjectClass ListStore -instance GObjectClass Menu -instance GObjectClass MenuBar -instance GObjectClass MenuItem -instance GObjectClass MenuShell -instance GObjectClass MenuToolButton -instance GObjectClass MessageDialog -instance GObjectClass Misc -instance GObjectClass MozEmbed -instance GObjectClass Notebook -instance GObjectClass Object -instance GObjectClass OptionMenu -instance GObjectClass Paned -instance GObjectClass PangoContext -instance GObjectClass PangoLayoutRaw -instance GObjectClass Pixbuf -instance GObjectClass Pixmap -instance GObjectClass Plug -instance GObjectClass Preview -instance GObjectClass ProgressBar -instance GObjectClass RadioAction -instance GObjectClass RadioButton -instance GObjectClass RadioMenuItem -instance GObjectClass RadioToolButton -instance GObjectClass Range -instance GObjectClass RcStyle -instance GObjectClass Ruler -instance GObjectClass Scale -instance GObjectClass Screen -instance GObjectClass Scrollbar -instance GObjectClass ScrolledWindow -instance GObjectClass Separator -instance GObjectClass SeparatorMenuItem -instance GObjectClass SeparatorToolItem -instance GObjectClass Settings -instance GObjectClass SizeGroup -instance GObjectClass Socket -instance GObjectClass SourceBuffer -instance GObjectClass SourceLanguage -instance GObjectClass SourceLanguagesManager -instance GObjectClass SourceMarker -instance GObjectClass SourceStyleScheme -instance GObjectClass SourceTag -instance GObjectClass SourceTagTable -instance GObjectClass SourceView -instance GObjectClass SpinButton -instance GObjectClass Statusbar -instance GObjectClass Style -instance GObjectClass Table -instance GObjectClass TearoffMenuItem -instance GObjectClass TextBuffer -instance GObjectClass TextChildAnchor -instance GObjectClass TextMark -instance GObjectClass TextTag -instance GObjectClass TextTagTable -instance GObjectClass TextView -instance GObjectClass TipsQuery -instance GObjectClass ToggleAction -instance GObjectClass ToggleButton -instance GObjectClass ToggleToolButton -instance GObjectClass ToolButton -instance GObjectClass ToolItem -instance GObjectClass Toolbar -instance GObjectClass Tooltips -instance GObjectClass TreeModel -instance GObjectClass TreeModelSort -instance GObjectClass TreeSelection -instance GObjectClass TreeStore -instance GObjectClass TreeView -instance GObjectClass TreeViewColumn -instance GObjectClass UIManager -instance GObjectClass VBox -instance GObjectClass VButtonBox -instance GObjectClass VPaned -instance GObjectClass VRuler -instance GObjectClass VScale -instance GObjectClass VScrollbar -instance GObjectClass VSeparator -instance GObjectClass Viewport -instance GObjectClass Widget -instance GObjectClass Window -instance GObjectClass WindowGroup -toGObject :: GObjectClass o => o -> GObject -fromGObject :: GObjectClass o => GObject -> o -castToGObject :: GObjectClass obj => obj -> obj - -module System.Glib.GList -type GList = Ptr () -readGList :: GList -> IO [Ptr a] -fromGList :: GList -> IO [Ptr a] -toGList :: [Ptr a] -> IO GList -type GSList = Ptr () -readGSList :: GSList -> IO [Ptr a] -fromGSList :: GSList -> IO [Ptr a] -fromGSListRev :: GSList -> IO [Ptr a] -toGSList :: [Ptr a] -> IO GSList - -module System.Glib.Flags -class (Enum a, Bounded a) => Flags a -instance Flags AccelFlags -instance Flags AttachOptions -instance Flags CalendarDisplayOptions -instance Flags EventMask -instance Flags ExtensionMode -instance Flags FileFilterFlags -instance Flags FontMask -instance Flags IOCondition -instance Flags InputCondition -instance Flags Modifier -instance Flags SourceSearchFlags -instance Flags TextSearchFlags -instance Flags TreeModelFlags -instance Flags UIManagerItemType -instance Flags WindowState -fromFlags :: Flags a => [a] -> Int -toFlags :: Flags a => Int -> [a] - -module System.Glib.FFI -with :: Storable a => a -> (Ptr a -> IO b) -> IO b -nullForeignPtr :: ForeignPtr a -maybeNull :: (IO (Ptr a) -> IO a) -> IO (Ptr a) -> IO (Maybe a) -withForeignPtrs :: [ForeignPtr a] -> ([Ptr a] -> IO b) -> IO b -withArrayLen :: Storable a => [a] -> (Int -> Ptr a -> IO b) -> IO b - -module System.Glib.GType -type GType = CULong -typeInstanceIsA :: Ptr () -> GType -> Bool - -module System.Glib.GTypeConstants -invalid :: GType -uint :: GType -int :: GType -uchar :: GType -char :: GType -bool :: GType -enum :: GType -flags :: GType -pointer :: GType -float :: GType -double :: GType -string :: GType -object :: GType -boxed :: GType - -module System.Glib.GValue -newtype GValue -GValue :: Ptr GValue -> GValue -valueInit :: GValue -> GType -> IO () -valueUnset :: GValue -> IO () -valueGetType :: GValue -> IO GType -allocaGValue :: (GValue -> IO b) -> IO b - -module System.Glib.GParameter -newtype GParameter -GParameter :: (String, GValue) -> GParameter -instance Storable GParameter - -module System.Glib.GObject -objectNew :: GType -> [(String, GValue)] -> IO (Ptr GObject) -objectRef :: GObjectClass obj => Ptr obj -> IO () -objectUnref :: Ptr a -> FinalizerPtr a -makeNewGObject :: GObjectClass obj => (ForeignPtr obj -> obj) -> IO (Ptr obj) -> IO obj -type DestroyNotify = FunPtr (Ptr () -> IO ()) -mkFunPtrDestroyNotify :: FunPtr a -> IO DestroyNotify -type GWeakNotify = FunPtr (Ptr () -> Ptr GObject -> IO ()) -objectWeakref :: GObjectClass o => o -> IO () -> IO GWeakNotify -objectWeakunref :: GObjectClass o => o -> GWeakNotify -> IO () - -module System.Glib.MainLoop -type HandlerId = CUInt -timeoutAdd :: IO Bool -> Int -> IO HandlerId -timeoutAddFull :: IO Bool -> Priority -> Int -> IO HandlerId -timeoutRemove :: HandlerId -> IO () -idleAdd :: IO Bool -> Priority -> IO HandlerId -idleRemove :: HandlerId -> IO () -data IOCondition -instance Bounded IOCondition -instance Enum IOCondition -instance Eq IOCondition -instance Flags IOCondition -inputAdd :: FD -> [IOCondition] -> Priority -> IO Bool -> IO HandlerId -inputRemove :: HandlerId -> IO () -type Priority = Int -priorityLow :: Int -priorityDefaultIdle :: Int -priorityHighIdle :: Int -priorityDefault :: Int -priorityHigh :: Int - -module System.Glib.UTFString -withUTFString :: String -> (CString -> IO a) -> IO a -withUTFStringLen :: String -> (CStringLen -> IO a) -> IO a -newUTFString :: String -> IO CString -newUTFStringLen :: String -> IO CStringLen -peekUTFString :: CString -> IO String -peekUTFStringLen :: CStringLen -> IO String -readUTFString :: CString -> IO String -readCString :: CString -> IO String -withUTFStrings :: [String] -> ([CString] -> IO a) -> IO a -withUTFStringArray :: [String] -> (Ptr CString -> IO a) -> IO a -withUTFStringArray0 :: [String] -> (Ptr CString -> IO a) -> IO a -peekUTFStringArray :: Int -> Ptr CString -> IO [String] -peekUTFStringArray0 :: Ptr CString -> IO [String] -data UTFCorrection -instance Show UTFCorrection -genUTFOfs :: String -> UTFCorrection -ofsToUTF :: Int -> UTFCorrection -> Int -ofsFromUTF :: Int -> UTFCorrection -> Int - -module System.Glib.GError -data GError -GError :: GErrorDomain -> GErrorCode -> GErrorMessage -> GError -instance Storable GError -instance Typeable GError -type GErrorDomain = GQuark -type GErrorCode = Int -type GErrorMessage = String -catchGError :: IO a -> (GError -> IO a) -> IO a -catchGErrorJust :: GErrorClass err => err -> IO a -> (GErrorMessage -> IO a) -> IO a -catchGErrorJustDomain :: GErrorClass err => IO a -> (err -> GErrorMessage -> IO a) -> IO a -handleGError :: (GError -> IO a) -> IO a -> IO a -handleGErrorJust :: GErrorClass err => err -> (GErrorMessage -> IO a) -> IO a -> IO a -handleGErrorJustDomain :: GErrorClass err => (err -> GErrorMessage -> IO a) -> IO a -> IO a -failOnGError :: IO a -> IO a -throwGError :: GError -> IO a -class Enum err => GErrorClass err -gerrorDomain :: GErrorClass err => err -> GErrorDomain -instance GErrorClass FileChooserError -instance GErrorClass GConfError -instance GErrorClass PixbufError -propagateGError :: (Ptr (Ptr ()) -> IO a) -> IO a -checkGError :: (Ptr (Ptr ()) -> IO a) -> (GError -> IO a) -> IO a -checkGErrorWithCont :: (Ptr (Ptr ()) -> IO b) -> (GError -> IO a) -> (b -> IO a) -> IO a - -module System.Glib.GValueTypes -valueSetUInt :: GValue -> Word -> IO () -valueGetUInt :: GValue -> IO Word -valueSetInt :: GValue -> Int -> IO () -valueGetInt :: GValue -> IO Int -valueSetBool :: GValue -> Bool -> IO () -valueGetBool :: GValue -> IO Bool -valueSetPointer :: GValue -> Ptr () -> IO () -valueGetPointer :: GValue -> IO (Ptr ()) -valueSetFloat :: GValue -> Float -> IO () -valueGetFloat :: GValue -> IO Float -valueSetDouble :: GValue -> Double -> IO () -valueGetDouble :: GValue -> IO Double -valueSetEnum :: Enum enum => GValue -> enum -> IO () -valueGetEnum :: Enum enum => GValue -> IO enum -valueSetFlags :: Flags flag => GValue -> [flag] -> IO () -valueGetFlags :: Flags flag => GValue -> IO [flag] -valueSetString :: GValue -> String -> IO () -valueGetString :: GValue -> IO String -valueSetMaybeString :: GValue -> Maybe String -> IO () -valueGetMaybeString :: GValue -> IO (Maybe String) -valueSetGObject :: GObjectClass gobj => GValue -> gobj -> IO () -valueGetGObject :: GObjectClass gobj => GValue -> IO gobj - -module System.Glib.Signals -data ConnectId o -ConnectId :: CULong -> o -> ConnectId o -disconnect :: GObjectClass obj => ConnectId obj -> IO () - -module System.Gnome.GConf.GConfValue -class GConfValueClass value => GConfPrimitiveValueClass value -instance GConfPrimitiveValueClass Bool -instance GConfPrimitiveValueClass Double -instance GConfPrimitiveValueClass Int -instance GConfPrimitiveValueClass String -class GConfValueClass value -marshalFromGConfValue :: GConfValueClass value => GConfValue -> IO value -marshalToGConfValue :: GConfValueClass value => value -> IO GConfValue -instance GConfValueClass Bool -instance GConfValueClass Double -instance GConfValueClass GConfValueDyn -instance GConfValueClass Int -instance GConfValueClass String -instance (GConfPrimitiveValueClass a, GConfPrimitiveValueClass b) => GConfValueClass (a, b) -instance GConfValueClass value => GConfValueClass Maybe value -instance GConfPrimitiveValueClass a => GConfValueClass [a] -marshalFromGConfValue :: GConfValueClass value => GConfValue -> IO value -marshalToGConfValue :: GConfValueClass value => value -> IO GConfValue -newtype GConfValue -GConfValue :: Ptr GConfValue -> GConfValue -data GConfValueDyn -GConfValueString :: String -> GConfValueDyn -GConfValueInt :: Int -> GConfValueDyn -GConfValueFloat :: Double -> GConfValueDyn -GConfValueBool :: Bool -> GConfValueDyn -GConfValueSchema :: GConfValueDyn -GConfValueList :: [GConfValueDyn] -> GConfValueDyn -GConfValuePair :: (GConfValueDyn, GConfValueDyn) -> GConfValueDyn -instance GConfValueClass GConfValueDyn - -module System.Gnome.GConf.GConfClient -data GConf -instance GConfClass GConf -instance GObjectClass GConf -data GConfPreloadType -instance Enum GConfPreloadType -data GConfError -instance Enum GConfError -instance GErrorClass GConfError -gconfGetDefault :: IO GConf -gconfAddDir :: GConf -> String -> IO () -gconfRemoveDir :: GConf -> String -> IO () -gconfNotifyAdd :: GConfValueClass value => GConf -> String -> (String -> value -> IO ()) -> IO GConfConnectId -gconfNotifyRemove :: GConf -> GConfConnectId -> IO () -onValueChanged :: GConf -> (String -> Maybe GConfValueDyn -> IO ()) -> IO (ConnectId GConf) -afterValueChanged :: GConf -> (String -> Maybe GConfValueDyn -> IO ()) -> IO (ConnectId GConf) -gconfGet :: GConfValueClass value => GConf -> String -> IO value -gconfSet :: GConfValueClass value => GConf -> String -> value -> IO () -gconfGetWithoutDefault :: GConfValueClass value => GConf -> String -> IO value -gconfGetDefaultFromSchema :: GConfValueClass value => GConf -> String -> IO value -gconfUnset :: GConf -> String -> IO () -gconfClearCache :: GConf -> IO () -gconfPreload :: GConf -> String -> GConfPreloadType -> IO () -gconfSuggestSync :: GConf -> IO () -gconfAllEntries :: GConf -> String -> IO [(String, GConfValueDyn)] -gconfAllDirs :: GConf -> String -> IO [String] -gconfDirExists :: GConf -> String -> IO Bool -class GConfValueClass value -instance GConfValueClass Bool -instance GConfValueClass Double -instance GConfValueClass GConfValueDyn -instance GConfValueClass Int -instance GConfValueClass String -instance (GConfPrimitiveValueClass a, GConfPrimitiveValueClass b) => GConfValueClass (a, b) -instance GConfValueClass value => GConfValueClass Maybe value -instance GConfPrimitiveValueClass a => GConfValueClass [a] -class GConfValueClass value => GConfPrimitiveValueClass value -instance GConfPrimitiveValueClass Bool -instance GConfPrimitiveValueClass Double -instance GConfPrimitiveValueClass Int -instance GConfPrimitiveValueClass String -data GConfValue -data GConfValueDyn -GConfValueString :: String -> GConfValueDyn -GConfValueInt :: Int -> GConfValueDyn -GConfValueFloat :: Double -> GConfValueDyn -GConfValueBool :: Bool -> GConfValueDyn -GConfValueSchema :: GConfValueDyn -GConfValueList :: [GConfValueDyn] -> GConfValueDyn -GConfValuePair :: (GConfValueDyn, GConfValueDyn) -> GConfValueDyn -instance GConfValueClass GConfValueDyn - -module System.Gnome.GConf - -module System.Glib.Attributes -type Attr o a = ReadWriteAttr o a a -type ReadAttr o a = ReadWriteAttr o a () -type WriteAttr o b = ReadWriteAttr o () b -data ReadWriteAttr o a b -data AttrOp o -:= :: ReadWriteAttr o a b -> b -> AttrOp o -:~ :: ReadWriteAttr o a b -> (a -> b) -> AttrOp o -:=> :: ReadWriteAttr o a b -> IO b -> AttrOp o -:~> :: ReadWriteAttr o a b -> (a -> IO b) -> AttrOp o -::= :: ReadWriteAttr o a b -> (o -> b) -> AttrOp o -::~ :: ReadWriteAttr o a b -> (o -> a -> b) -> AttrOp o -get :: o -> ReadWriteAttr o a b -> IO a -set :: o -> [AttrOp o] -> IO () -newAttr :: (o -> IO a) -> (o -> b -> IO ()) -> ReadWriteAttr o a b -readAttr :: (o -> IO a) -> ReadAttr o a -writeAttr :: (o -> b -> IO ()) -> WriteAttr o b - -module System.Glib.Properties -objectSetPropertyInt :: GObjectClass gobj => String -> gobj -> Int -> IO () -objectGetPropertyInt :: GObjectClass gobj => String -> gobj -> IO Int -objectSetPropertyUInt :: GObjectClass gobj => String -> gobj -> Int -> IO () -objectGetPropertyUInt :: GObjectClass gobj => String -> gobj -> IO Int -objectSetPropertyBool :: GObjectClass gobj => String -> gobj -> Bool -> IO () -objectGetPropertyBool :: GObjectClass gobj => String -> gobj -> IO Bool -objectSetPropertyEnum :: (GObjectClass gobj, Enum enum) => GType -> String -> gobj -> enum -> IO () -objectGetPropertyEnum :: (GObjectClass gobj, Enum enum) => GType -> String -> gobj -> IO enum -objectSetPropertyFlags :: (GObjectClass gobj, Flags flag) => String -> gobj -> [flag] -> IO () -objectGetPropertyFlags :: (GObjectClass gobj, Flags flag) => String -> gobj -> IO [flag] -objectSetPropertyFloat :: GObjectClass gobj => String -> gobj -> Float -> IO () -objectGetPropertyFloat :: GObjectClass gobj => String -> gobj -> IO Float -objectSetPropertyDouble :: GObjectClass gobj => String -> gobj -> Double -> IO () -objectGetPropertyDouble :: GObjectClass gobj => String -> gobj -> IO Double -objectSetPropertyString :: GObjectClass gobj => String -> gobj -> String -> IO () -objectGetPropertyString :: GObjectClass gobj => String -> gobj -> IO String -objectSetPropertyMaybeString :: GObjectClass gobj => String -> gobj -> Maybe String -> IO () -objectGetPropertyMaybeString :: GObjectClass gobj => String -> gobj -> IO (Maybe String) -objectSetPropertyGObject :: (GObjectClass gobj, GObjectClass gobj') => GType -> String -> gobj -> gobj' -> IO () -objectGetPropertyGObject :: (GObjectClass gobj, GObjectClass gobj') => GType -> String -> gobj -> IO gobj' -objectSetPropertyInternal :: GObjectClass gobj => GType -> (GValue -> a -> IO ()) -> String -> gobj -> a -> IO () -objectGetPropertyInternal :: GObjectClass gobj => GType -> (GValue -> IO a) -> String -> gobj -> IO a -newAttrFromIntProperty :: GObjectClass gobj => String -> Attr gobj Int -readAttrFromIntProperty :: GObjectClass gobj => String -> ReadAttr gobj Int -newAttrFromUIntProperty :: GObjectClass gobj => String -> Attr gobj Int -writeAttrFromUIntProperty :: GObjectClass gobj => String -> WriteAttr gobj Int -newAttrFromBoolProperty :: GObjectClass gobj => String -> Attr gobj Bool -newAttrFromFloatProperty :: GObjectClass gobj => String -> Attr gobj Float -newAttrFromDoubleProperty :: GObjectClass gobj => String -> Attr gobj Double -newAttrFromEnumProperty :: (GObjectClass gobj, Enum enum) => String -> GType -> Attr gobj enum -readAttrFromEnumProperty :: (GObjectClass gobj, Enum enum) => String -> GType -> ReadAttr gobj enum -newAttrFromFlagsProperty :: (GObjectClass gobj, Flags flag) => String -> Attr gobj [flag] -newAttrFromStringProperty :: GObjectClass gobj => String -> Attr gobj String -readAttrFromStringProperty :: GObjectClass gobj => String -> ReadAttr gobj String -writeAttrFromStringProperty :: GObjectClass gobj => String -> WriteAttr gobj String -newAttrFromMaybeStringProperty :: GObjectClass gobj => String -> Attr gobj (Maybe String) -newAttrFromObjectProperty :: (GObjectClass gobj, GObjectClass gobj', GObjectClass gobj'') => String -> GType -> ReadWriteAttr gobj gobj' gobj'' -writeAttrFromObjectProperty :: (GObjectClass gobj, GObjectClass gobj') => String -> GType -> WriteAttr gobj gobj' - -module System.Glib.StoreValue -data TMType -TMinvalid :: TMType -TMuint :: TMType -TMint :: TMType -TMboolean :: TMType -TMenum :: TMType -TMflags :: TMType -TMfloat :: TMType -TMdouble :: TMType -TMstring :: TMType -TMobject :: TMType -instance Enum TMType -data GenericValue -GVuint :: Word -> GenericValue -GVint :: Int -> GenericValue -GVboolean :: Bool -> GenericValue -GVenum :: Int -> GenericValue -GVflags :: Int -> GenericValue -GVfloat :: Float -> GenericValue -GVdouble :: Double -> GenericValue -GVstring :: Maybe String -> GenericValue -GVobject :: GObject -> GenericValue -valueSetGenericValue :: GValue -> GenericValue -> IO () -valueGetGenericValue :: GValue -> IO GenericValue - -module System.Glib - -module Graphics.UI.Gtk.Windows.WindowGroup -data WindowGroup -instance GObjectClass WindowGroup -instance WindowGroupClass WindowGroup -class GObjectClass o => WindowGroupClass o -instance WindowGroupClass WindowGroup -castToWindowGroup :: GObjectClass obj => obj -> WindowGroup -toWindowGroup :: WindowGroupClass o => o -> WindowGroup -windowGroupNew :: IO WindowGroup -windowGroupAddWindow :: (WindowGroupClass self, WindowClass window) => self -> window -> IO () -windowGroupRemoveWindow :: (WindowGroupClass self, WindowClass window) => self -> window -> IO () - -module Graphics.UI.Gtk.TreeList.CellRenderer -data CellRenderer -instance CellRendererClass CellRenderer -instance GObjectClass CellRenderer -instance ObjectClass CellRenderer -class ObjectClass o => CellRendererClass o -instance CellRendererClass CellRenderer -instance CellRendererClass CellRendererPixbuf -instance CellRendererClass CellRendererText -instance CellRendererClass CellRendererToggle -castToCellRenderer :: GObjectClass obj => obj -> CellRenderer -toCellRenderer :: CellRendererClass o => o -> CellRenderer -data Attribute cr a -Attribute :: [String] -> [TMType] -> (a -> IO [GenericValue]) -> ([GenericValue] -> IO a) -> Attribute cr a -cellRendererSet :: CellRendererClass cr => cr -> Attribute cr val -> val -> IO () -cellRendererGet :: CellRendererClass cr => cr -> Attribute cr val -> IO val - -module Graphics.UI.Gtk.SourceView.SourceMarker -data SourceMarker -instance GObjectClass SourceMarker -instance SourceMarkerClass SourceMarker -instance TextMarkClass SourceMarker -castToSourceMarker :: GObjectClass obj => obj -> SourceMarker -sourceMarkerSetMarkerType :: SourceMarker -> String -> IO () -sourceMarkerGetMarkerType :: SourceMarker -> IO String -sourceMarkerGetLine :: SourceMarker -> IO Int -sourceMarkerGetName :: SourceMarker -> IO String -sourceMarkerGetBuffer :: SourceMarker -> IO SourceBuffer -sourceMarkerNext :: SourceMarker -> IO SourceMarker -sourceMarkerPrev :: SourceMarker -> IO SourceMarker - -module Graphics.UI.Gtk.SourceView.SourceLanguagesManager -data SourceLanguagesManager -instance GObjectClass SourceLanguagesManager -instance SourceLanguagesManagerClass SourceLanguagesManager -castToSourceLanguagesManager :: GObjectClass obj => obj -> SourceLanguagesManager -sourceLanguagesManagerNew :: IO SourceLanguagesManager -sourceLanguagesManagerGetAvailableLanguages :: SourceLanguagesManager -> IO [SourceLanguage] -sourceLanguagesManagerGetLanguageFromMimeType :: SourceLanguagesManager -> String -> IO (Maybe SourceLanguage) -sourceLanguagesManagerGetLangFilesDirs :: SourceLanguagesManager -> IO [FilePath] - -module Graphics.UI.Gtk.Pango.Enums -data FontStyle -StyleNormal :: FontStyle -StyleOblique :: FontStyle -StyleItalic :: FontStyle -instance Enum FontStyle -instance Eq FontStyle -instance Show FontStyle -data Weight -WeightUltralight :: Weight -WeightLight :: Weight -WeightNormal :: Weight -WeightSemibold :: Weight -WeightBold :: Weight -WeightUltrabold :: Weight -WeightHeavy :: Weight -instance Enum Weight -instance Eq Weight -instance Show Weight -data Variant -VariantNormal :: Variant -VariantSmallCaps :: Variant -instance Enum Variant -instance Eq Variant -instance Show Variant -data Stretch -StretchUltraCondensed :: Stretch -StretchExtraCondensed :: Stretch -StretchCondensed :: Stretch -StretchSemiCondensed :: Stretch -StretchNormal :: Stretch -StretchSemiExpanded :: Stretch -StretchExpanded :: Stretch -StretchExtraExpanded :: Stretch -StretchUltraExpanded :: Stretch -instance Enum Stretch -instance Eq Stretch -instance Show Stretch -data Underline -UnderlineNone :: Underline -UnderlineSingle :: Underline -UnderlineDouble :: Underline -UnderlineLow :: Underline -UnderlineError :: Underline -instance Enum Underline -instance Eq Underline -instance Show Underline -data EllipsizeMode -EllipsizeNone :: EllipsizeMode -EllipsizeStart :: EllipsizeMode -EllipsizeMiddle :: EllipsizeMode -EllipsizeEnd :: EllipsizeMode -instance Enum EllipsizeMode -instance Eq EllipsizeMode - -module Graphics.UI.Gtk.Multiline.TextTagTable -data TextTagTable -instance GObjectClass TextTagTable -instance TextTagTableClass TextTagTable -class GObjectClass o => TextTagTableClass o -instance TextTagTableClass SourceTagTable -instance TextTagTableClass TextTagTable -castToTextTagTable :: GObjectClass obj => obj -> TextTagTable -toTextTagTable :: TextTagTableClass o => o -> TextTagTable -textTagTableNew :: IO TextTagTable -textTagTableAdd :: (TextTagTableClass self, TextTagClass tag) => self -> tag -> IO () -textTagTableRemove :: (TextTagTableClass self, TextTagClass tag) => self -> tag -> IO () -textTagTableLookup :: TextTagTableClass self => self -> String -> IO (Maybe TextTag) -textTagTableForeach :: TextTagTableClass self => self -> (TextTag -> IO ()) -> IO () -textTagTableGetSize :: TextTagTableClass self => self -> IO Int - -module Graphics.UI.Gtk.Multiline.TextMark -data TextMark -instance GObjectClass TextMark -instance TextMarkClass TextMark -class GObjectClass o => TextMarkClass o -instance TextMarkClass SourceMarker -instance TextMarkClass TextMark -castToTextMark :: GObjectClass obj => obj -> TextMark -toTextMark :: TextMarkClass o => o -> TextMark -type MarkName = String -textMarkSetVisible :: TextMarkClass self => self -> Bool -> IO () -textMarkGetVisible :: TextMarkClass self => self -> IO Bool -textMarkGetDeleted :: TextMarkClass self => self -> IO Bool -textMarkGetName :: TextMarkClass self => self -> IO (Maybe MarkName) -textMarkGetBuffer :: TextMarkClass self => self -> IO (Maybe TextBuffer) -textMarkGetLeftGravity :: TextMarkClass self => self -> IO Bool -textMarkVisible :: TextMarkClass self => Attr self Bool - -module Graphics.UI.Gtk.Misc.SizeGroup -data SizeGroup -instance GObjectClass SizeGroup -instance SizeGroupClass SizeGroup -class GObjectClass o => SizeGroupClass o -instance SizeGroupClass SizeGroup -castToSizeGroup :: GObjectClass obj => obj -> SizeGroup -toSizeGroup :: SizeGroupClass o => o -> SizeGroup -sizeGroupNew :: SizeGroupMode -> IO SizeGroup -data SizeGroupMode -SizeGroupNone :: SizeGroupMode -SizeGroupHorizontal :: SizeGroupMode -SizeGroupVertical :: SizeGroupMode -SizeGroupBoth :: SizeGroupMode -instance Enum SizeGroupMode -sizeGroupSetMode :: SizeGroupClass self => self -> SizeGroupMode -> IO () -sizeGroupGetMode :: SizeGroupClass self => self -> IO SizeGroupMode -sizeGroupAddWidget :: (SizeGroupClass self, WidgetClass widget) => self -> widget -> IO () -sizeGroupRemoveWidget :: (SizeGroupClass self, WidgetClass widget) => self -> widget -> IO () -sizeGroupSetIgnoreHidden :: SizeGroupClass self => self -> Bool -> IO () -sizeGroupGetIgnoreHidden :: SizeGroupClass self => self -> IO Bool -sizeGroupMode :: SizeGroupClass self => Attr self SizeGroupMode -sizeGroupIgnoreHidden :: SizeGroupClass self => Attr self Bool - -module Graphics.UI.Gtk.Gdk.Keys -type KeyVal = Word32 -keyvalName :: KeyVal -> IO String -keyvalFromName :: String -> IO KeyVal -keyvalToChar :: KeyVal -> IO (Maybe Char) - -module Graphics.UI.Gtk.Gdk.Gdk -beep :: IO () -flush :: IO () - -module Graphics.UI.Gtk.Gdk.Enums -data CapStyle -CapNotLast :: CapStyle -CapButt :: CapStyle -CapRound :: CapStyle -CapProjecting :: CapStyle -instance Enum CapStyle -data CrossingMode -CrossingNormal :: CrossingMode -CrossingGrab :: CrossingMode -CrossingUngrab :: CrossingMode -instance Enum CrossingMode -data Dither -RgbDitherNone :: Dither -RgbDitherNormal :: Dither -RgbDitherMax :: Dither -instance Enum Dither -data EventMask -ExposureMask :: EventMask -PointerMotionMask :: EventMask -PointerMotionHintMask :: EventMask -ButtonMotionMask :: EventMask -Button1MotionMask :: EventMask -Button2MotionMask :: EventMask -Button3MotionMask :: EventMask -ButtonPressMask :: EventMask -ButtonReleaseMask :: EventMask -KeyPressMask :: EventMask -KeyReleaseMask :: EventMask -EnterNotifyMask :: EventMask -LeaveNotifyMask :: EventMask -FocusChangeMask :: EventMask -StructureMask :: EventMask -PropertyChangeMask :: EventMask -VisibilityNotifyMask :: EventMask -ProximityInMask :: EventMask -ProximityOutMask :: EventMask -SubstructureMask :: EventMask -ScrollMask :: EventMask -AllEventsMask :: EventMask -instance Bounded EventMask -instance Enum EventMask -instance Flags EventMask -data ExtensionMode -ExtensionEventsNone :: ExtensionMode -ExtensionEventsAll :: ExtensionMode -ExtensionEventsCursor :: ExtensionMode -instance Bounded ExtensionMode -instance Enum ExtensionMode -instance Flags ExtensionMode -data Fill -Solid :: Fill -Tiled :: Fill -Stippled :: Fill -OpaqueStippled :: Fill -instance Enum Fill -data FillRule -EvenOddRule :: FillRule -WindingRule :: FillRule -instance Enum FillRule -data Function -Copy :: Function -Invert :: Function -Xor :: Function -Clear :: Function -And :: Function -AndReverse :: Function -AndInvert :: Function -Noop :: Function -Or :: Function -Equiv :: Function -OrReverse :: Function -CopyInvert :: Function -OrInvert :: Function -Nand :: Function -Nor :: Function -Set :: Function -instance Enum Function -data InputCondition -InputRead :: InputCondition -InputWrite :: InputCondition -InputException :: InputCondition -instance Bounded InputCondition -instance Enum InputCondition -instance Flags InputCondition -data JoinStyle -JoinMiter :: JoinStyle -JoinRound :: JoinStyle -JoinBevel :: JoinStyle -instance Enum JoinStyle -data LineStyle -LineSolid :: LineStyle -LineOnOffDash :: LineStyle -LineDoubleDash :: LineStyle -instance Enum LineStyle -data NotifyType -NotifyAncestor :: NotifyType -NotifyVirtual :: NotifyType -NotifyInferior :: NotifyType -NotifyNonlinear :: NotifyType -NotifyNonlinearVirtual :: NotifyType -NotifyUnknown :: NotifyType -instance Enum NotifyType -data OverlapType -OverlapRectangleIn :: OverlapType -OverlapRectangleOut :: OverlapType -OverlapRectanglePart :: OverlapType -instance Enum OverlapType -data ScrollDirection -ScrollUp :: ScrollDirection -ScrollDown :: ScrollDirection -ScrollLeft :: ScrollDirection -ScrollRight :: ScrollDirection -instance Enum ScrollDirection -data SubwindowMode -ClipByChildren :: SubwindowMode -IncludeInferiors :: SubwindowMode -instance Enum SubwindowMode -data VisibilityState -VisibilityUnobscured :: VisibilityState -VisibilityPartialObscured :: VisibilityState -VisibilityFullyObscured :: VisibilityState -instance Enum VisibilityState -data WindowState -WindowStateWithdrawn :: WindowState -WindowStateIconified :: WindowState -WindowStateMaximized :: WindowState -WindowStateSticky :: WindowState -WindowStateFullscreen :: WindowState -WindowStateAbove :: WindowState -WindowStateBelow :: WindowState -instance Bounded WindowState -instance Enum WindowState -instance Flags WindowState -data WindowEdge -WindowEdgeNorthWest :: WindowEdge -WindowEdgeNorth :: WindowEdge -WindowEdgeNorthEast :: WindowEdge -WindowEdgeWest :: WindowEdge -WindowEdgeEast :: WindowEdge -WindowEdgeSouthWest :: WindowEdge -WindowEdgeSouth :: WindowEdge -WindowEdgeSouthEast :: WindowEdge -instance Enum WindowEdge -data WindowTypeHint -WindowTypeHintNormal :: WindowTypeHint -WindowTypeHintDialog :: WindowTypeHint -WindowTypeHintMenu :: WindowTypeHint -WindowTypeHintToolbar :: WindowTypeHint -WindowTypeHintSplashscreen :: WindowTypeHint -WindowTypeHintUtility :: WindowTypeHint -WindowTypeHintDock :: WindowTypeHint -WindowTypeHintDesktop :: WindowTypeHint -instance Enum WindowTypeHint -data Gravity -GravityNorthWest :: Gravity -GravityNorth :: Gravity -GravityNorthEast :: Gravity -GravityWest :: Gravity -GravityCenter :: Gravity -GravityEast :: Gravity -GravitySouthWest :: Gravity -GravitySouth :: Gravity -GravitySouthEast :: Gravity -GravityStatic :: Gravity -instance Enum Gravity - -module Graphics.UI.Gtk.General.Enums -data AccelFlags -AccelVisible :: AccelFlags -AccelLocked :: AccelFlags -AccelMask :: AccelFlags -instance Bounded AccelFlags -instance Enum AccelFlags -instance Eq AccelFlags -instance Flags AccelFlags -data ArrowType -ArrowUp :: ArrowType -ArrowDown :: ArrowType -ArrowLeft :: ArrowType -ArrowRight :: ArrowType -instance Enum ArrowType -instance Eq ArrowType -data AttachOptions -Expand :: AttachOptions -Shrink :: AttachOptions -Fill :: AttachOptions -instance Bounded AttachOptions -instance Enum AttachOptions -instance Eq AttachOptions -instance Flags AttachOptions -data MouseButton -LeftButton :: MouseButton -MiddleButton :: MouseButton -RightButton :: MouseButton -instance Enum MouseButton -instance Eq MouseButton -instance Show MouseButton -data ButtonBoxStyle -ButtonboxDefaultStyle :: ButtonBoxStyle -ButtonboxSpread :: ButtonBoxStyle -ButtonboxEdge :: ButtonBoxStyle -ButtonboxStart :: ButtonBoxStyle -ButtonboxEnd :: ButtonBoxStyle -instance Enum ButtonBoxStyle -instance Eq ButtonBoxStyle -data CalendarDisplayOptions -CalendarShowHeading :: CalendarDisplayOptions -CalendarShowDayNames :: CalendarDisplayOptions -CalendarNoMonthChange :: CalendarDisplayOptions -CalendarShowWeekNumbers :: CalendarDisplayOptions -CalendarWeekStartMonday :: CalendarDisplayOptions -instance Bounded CalendarDisplayOptions -instance Enum CalendarDisplayOptions -instance Eq CalendarDisplayOptions -instance Flags CalendarDisplayOptions -data Click -SingleClick :: Click -DoubleClick :: Click -TripleClick :: Click -ReleaseClick :: Click -data CornerType -CornerTopLeft :: CornerType -CornerBottomLeft :: CornerType -CornerTopRight :: CornerType -CornerBottomRight :: CornerType -instance Enum CornerType -instance Eq CornerType -data CurveType -CurveTypeLinear :: CurveType -CurveTypeSpline :: CurveType -CurveTypeFree :: CurveType -instance Enum CurveType -instance Eq CurveType -data DeleteType -DeleteChars :: DeleteType -DeleteWordEnds :: DeleteType -DeleteWords :: DeleteType -DeleteDisplayLines :: DeleteType -DeleteDisplayLineEnds :: DeleteType -DeleteParagraphEnds :: DeleteType -DeleteParagraphs :: DeleteType -DeleteWhitespace :: DeleteType -instance Enum DeleteType -instance Eq DeleteType -data DirectionType -DirTabForward :: DirectionType -DirTabBackward :: DirectionType -DirUp :: DirectionType -DirDown :: DirectionType -DirLeft :: DirectionType -DirRight :: DirectionType -instance Enum DirectionType -instance Eq DirectionType -data Justification -JustifyLeft :: Justification -JustifyRight :: Justification -JustifyCenter :: Justification -JustifyFill :: Justification -instance Enum Justification -instance Eq Justification -data MatchType -MatchAll :: MatchType -MatchAllTail :: MatchType -MatchHead :: MatchType -MatchTail :: MatchType -MatchExact :: MatchType -MatchLast :: MatchType -instance Enum MatchType -instance Eq MatchType -data MenuDirectionType -MenuDirParent :: MenuDirectionType -MenuDirChild :: MenuDirectionType -MenuDirNext :: MenuDirectionType -MenuDirPrev :: MenuDirectionType -instance Enum MenuDirectionType -instance Eq MenuDirectionType -data MetricType -Pixels :: MetricType -Inches :: MetricType -Centimeters :: MetricType -instance Enum MetricType -instance Eq MetricType -data MovementStep -MovementLogicalPositions :: MovementStep -MovementVisualPositions :: MovementStep -MovementWords :: MovementStep -MovementDisplayLines :: MovementStep -MovementDisplayLineEnds :: MovementStep -MovementParagraphs :: MovementStep -MovementParagraphEnds :: MovementStep -MovementPages :: MovementStep -MovementBufferEnds :: MovementStep -MovementHorizontalPages :: MovementStep -instance Enum MovementStep -instance Eq MovementStep -data Orientation -OrientationHorizontal :: Orientation -OrientationVertical :: Orientation -instance Enum Orientation -instance Eq Orientation -data Packing -PackRepel :: Packing -PackGrow :: Packing -PackNatural :: Packing -instance Enum Packing -instance Eq Packing -toPacking :: Bool -> Bool -> Packing -fromPacking :: Packing -> (Bool, Bool) -data PackType -PackStart :: PackType -PackEnd :: PackType -instance Enum PackType -instance Eq PackType -data PathPriorityType -PathPrioLowest :: PathPriorityType -PathPrioGtk :: PathPriorityType -PathPrioApplication :: PathPriorityType -PathPrioTheme :: PathPriorityType -PathPrioRc :: PathPriorityType -PathPrioHighest :: PathPriorityType -instance Enum PathPriorityType -instance Eq PathPriorityType -data PathType -PathWidget :: PathType -PathWidgetClass :: PathType -PathClass :: PathType -instance Enum PathType -instance Eq PathType -data PolicyType -PolicyAlways :: PolicyType -PolicyAutomatic :: PolicyType -PolicyNever :: PolicyType -instance Enum PolicyType -instance Eq PolicyType -data PositionType -PosLeft :: PositionType -PosRight :: PositionType -PosTop :: PositionType -PosBottom :: PositionType -instance Enum PositionType -instance Eq PositionType -data ProgressBarOrientation -ProgressLeftToRight :: ProgressBarOrientation -ProgressRightToLeft :: ProgressBarOrientation -ProgressBottomToTop :: ProgressBarOrientation -ProgressTopToBottom :: ProgressBarOrientation -instance Enum ProgressBarOrientation -instance Eq ProgressBarOrientation -data ReliefStyle -ReliefNormal :: ReliefStyle -ReliefHalf :: ReliefStyle -ReliefNone :: ReliefStyle -instance Enum ReliefStyle -instance Eq ReliefStyle -data ResizeMode -ResizeParent :: ResizeMode -ResizeQueue :: ResizeMode -ResizeImmediate :: ResizeMode -instance Enum ResizeMode -instance Eq ResizeMode -data ScrollType -ScrollNone :: ScrollType -ScrollJump :: ScrollType -ScrollStepBackward :: ScrollType -ScrollStepForward :: ScrollType -ScrollPageBackward :: ScrollType -ScrollPageForward :: ScrollType -ScrollStepUp :: ScrollType -ScrollStepDown :: ScrollType -ScrollPageUp :: ScrollType -ScrollPageDown :: ScrollType -ScrollStepLeft :: ScrollType -ScrollStepRight :: ScrollType -ScrollPageLeft :: ScrollType -ScrollPageRight :: ScrollType -ScrollStart :: ScrollType -ScrollEnd :: ScrollType -instance Enum ScrollType -instance Eq ScrollType -data SelectionMode -SelectionNone :: SelectionMode -SelectionSingle :: SelectionMode -SelectionBrowse :: SelectionMode -SelectionMultiple :: SelectionMode -instance Enum SelectionMode -data ShadowType -ShadowNone :: ShadowType -ShadowIn :: ShadowType -ShadowOut :: ShadowType -ShadowEtchedIn :: ShadowType -ShadowEtchedOut :: ShadowType -instance Enum ShadowType -instance Eq ShadowType -data StateType -StateNormal :: StateType -StateActive :: StateType -StatePrelight :: StateType -StateSelected :: StateType -StateInsensitive :: StateType -instance Enum StateType -instance Eq StateType -data SubmenuDirection -DirectionLeft :: SubmenuDirection -DirectionRight :: SubmenuDirection -instance Enum SubmenuDirection -instance Eq SubmenuDirection -data SubmenuPlacement -TopBottom :: SubmenuPlacement -LeftRight :: SubmenuPlacement -instance Enum SubmenuPlacement -instance Eq SubmenuPlacement -data SpinButtonUpdatePolicy -UpdateAlways :: SpinButtonUpdatePolicy -UpdateIfValid :: SpinButtonUpdatePolicy -instance Enum SpinButtonUpdatePolicy -instance Eq SpinButtonUpdatePolicy -data SpinType -SpinStepForward :: SpinType -SpinStepBackward :: SpinType -SpinPageForward :: SpinType -SpinPageBackward :: SpinType -SpinHome :: SpinType -SpinEnd :: SpinType -SpinUserDefined :: SpinType -instance Enum SpinType -instance Eq SpinType -data TextDirection -TextDirNone :: TextDirection -TextDirLtr :: TextDirection -TextDirRtl :: TextDirection -instance Enum TextDirection -instance Eq TextDirection -data TextSearchFlags -TextSearchVisibleOnly :: TextSearchFlags -TextSearchTextOnly :: TextSearchFlags -instance Bounded TextSearchFlags -instance Enum TextSearchFlags -instance Eq TextSearchFlags -instance Flags TextSearchFlags -data TextWindowType -TextWindowPrivate :: TextWindowType -TextWindowWidget :: TextWindowType -TextWindowText :: TextWindowType -TextWindowLeft :: TextWindowType -TextWindowRight :: TextWindowType -TextWindowTop :: TextWindowType -TextWindowBottom :: TextWindowType -instance Enum TextWindowType -instance Eq TextWindowType -data ToolbarStyle -ToolbarIcons :: ToolbarStyle -ToolbarText :: ToolbarStyle -ToolbarBoth :: ToolbarStyle -ToolbarBothHoriz :: ToolbarStyle -instance Enum ToolbarStyle -instance Eq ToolbarStyle -data TreeViewColumnSizing -TreeViewColumnGrowOnly :: TreeViewColumnSizing -TreeViewColumnAutosize :: TreeViewColumnSizing -TreeViewColumnFixed :: TreeViewColumnSizing -instance Enum TreeViewColumnSizing -instance Eq TreeViewColumnSizing -data UpdateType -UpdateContinuous :: UpdateType -UpdateDiscontinuous :: UpdateType -UpdateDelayed :: UpdateType -instance Enum UpdateType -instance Eq UpdateType -data Visibility -VisibilityNone :: Visibility -VisibilityPartial :: Visibility -VisibilityFull :: Visibility -instance Enum Visibility -instance Eq Visibility -data WindowPosition -WinPosNone :: WindowPosition -WinPosCenter :: WindowPosition -WinPosMouse :: WindowPosition -WinPosCenterAlways :: WindowPosition -WinPosCenterOnParent :: WindowPosition -instance Enum WindowPosition -instance Eq WindowPosition -data WindowType -WindowToplevel :: WindowType -WindowPopup :: WindowType -instance Enum WindowType -instance Eq WindowType -data WrapMode -WrapNone :: WrapMode -WrapChar :: WrapMode -WrapWord :: WrapMode -WrapWordChar :: WrapMode -instance Enum WrapMode -instance Eq WrapMode -data SortType -SortAscending :: SortType -SortDescending :: SortType -instance Enum SortType -instance Eq SortType - -module Graphics.UI.Gtk.Multiline.TextTag -data TextTag -instance GObjectClass TextTag -instance TextTagClass TextTag -class GObjectClass o => TextTagClass o -instance TextTagClass SourceTag -instance TextTagClass TextTag -castToTextTag :: GObjectClass obj => obj -> TextTag -toTextTag :: TextTagClass o => o -> TextTag -type TagName = String -textTagNew :: TagName -> IO TextTag -textTagSetPriority :: TextTagClass self => self -> Int -> IO () -textTagGetPriority :: TextTagClass self => self -> IO Int -newtype TextAttributes -TextAttributes :: ForeignPtr TextAttributes -> TextAttributes -textAttributesNew :: IO TextAttributes -makeNewTextAttributes :: Ptr TextAttributes -> IO TextAttributes -textTagName :: TextTagClass self => Attr self (Maybe String) -textTagBackground :: TextTagClass self => WriteAttr self String -textTagBackgroundFullHeight :: TextTagClass self => Attr self Bool -textTagBackgroundStipple :: (TextTagClass self, PixmapClass pixmap) => ReadWriteAttr self Pixmap pixmap -textTagForeground :: TextTagClass self => WriteAttr self String -textTagForegroundStipple :: (TextTagClass self, PixmapClass pixmap) => ReadWriteAttr self Pixmap pixmap -textTagDirection :: TextTagClass self => Attr self TextDirection -textTagEditable :: TextTagClass self => Attr self Bool -textTagFont :: TextTagClass self => Attr self String -textTagFamily :: TextTagClass self => Attr self String -textTagStyle :: TextTagClass self => Attr self FontStyle -textTagVariant :: TextTagClass self => Attr self Variant -textTagWeight :: TextTagClass self => Attr self Int -textTagStretch :: TextTagClass self => Attr self Stretch -textTagSize :: TextTagClass self => Attr self Int -textTagScale :: TextTagClass self => Attr self Double -textTagSizePoints :: TextTagClass self => Attr self Double -textTagJustification :: TextTagClass self => Attr self Justification -textTagLanguage :: TextTagClass self => Attr self String -textTagLeftMargin :: TextTagClass self => Attr self Int -textTagRightMargin :: TextTagClass self => Attr self Int -textTagIndent :: TextTagClass self => Attr self Int -textTagRise :: TextTagClass self => Attr self Int -textTagPixelsAboveLines :: TextTagClass self => Attr self Int -textTagPixelsBelowLines :: TextTagClass self => Attr self Int -textTagPixelsInsideWrap :: TextTagClass self => Attr self Int -textTagStrikethrough :: TextTagClass self => Attr self Bool -textTagUnderline :: TextTagClass self => Attr self Underline -textTagWrapMode :: TextTagClass self => Attr self WrapMode -textTagInvisible :: TextTagClass self => Attr self Bool -textTagParagraphBackground :: TextTagClass self => WriteAttr self String -textTagPriority :: TextTagClass self => Attr self Int - -module Graphics.UI.Gtk.Embedding.Embedding -socketHasPlug :: SocketClass s => s -> IO Bool -type NativeWindowId = Word32 - -module Graphics.UI.Gtk.ActionMenuToolbar.ToggleAction -data ToggleAction -instance ActionClass ToggleAction -instance GObjectClass ToggleAction -instance ToggleActionClass ToggleAction -class ActionClass o => ToggleActionClass o -instance ToggleActionClass RadioAction -instance ToggleActionClass ToggleAction -castToToggleAction :: GObjectClass obj => obj -> ToggleAction -toToggleAction :: ToggleActionClass o => o -> ToggleAction -toggleActionNew :: String -> String -> Maybe String -> Maybe String -> IO ToggleAction -toggleActionToggled :: ToggleActionClass self => self -> IO () -toggleActionSetActive :: ToggleActionClass self => self -> Bool -> IO () -toggleActionGetActive :: ToggleActionClass self => self -> IO Bool -toggleActionSetDrawAsRadio :: ToggleActionClass self => self -> Bool -> IO () -toggleActionGetDrawAsRadio :: ToggleActionClass self => self -> IO Bool -toggleActionDrawAsRadio :: ToggleActionClass self => Attr self Bool -toggleActionActive :: ToggleActionClass self => Attr self Bool -onToggleActionToggled :: ToggleActionClass self => self -> IO () -> IO (ConnectId self) -afterToggleActionToggled :: ToggleActionClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.ActionMenuToolbar.RadioAction -data RadioAction -instance ActionClass RadioAction -instance GObjectClass RadioAction -instance RadioActionClass RadioAction -instance ToggleActionClass RadioAction -class ToggleActionClass o => RadioActionClass o -instance RadioActionClass RadioAction -castToRadioAction :: GObjectClass obj => obj -> RadioAction -toRadioAction :: RadioActionClass o => o -> RadioAction -radioActionNew :: String -> String -> Maybe String -> Maybe String -> Int -> IO RadioAction -radioActionGetGroup :: RadioActionClass self => self -> IO [RadioAction] -radioActionSetGroup :: (RadioActionClass self, RadioActionClass groupMember) => self -> groupMember -> IO () -radioActionGetCurrentValue :: RadioActionClass self => self -> IO Int -radioActionGroup :: RadioActionClass self => ReadWriteAttr self [RadioAction] RadioAction -onRadioActionChanged :: RadioActionClass self => self -> (RadioAction -> IO ()) -> IO (ConnectId self) -afterRadioActionChanged :: RadioActionClass self => self -> (RadioAction -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Abstract.Separator -data Separator -instance GObjectClass Separator -instance ObjectClass Separator -instance SeparatorClass Separator -instance WidgetClass Separator -class WidgetClass o => SeparatorClass o -instance SeparatorClass HSeparator -instance SeparatorClass Separator -instance SeparatorClass VSeparator -castToSeparator :: GObjectClass obj => obj -> Separator -toSeparator :: SeparatorClass o => o -> Separator - -module Graphics.UI.Gtk.Abstract.Scrollbar -data Scrollbar -instance GObjectClass Scrollbar -instance ObjectClass Scrollbar -instance RangeClass Scrollbar -instance ScrollbarClass Scrollbar -instance WidgetClass Scrollbar -class RangeClass o => ScrollbarClass o -instance ScrollbarClass HScrollbar -instance ScrollbarClass Scrollbar -instance ScrollbarClass VScrollbar -castToScrollbar :: GObjectClass obj => obj -> Scrollbar -toScrollbar :: ScrollbarClass o => o -> Scrollbar - -module Graphics.UI.Gtk.Abstract.Object -data Object -instance GObjectClass Object -instance ObjectClass Object -class GObjectClass o => ObjectClass o -instance ObjectClass AboutDialog -instance ObjectClass AccelLabel -instance ObjectClass Adjustment -instance ObjectClass Alignment -instance ObjectClass Arrow -instance ObjectClass AspectFrame -instance ObjectClass Bin -instance ObjectClass Box -instance ObjectClass Button -instance ObjectClass ButtonBox -instance ObjectClass CList -instance ObjectClass CTree -instance ObjectClass Calendar -instance ObjectClass CellRenderer -instance ObjectClass CellRendererPixbuf -instance ObjectClass CellRendererText -instance ObjectClass CellRendererToggle -instance ObjectClass CellView -instance ObjectClass CheckButton -instance ObjectClass CheckMenuItem -instance ObjectClass ColorButton -instance ObjectClass ColorSelection -instance ObjectClass ColorSelectionDialog -instance ObjectClass Combo -instance ObjectClass ComboBox -instance ObjectClass ComboBoxEntry -instance ObjectClass Container -instance ObjectClass Curve -instance ObjectClass Dialog -instance ObjectClass DrawingArea -instance ObjectClass Entry -instance ObjectClass EventBox -instance ObjectClass Expander -instance ObjectClass FileChooserButton -instance ObjectClass FileChooserDialog -instance ObjectClass FileChooserWidget -instance ObjectClass FileFilter -instance ObjectClass FileSelection -instance ObjectClass Fixed -instance ObjectClass FontButton -instance ObjectClass FontSelection -instance ObjectClass FontSelectionDialog -instance ObjectClass Frame -instance ObjectClass GammaCurve -instance ObjectClass HBox -instance ObjectClass HButtonBox -instance ObjectClass HPaned -instance ObjectClass HRuler -instance ObjectClass HScale -instance ObjectClass HScrollbar -instance ObjectClass HSeparator -instance ObjectClass HandleBox -instance ObjectClass IMContext -instance ObjectClass IMMulticontext -instance ObjectClass IconView -instance ObjectClass Image -instance ObjectClass ImageMenuItem -instance ObjectClass InputDialog -instance ObjectClass Invisible -instance ObjectClass Item -instance ObjectClass ItemFactory -instance ObjectClass Label -instance ObjectClass Layout -instance ObjectClass List -instance ObjectClass ListItem -instance ObjectClass Menu -instance ObjectClass MenuBar -instance ObjectClass MenuItem -instance ObjectClass MenuShell -instance ObjectClass MenuToolButton -instance ObjectClass MessageDialog -instance ObjectClass Misc -instance ObjectClass MozEmbed -instance ObjectClass Notebook -instance ObjectClass Object -instance ObjectClass OptionMenu -instance ObjectClass Paned -instance ObjectClass Plug -instance ObjectClass Preview -instance ObjectClass ProgressBar -instance ObjectClass RadioButton -instance ObjectClass RadioMenuItem -instance ObjectClass RadioToolButton -instance ObjectClass Range -instance ObjectClass Ruler -instance ObjectClass Scale -instance ObjectClass Scrollbar -instance ObjectClass ScrolledWindow -instance ObjectClass Separator -instance ObjectClass SeparatorMenuItem -instance ObjectClass SeparatorToolItem -instance ObjectClass Socket -instance ObjectClass SourceView -instance ObjectClass SpinButton -instance ObjectClass Statusbar -instance ObjectClass Table -instance ObjectClass TearoffMenuItem -instance ObjectClass TextView -instance ObjectClass TipsQuery -instance ObjectClass ToggleButton -instance ObjectClass ToggleToolButton -instance ObjectClass ToolButton -instance ObjectClass ToolItem -instance ObjectClass Toolbar -instance ObjectClass Tooltips -instance ObjectClass TreeView -instance ObjectClass TreeViewColumn -instance ObjectClass VBox -instance ObjectClass VButtonBox -instance ObjectClass VPaned -instance ObjectClass VRuler -instance ObjectClass VScale -instance ObjectClass VScrollbar -instance ObjectClass VSeparator -instance ObjectClass Viewport -instance ObjectClass Widget -instance ObjectClass Window -castToObject :: GObjectClass obj => obj -> Object -toObject :: ObjectClass o => o -> Object -objectSink :: ObjectClass obj => Ptr obj -> IO () -makeNewObject :: ObjectClass obj => (ForeignPtr obj -> obj) -> IO (Ptr obj) -> IO obj - -module Graphics.UI.Gtk.Abstract.Range -data Range -instance GObjectClass Range -instance ObjectClass Range -instance RangeClass Range -instance WidgetClass Range -class WidgetClass o => RangeClass o -instance RangeClass HScale -instance RangeClass HScrollbar -instance RangeClass Range -instance RangeClass Scale -instance RangeClass Scrollbar -instance RangeClass VScale -instance RangeClass VScrollbar -castToRange :: GObjectClass obj => obj -> Range -toRange :: RangeClass o => o -> Range -rangeGetAdjustment :: RangeClass self => self -> IO Adjustment -rangeSetAdjustment :: RangeClass self => self -> Adjustment -> IO () -data UpdateType -UpdateContinuous :: UpdateType -UpdateDiscontinuous :: UpdateType -UpdateDelayed :: UpdateType -instance Enum UpdateType -instance Eq UpdateType -rangeGetUpdatePolicy :: RangeClass self => self -> IO UpdateType -rangeSetUpdatePolicy :: RangeClass self => self -> UpdateType -> IO () -rangeGetInverted :: RangeClass self => self -> IO Bool -rangeSetInverted :: RangeClass self => self -> Bool -> IO () -rangeGetValue :: RangeClass self => self -> IO Double -rangeSetValue :: RangeClass self => self -> Double -> IO () -rangeSetIncrements :: RangeClass self => self -> Double -> Double -> IO () -rangeSetRange :: RangeClass self => self -> Double -> Double -> IO () -data ScrollType -ScrollNone :: ScrollType -ScrollJump :: ScrollType -ScrollStepBackward :: ScrollType -ScrollStepForward :: ScrollType -ScrollPageBackward :: ScrollType -ScrollPageForward :: ScrollType -ScrollStepUp :: ScrollType -ScrollStepDown :: ScrollType -ScrollPageUp :: ScrollType -ScrollPageDown :: ScrollType -ScrollStepLeft :: ScrollType -ScrollStepRight :: ScrollType -ScrollPageLeft :: ScrollType -ScrollPageRight :: ScrollType -ScrollStart :: ScrollType -ScrollEnd :: ScrollType -instance Enum ScrollType -instance Eq ScrollType -rangeUpdatePolicy :: RangeClass self => Attr self UpdateType -rangeAdjustment :: RangeClass self => Attr self Adjustment -rangeInverted :: RangeClass self => Attr self Bool -rangeValue :: RangeClass self => Attr self Double -onMoveSlider :: RangeClass self => self -> (ScrollType -> IO ()) -> IO (ConnectId self) -afterMoveSlider :: RangeClass self => self -> (ScrollType -> IO ()) -> IO (ConnectId self) -onAdjustBounds :: RangeClass self => self -> (Double -> IO ()) -> IO (ConnectId self) -afterAdjustBounds :: RangeClass self => self -> (Double -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Abstract.Scale -data Scale -instance GObjectClass Scale -instance ObjectClass Scale -instance RangeClass Scale -instance ScaleClass Scale -instance WidgetClass Scale -class RangeClass o => ScaleClass o -instance ScaleClass HScale -instance ScaleClass Scale -instance ScaleClass VScale -castToScale :: GObjectClass obj => obj -> Scale -toScale :: ScaleClass o => o -> Scale -scaleSetDigits :: ScaleClass self => self -> Int -> IO () -scaleGetDigits :: ScaleClass self => self -> IO Int -scaleSetDrawValue :: ScaleClass self => self -> Bool -> IO () -scaleGetDrawValue :: ScaleClass self => self -> IO Bool -data PositionType -PosLeft :: PositionType -PosRight :: PositionType -PosTop :: PositionType -PosBottom :: PositionType -instance Enum PositionType -instance Eq PositionType -scaleSetValuePos :: ScaleClass self => self -> PositionType -> IO () -scaleGetValuePos :: ScaleClass self => self -> IO PositionType -scaleDigits :: ScaleClass self => Attr self Int -scaleDrawValue :: ScaleClass self => Attr self Bool -scaleValuePos :: ScaleClass self => Attr self PositionType - -module Graphics.UI.Gtk.ActionMenuToolbar.UIManager -data UIManager -instance GObjectClass UIManager -instance UIManagerClass UIManager -class GObjectClass o => UIManagerClass o -instance UIManagerClass UIManager -castToUIManager :: GObjectClass obj => obj -> UIManager -toUIManager :: UIManagerClass o => o -> UIManager -data UIManagerItemType -UiManagerAuto :: UIManagerItemType -UiManagerMenubar :: UIManagerItemType -UiManagerMenu :: UIManagerItemType -UiManagerToolbar :: UIManagerItemType -UiManagerPlaceholder :: UIManagerItemType -UiManagerPopup :: UIManagerItemType -UiManagerMenuitem :: UIManagerItemType -UiManagerToolitem :: UIManagerItemType -UiManagerSeparator :: UIManagerItemType -UiManagerAccelerator :: UIManagerItemType -instance Bounded UIManagerItemType -instance Enum UIManagerItemType -instance Flags UIManagerItemType -data MergeId -uiManagerNew :: IO UIManager -uiManagerSetAddTearoffs :: UIManager -> Bool -> IO () -uiManagerGetAddTearoffs :: UIManager -> IO Bool -uiManagerInsertActionGroup :: UIManager -> ActionGroup -> Int -> IO () -uiManagerRemoveActionGroup :: UIManager -> ActionGroup -> IO () -uiManagerGetActionGroups :: UIManager -> IO [ActionGroup] -uiManagerGetAccelGroup :: UIManager -> IO AccelGroup -uiManagerGetWidget :: UIManager -> String -> IO (Maybe Widget) -uiManagerGetToplevels :: UIManager -> [UIManagerItemType] -> IO [Widget] -uiManagerGetAction :: UIManager -> String -> IO (Maybe Action) -uiManagerAddUiFromString :: UIManager -> String -> IO MergeId -uiManagerAddUiFromFile :: UIManager -> String -> IO MergeId -uiManagerNewMergeId :: UIManager -> IO MergeId -uiManagerAddUi :: UIManager -> MergeId -> String -> String -> Maybe String -> [UIManagerItemType] -> Bool -> IO () -uiManagerRemoveUi :: UIManager -> MergeId -> IO () -uiManagerGetUi :: UIManager -> IO String -uiManagerEnsureUpdate :: UIManager -> IO () -uiManagerAddTearoffs :: Attr UIManager Bool -uiManagerUi :: ReadAttr UIManager String -onAddWidget :: UIManagerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) -afterAddWidget :: UIManagerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) -onActionsChanged :: UIManagerClass self => self -> IO () -> IO (ConnectId self) -afterActionsChanged :: UIManagerClass self => self -> IO () -> IO (ConnectId self) -onConnectProxy :: UIManagerClass self => self -> (Action -> Widget -> IO ()) -> IO (ConnectId self) -afterConnectProxy :: UIManagerClass self => self -> (Action -> Widget -> IO ()) -> IO (ConnectId self) -onDisconnectProxy :: UIManagerClass self => self -> (Action -> Widget -> IO ()) -> IO (ConnectId self) -afterDisconnectProxy :: UIManagerClass self => self -> (Action -> Widget -> IO ()) -> IO (ConnectId self) -onPreActivate :: UIManagerClass self => self -> (Action -> IO ()) -> IO (ConnectId self) -afterPreActivate :: UIManagerClass self => self -> (Action -> IO ()) -> IO (ConnectId self) -onPostActivate :: UIManagerClass self => self -> (Action -> IO ()) -> IO (ConnectId self) -afterPostActivate :: UIManagerClass self => self -> (Action -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Buttons.Button -data Button -instance BinClass Button -instance ButtonClass Button -instance ContainerClass Button -instance GObjectClass Button -instance ObjectClass Button -instance WidgetClass Button -class BinClass o => ButtonClass o -instance ButtonClass Button -instance ButtonClass CheckButton -instance ButtonClass ColorButton -instance ButtonClass FontButton -instance ButtonClass OptionMenu -instance ButtonClass RadioButton -instance ButtonClass ToggleButton -castToButton :: GObjectClass obj => obj -> Button -toButton :: ButtonClass o => o -> Button -buttonNew :: IO Button -buttonNewWithLabel :: String -> IO Button -buttonNewWithMnemonic :: String -> IO Button -buttonNewFromStock :: String -> IO Button -buttonPressed :: ButtonClass self => self -> IO () -buttonReleased :: ButtonClass self => self -> IO () -buttonClicked :: ButtonClass self => self -> IO () -buttonEnter :: ButtonClass self => self -> IO () -buttonLeave :: ButtonClass self => self -> IO () -data ReliefStyle -ReliefNormal :: ReliefStyle -ReliefHalf :: ReliefStyle -ReliefNone :: ReliefStyle -instance Enum ReliefStyle -instance Eq ReliefStyle -buttonSetRelief :: ButtonClass self => self -> ReliefStyle -> IO () -buttonGetRelief :: ButtonClass self => self -> IO ReliefStyle -buttonSetLabel :: ButtonClass self => self -> String -> IO () -buttonGetLabel :: ButtonClass self => self -> IO String -buttonSetUseStock :: ButtonClass self => self -> Bool -> IO () -buttonGetUseStock :: ButtonClass self => self -> IO Bool -buttonSetUseUnderline :: ButtonClass self => self -> Bool -> IO () -buttonGetUseUnderline :: ButtonClass self => self -> IO Bool -buttonSetFocusOnClick :: ButtonClass self => self -> Bool -> IO () -buttonGetFocusOnClick :: ButtonClass self => self -> IO Bool -buttonSetAlignment :: ButtonClass self => self -> (Float, Float) -> IO () -buttonGetAlignment :: ButtonClass self => self -> IO (Float, Float) -buttonGetImage :: ButtonClass self => self -> IO (Maybe Widget) -buttonSetImage :: (ButtonClass self, WidgetClass image) => self -> image -> IO () -buttonLabel :: ButtonClass self => Attr self String -buttonUseUnderline :: ButtonClass self => Attr self Bool -buttonUseStock :: ButtonClass self => Attr self Bool -buttonFocusOnClick :: ButtonClass self => Attr self Bool -buttonRelief :: ButtonClass self => Attr self ReliefStyle -buttonXalign :: ButtonClass self => Attr self Float -buttonYalign :: ButtonClass self => Attr self Float -buttonImage :: (ButtonClass self, WidgetClass image) => ReadWriteAttr self (Maybe Widget) image -onButtonActivate :: ButtonClass b => b -> IO () -> IO (ConnectId b) -afterButtonActivate :: ButtonClass b => b -> IO () -> IO (ConnectId b) -onClicked :: ButtonClass b => b -> IO () -> IO (ConnectId b) -afterClicked :: ButtonClass b => b -> IO () -> IO (ConnectId b) -onEnter :: ButtonClass b => b -> IO () -> IO (ConnectId b) -afterEnter :: ButtonClass b => b -> IO () -> IO (ConnectId b) -onLeave :: ButtonClass b => b -> IO () -> IO (ConnectId b) -afterLeave :: ButtonClass b => b -> IO () -> IO (ConnectId b) -onPressed :: ButtonClass b => b -> IO () -> IO (ConnectId b) -afterPressed :: ButtonClass b => b -> IO () -> IO (ConnectId b) -onReleased :: ButtonClass b => b -> IO () -> IO (ConnectId b) -afterReleased :: ButtonClass b => b -> IO () -> IO (ConnectId b) - -module Graphics.UI.Gtk.Buttons.CheckButton -data CheckButton -instance BinClass CheckButton -instance ButtonClass CheckButton -instance CheckButtonClass CheckButton -instance ContainerClass CheckButton -instance GObjectClass CheckButton -instance ObjectClass CheckButton -instance ToggleButtonClass CheckButton -instance WidgetClass CheckButton -class ToggleButtonClass o => CheckButtonClass o -instance CheckButtonClass CheckButton -instance CheckButtonClass RadioButton -castToCheckButton :: GObjectClass obj => obj -> CheckButton -toCheckButton :: CheckButtonClass o => o -> CheckButton -checkButtonNew :: IO CheckButton -checkButtonNewWithLabel :: String -> IO CheckButton -checkButtonNewWithMnemonic :: String -> IO CheckButton - -module Graphics.UI.Gtk.Buttons.RadioButton -data RadioButton -instance BinClass RadioButton -instance ButtonClass RadioButton -instance CheckButtonClass RadioButton -instance ContainerClass RadioButton -instance GObjectClass RadioButton -instance ObjectClass RadioButton -instance RadioButtonClass RadioButton -instance ToggleButtonClass RadioButton -instance WidgetClass RadioButton -class CheckButtonClass o => RadioButtonClass o -instance RadioButtonClass RadioButton -castToRadioButton :: GObjectClass obj => obj -> RadioButton -toRadioButton :: RadioButtonClass o => o -> RadioButton -radioButtonNew :: IO RadioButton -radioButtonNewWithLabel :: String -> IO RadioButton -radioButtonNewWithMnemonic :: String -> IO RadioButton -radioButtonNewFromWidget :: RadioButton -> IO RadioButton -radioButtonNewWithLabelFromWidget :: RadioButton -> String -> IO RadioButton -radioButtonNewWithMnemonicFromWidget :: RadioButton -> String -> IO RadioButton -radioButtonSetGroup :: RadioButton -> RadioButton -> IO () -radioButtonGetGroup :: RadioButton -> IO [RadioButton] -radioButtonGroup :: ReadWriteAttr RadioButton [RadioButton] RadioButton -onGroupChanged :: RadioButtonClass self => self -> IO () -> IO (ConnectId self) -afterGroupChanged :: RadioButtonClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Buttons.ToggleButton -data ToggleButton -instance BinClass ToggleButton -instance ButtonClass ToggleButton -instance ContainerClass ToggleButton -instance GObjectClass ToggleButton -instance ObjectClass ToggleButton -instance ToggleButtonClass ToggleButton -instance WidgetClass ToggleButton -class ButtonClass o => ToggleButtonClass o -instance ToggleButtonClass CheckButton -instance ToggleButtonClass RadioButton -instance ToggleButtonClass ToggleButton -castToToggleButton :: GObjectClass obj => obj -> ToggleButton -toToggleButton :: ToggleButtonClass o => o -> ToggleButton -toggleButtonNew :: IO ToggleButton -toggleButtonNewWithLabel :: String -> IO ToggleButton -toggleButtonNewWithMnemonic :: String -> IO ToggleButton -toggleButtonSetMode :: ToggleButtonClass self => self -> Bool -> IO () -toggleButtonGetMode :: ToggleButtonClass self => self -> IO Bool -toggleButtonToggled :: ToggleButtonClass self => self -> IO () -toggleButtonGetActive :: ToggleButtonClass self => self -> IO Bool -toggleButtonSetActive :: ToggleButtonClass self => self -> Bool -> IO () -toggleButtonGetInconsistent :: ToggleButtonClass self => self -> IO Bool -toggleButtonSetInconsistent :: ToggleButtonClass self => self -> Bool -> IO () -toggleButtonActive :: ToggleButtonClass self => Attr self Bool -toggleButtonInconsistent :: ToggleButtonClass self => Attr self Bool -toggleButtonDrawIndicator :: ToggleButtonClass self => Attr self Bool -toggleButtonMode :: ToggleButtonClass self => Attr self Bool -onToggled :: ToggleButtonClass self => self -> IO () -> IO (ConnectId self) -afterToggled :: ToggleButtonClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Display.AccelLabel -data AccelLabel -instance AccelLabelClass AccelLabel -instance GObjectClass AccelLabel -instance LabelClass AccelLabel -instance MiscClass AccelLabel -instance ObjectClass AccelLabel -instance WidgetClass AccelLabel -class LabelClass o => AccelLabelClass o -instance AccelLabelClass AccelLabel -castToAccelLabel :: GObjectClass obj => obj -> AccelLabel -toAccelLabel :: AccelLabelClass o => o -> AccelLabel -accelLabelNew :: String -> IO AccelLabel -accelLabelSetAccelWidget :: (AccelLabelClass self, WidgetClass accelWidget) => self -> accelWidget -> IO () -accelLabelGetAccelWidget :: AccelLabelClass self => self -> IO (Maybe Widget) -accelLabelAccelWidget :: (AccelLabelClass self, WidgetClass accelWidget) => ReadWriteAttr self (Maybe Widget) accelWidget - -module Graphics.UI.Gtk.Display.ProgressBar -data ProgressBar -instance GObjectClass ProgressBar -instance ObjectClass ProgressBar -instance ProgressBarClass ProgressBar -instance WidgetClass ProgressBar -class WidgetClass o => ProgressBarClass o -instance ProgressBarClass ProgressBar -castToProgressBar :: GObjectClass obj => obj -> ProgressBar -toProgressBar :: ProgressBarClass o => o -> ProgressBar -progressBarNew :: IO ProgressBar -progressBarPulse :: ProgressBarClass self => self -> IO () -progressBarSetText :: ProgressBarClass self => self -> String -> IO () -progressBarSetFraction :: ProgressBarClass self => self -> Double -> IO () -progressBarSetPulseStep :: ProgressBarClass self => self -> Double -> IO () -progressBarGetFraction :: ProgressBarClass self => self -> IO Double -progressBarGetPulseStep :: ProgressBarClass self => self -> IO Double -progressBarGetText :: ProgressBarClass self => self -> IO (Maybe String) -data ProgressBarOrientation -ProgressLeftToRight :: ProgressBarOrientation -ProgressRightToLeft :: ProgressBarOrientation -ProgressBottomToTop :: ProgressBarOrientation -ProgressTopToBottom :: ProgressBarOrientation -instance Enum ProgressBarOrientation -instance Eq ProgressBarOrientation -progressBarSetOrientation :: ProgressBarClass self => self -> ProgressBarOrientation -> IO () -progressBarGetOrientation :: ProgressBarClass self => self -> IO ProgressBarOrientation -progressBarSetEllipsize :: ProgressBarClass self => self -> EllipsizeMode -> IO () -progressBarGetEllipsize :: ProgressBarClass self => self -> IO EllipsizeMode -progressBarOrientation :: ProgressBarClass self => Attr self ProgressBarOrientation -progressBarDiscreteBlocks :: ProgressBarClass self => Attr self Int -progressBarFraction :: ProgressBarClass self => Attr self Double -progressBarPulseStep :: ProgressBarClass self => Attr self Double -progressBarText :: ProgressBarClass self => ReadWriteAttr self (Maybe String) String -progressBarEllipsize :: ProgressBarClass self => Attr self EllipsizeMode - -module Graphics.UI.Gtk.Display.Statusbar -data Statusbar -instance BoxClass Statusbar -instance ContainerClass Statusbar -instance GObjectClass Statusbar -instance HBoxClass Statusbar -instance ObjectClass Statusbar -instance StatusbarClass Statusbar -instance WidgetClass Statusbar -class HBoxClass o => StatusbarClass o -instance StatusbarClass Statusbar -castToStatusbar :: GObjectClass obj => obj -> Statusbar -toStatusbar :: StatusbarClass o => o -> Statusbar -statusbarNew :: IO Statusbar -statusbarGetContextId :: StatusbarClass self => self -> String -> IO ContextId -statusbarPush :: StatusbarClass self => self -> ContextId -> String -> IO MessageId -statusbarPop :: StatusbarClass self => self -> ContextId -> IO () -statusbarRemove :: StatusbarClass self => self -> ContextId -> MessageId -> IO () -statusbarSetHasResizeGrip :: StatusbarClass self => self -> Bool -> IO () -statusbarGetHasResizeGrip :: StatusbarClass self => self -> IO Bool -statusbarHasResizeGrip :: StatusbarClass self => Attr self Bool -onTextPopped :: StatusbarClass self => self -> (ContextId -> String -> IO ()) -> IO (ConnectId self) -afterTextPopped :: StatusbarClass self => self -> (ContextId -> String -> IO ()) -> IO (ConnectId self) -onTextPushed :: StatusbarClass self => self -> (ContextId -> String -> IO ()) -> IO (ConnectId self) -afterTextPushed :: StatusbarClass self => self -> (ContextId -> String -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Embedding.Plug -data Plug -instance BinClass Plug -instance ContainerClass Plug -instance GObjectClass Plug -instance ObjectClass Plug -instance PlugClass Plug -instance WidgetClass Plug -instance WindowClass Plug -class WindowClass o => PlugClass o -instance PlugClass Plug -castToPlug :: GObjectClass obj => obj -> Plug -toPlug :: PlugClass o => o -> Plug -type NativeWindowId = Word32 -plugNew :: Maybe NativeWindowId -> IO Plug -plugGetId :: PlugClass self => self -> IO NativeWindowId -onEmbedded :: PlugClass self => self -> IO () -> IO (ConnectId self) -afterEmbedded :: PlugClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Embedding.Socket -data Socket -instance ContainerClass Socket -instance GObjectClass Socket -instance ObjectClass Socket -instance SocketClass Socket -instance WidgetClass Socket -class ContainerClass o => SocketClass o -instance SocketClass Socket -castToSocket :: GObjectClass obj => obj -> Socket -toSocket :: SocketClass o => o -> Socket -type NativeWindowId = Word32 -socketNew :: IO Socket -socketHasPlug :: SocketClass s => s -> IO Bool -socketAddId :: SocketClass self => self -> NativeWindowId -> IO () -socketGetId :: SocketClass self => self -> IO NativeWindowId -onPlugAdded :: SocketClass self => self -> IO () -> IO (ConnectId self) -afterPlugAdded :: SocketClass self => self -> IO () -> IO (ConnectId self) -onPlugRemoved :: SocketClass self => self -> IO () -> IO (ConnectId self) -afterPlugRemoved :: SocketClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Entry.Editable -data Editable -instance EditableClass Editable -instance GObjectClass Editable -class GObjectClass o => EditableClass o -instance EditableClass Editable -instance EditableClass Entry -instance EditableClass SpinButton -castToEditable :: GObjectClass obj => obj -> Editable -toEditable :: EditableClass o => o -> Editable -editableSelectRegion :: EditableClass self => self -> Int -> Int -> IO () -editableGetSelectionBounds :: EditableClass self => self -> IO (Int, Int) -editableInsertText :: EditableClass self => self -> String -> Int -> IO Int -editableDeleteText :: EditableClass self => self -> Int -> Int -> IO () -editableGetChars :: EditableClass self => self -> Int -> Int -> IO String -editableCutClipboard :: EditableClass self => self -> IO () -editableCopyClipboard :: EditableClass self => self -> IO () -editablePasteClipboard :: EditableClass self => self -> IO () -editableDeleteSelection :: EditableClass self => self -> IO () -editableSetEditable :: EditableClass self => self -> Bool -> IO () -editableGetEditable :: EditableClass self => self -> IO Bool -editableSetPosition :: EditableClass self => self -> Int -> IO () -editableGetPosition :: EditableClass self => self -> IO Int -editablePosition :: EditableClass self => Attr self Int -editableEditable :: EditableClass self => Attr self Bool -onEditableChanged :: EditableClass ec => ec -> IO () -> IO (ConnectId ec) -afterEditableChanged :: EditableClass ec => ec -> IO () -> IO (ConnectId ec) -onDeleteText :: EditableClass self => self -> (Int -> Int -> IO ()) -> IO (ConnectId self) -afterDeleteText :: EditableClass self => self -> (Int -> Int -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Entry.Entry -data Entry -instance EditableClass Entry -instance EntryClass Entry -instance GObjectClass Entry -instance ObjectClass Entry -instance WidgetClass Entry -class WidgetClass o => EntryClass o -instance EntryClass Entry -instance EntryClass SpinButton -castToEntry :: GObjectClass obj => obj -> Entry -toEntry :: EntryClass o => o -> Entry -entryNew :: IO Entry -entrySetText :: EntryClass self => self -> String -> IO () -entryGetText :: EntryClass self => self -> IO String -entryAppendText :: EntryClass self => self -> String -> IO () -entryPrependText :: EntryClass self => self -> String -> IO () -entrySetVisibility :: EntryClass self => self -> Bool -> IO () -entryGetVisibility :: EntryClass self => self -> IO Bool -entrySetInvisibleChar :: EntryClass self => self -> Char -> IO () -entryGetInvisibleChar :: EntryClass self => self -> IO Char -entrySetMaxLength :: EntryClass self => self -> Int -> IO () -entryGetMaxLength :: EntryClass self => self -> IO Int -entryGetActivatesDefault :: EntryClass self => self -> IO Bool -entrySetActivatesDefault :: EntryClass self => self -> Bool -> IO () -entryGetHasFrame :: EntryClass self => self -> IO Bool -entrySetHasFrame :: EntryClass self => self -> Bool -> IO () -entryGetWidthChars :: EntryClass self => self -> IO Int -entrySetWidthChars :: EntryClass self => self -> Int -> IO () -entrySetAlignment :: EntryClass self => self -> Float -> IO () -entryGetAlignment :: EntryClass self => self -> IO Float -entrySetCompletion :: EntryClass self => self -> EntryCompletion -> IO () -entryGetCompletion :: EntryClass self => self -> IO EntryCompletion -entryCursorPosition :: EntryClass self => ReadAttr self Int -entrySelectionBound :: EntryClass self => ReadAttr self Int -entryEditable :: EntryClass self => Attr self Bool -entryMaxLength :: EntryClass self => Attr self Int -entryVisibility :: EntryClass self => Attr self Bool -entryHasFrame :: EntryClass self => Attr self Bool -entryInvisibleChar :: EntryClass self => Attr self Char -entryActivatesDefault :: EntryClass self => Attr self Bool -entryWidthChars :: EntryClass self => Attr self Int -entryScrollOffset :: EntryClass self => ReadAttr self Int -entryText :: EntryClass self => Attr self String -entryXalign :: EntryClass self => Attr self Float -entryAlignment :: EntryClass self => Attr self Float -entryCompletion :: EntryClass self => Attr self EntryCompletion -onEntryActivate :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -afterEntryActivate :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -onCopyClipboard :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -afterCopyClipboard :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -onCutClipboard :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -afterCutClipboard :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -onPasteClipboard :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -afterPasteClipboard :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -onInsertAtCursor :: EntryClass ec => ec -> (String -> IO ()) -> IO (ConnectId ec) -afterInsertAtCursor :: EntryClass ec => ec -> (String -> IO ()) -> IO (ConnectId ec) -onToggleOverwrite :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) -afterToggleOverwrite :: EntryClass ec => ec -> IO () -> IO (ConnectId ec) - -module Graphics.UI.Gtk.Entry.HScale -data HScale -instance GObjectClass HScale -instance HScaleClass HScale -instance ObjectClass HScale -instance RangeClass HScale -instance ScaleClass HScale -instance WidgetClass HScale -class ScaleClass o => HScaleClass o -instance HScaleClass HScale -castToHScale :: GObjectClass obj => obj -> HScale -toHScale :: HScaleClass o => o -> HScale -hScaleNew :: Adjustment -> IO HScale -hScaleNewWithRange :: Double -> Double -> Double -> IO HScale - -module Graphics.UI.Gtk.Entry.VScale -data VScale -instance GObjectClass VScale -instance ObjectClass VScale -instance RangeClass VScale -instance ScaleClass VScale -instance VScaleClass VScale -instance WidgetClass VScale -class ScaleClass o => VScaleClass o -instance VScaleClass VScale -castToVScale :: GObjectClass obj => obj -> VScale -toVScale :: VScaleClass o => o -> VScale -vScaleNew :: Adjustment -> IO VScale -vScaleNewWithRange :: Double -> Double -> Double -> IO VScale - -module Graphics.UI.Gtk.General.General -initGUI :: IO [String] -eventsPending :: IO Int -mainGUI :: IO () -mainLevel :: IO Int -mainQuit :: IO () -mainIteration :: IO Bool -mainIterationDo :: Bool -> IO Bool -grabAdd :: WidgetClass wd => wd -> IO () -grabGetCurrent :: IO (Maybe Widget) -grabRemove :: WidgetClass w => w -> IO () -type Priority = Int -priorityLow :: Int -priorityDefaultIdle :: Int -priorityHighIdle :: Int -priorityDefault :: Int -priorityHigh :: Int -timeoutAdd :: IO Bool -> Int -> IO HandlerId -timeoutAddFull :: IO Bool -> Priority -> Int -> IO HandlerId -timeoutRemove :: HandlerId -> IO () -idleAdd :: IO Bool -> Priority -> IO HandlerId -idleRemove :: HandlerId -> IO () -inputAdd :: FD -> [IOCondition] -> Priority -> IO Bool -> IO HandlerId -inputRemove :: HandlerId -> IO () -data IOCondition -instance Bounded IOCondition -instance Enum IOCondition -instance Eq IOCondition -instance Flags IOCondition -type HandlerId = CUInt - -module Graphics.UI.Gtk.General.Structs -type Point = (Int, Int) -data Rectangle -Rectangle :: Int -> Int -> Int -> Int -> Rectangle -instance Storable Rectangle -data Color -Color :: Word16 -> Word16 -> Word16 -> Color -instance Storable Color -data GCValues -GCValues :: Color -> Color -> Function -> Fill -> Maybe Pixmap -> Maybe Pixmap -> Maybe Pixmap -> SubwindowMode -> Int -> Int -> Int -> Int -> Bool -> Int -> LineStyle -> CapStyle -> JoinStyle -> GCValues -foreground :: GCValues -> Color -background :: GCValues -> Color -function :: GCValues -> Function -fill :: GCValues -> Fill -tile :: GCValues -> Maybe Pixmap -stipple :: GCValues -> Maybe Pixmap -clipMask :: GCValues -> Maybe Pixmap -subwindowMode :: GCValues -> SubwindowMode -tsXOrigin :: GCValues -> Int -tsYOrigin :: GCValues -> Int -clipXOrigin :: GCValues -> Int -clipYOrigin :: GCValues -> Int -graphicsExposure :: GCValues -> Bool -lineWidth :: GCValues -> Int -lineStyle :: GCValues -> LineStyle -capStyle :: GCValues -> CapStyle -joinStyle :: GCValues -> JoinStyle -instance Storable GCValues -pokeGCValues :: Ptr GCValues -> GCValues -> IO CInt -newGCValues :: GCValues -widgetGetState :: WidgetClass w => w -> IO StateType -widgetGetSavedState :: WidgetClass w => w -> IO StateType -type Allocation = Rectangle -data Requisition -Requisition :: Int -> Int -> Requisition -instance Storable Requisition -treeIterSize :: Int -textIterSize :: Int -inputError :: Int32 -dialogGetUpper :: DialogClass dc => dc -> IO VBox -dialogGetActionArea :: DialogClass dc => dc -> IO HBox -fileSelectionGetButtons :: FileSelectionClass fsel => fsel -> IO (Button, Button) -data ResponseId -ResponseNone :: ResponseId -ResponseReject :: ResponseId -ResponseAccept :: ResponseId -ResponseDeleteEvent :: ResponseId -ResponseOk :: ResponseId -ResponseCancel :: ResponseId -ResponseClose :: ResponseId -ResponseYes :: ResponseId -ResponseNo :: ResponseId -ResponseApply :: ResponseId -ResponseHelp :: ResponseId -ResponseUser :: Int -> ResponseId -instance Show ResponseId -fromResponse :: Integral a => ResponseId -> a -toResponse :: Integral a => a -> ResponseId -toolbarChildButton :: CInt -toolbarChildToggleButton :: CInt -toolbarChildRadioButton :: CInt -type IconSize = Int -iconSizeInvalid :: IconSize -iconSizeMenu :: IconSize -iconSizeSmallToolbar :: IconSize -iconSizeLargeToolbar :: IconSize -iconSizeButton :: IconSize -iconSizeDialog :: IconSize -comboGetList :: Combo -> IO List -drawingAreaGetDrawWindow :: DrawingArea -> IO DrawWindow -drawingAreaGetSize :: DrawingArea -> IO (Int, Int) -layoutGetDrawWindow :: Layout -> IO DrawWindow -pangoScale :: Int -data PangoDirection -PangoDirectionLtr :: PangoDirection -PangoDirectionRtl :: PangoDirection -PangoDirectionWeakLtr :: PangoDirection -PangoDirectionWeakRtl :: PangoDirection -PangoDirectionNeutral :: PangoDirection -instance Enum PangoDirection -instance Eq PangoDirection -instance Ord PangoDirection -pangodirToLevel :: PangoDirection -> Int -setAttrPos :: UTFCorrection -> Int -> Int -> IO (Ptr ()) -> IO (Ptr ()) -pangoItemRawGetFont :: Ptr pangoItem -> IO Font -pangoItemRawGetLanguage :: Ptr pangoItem -> IO (Ptr CChar) -pangoItemRawAnalysis :: Ptr pangoItem -> Ptr pangoAnalysis -pangoItemRawGetLevel :: Ptr pangoItem -> IO Bool -styleGetForeground :: StateType -> Style -> IO GC -styleGetBackground :: StateType -> Style -> IO GC -styleGetLight :: StateType -> Style -> IO GC -styleGetMiddle :: StateType -> Style -> IO GC -styleGetDark :: StateType -> Style -> IO GC -styleGetText :: StateType -> Style -> IO GC -styleGetBase :: StateType -> Style -> IO GC -styleGetAntiAliasing :: StateType -> Style -> IO GC - -module Graphics.UI.Gtk.ActionMenuToolbar.Action -data Action -instance ActionClass Action -instance GObjectClass Action -class GObjectClass o => ActionClass o -instance ActionClass Action -instance ActionClass RadioAction -instance ActionClass ToggleAction -castToAction :: GObjectClass obj => obj -> Action -toAction :: ActionClass o => o -> Action -actionNew :: String -> String -> Maybe String -> Maybe String -> IO Action -actionGetName :: ActionClass self => self -> IO String -actionIsSensitive :: ActionClass self => self -> IO Bool -actionGetSensitive :: ActionClass self => self -> IO Bool -actionSetSensitive :: ActionClass self => self -> Bool -> IO () -actionIsVisible :: ActionClass self => self -> IO Bool -actionGetVisible :: ActionClass self => self -> IO Bool -actionSetVisible :: ActionClass self => self -> Bool -> IO () -actionActivate :: ActionClass self => self -> IO () -actionCreateMenuItem :: ActionClass self => self -> IO Widget -actionCreateToolItem :: ActionClass self => self -> IO Widget -actionConnectProxy :: (ActionClass self, WidgetClass proxy) => self -> proxy -> IO () -actionDisconnectProxy :: (ActionClass self, WidgetClass proxy) => self -> proxy -> IO () -actionGetProxies :: ActionClass self => self -> IO [Widget] -actionConnectAccelerator :: ActionClass self => self -> IO () -actionDisconnectAccelerator :: ActionClass self => self -> IO () -actionGetAccelPath :: ActionClass self => self -> IO (Maybe String) -actionSetAccelPath :: ActionClass self => self -> String -> IO () -actionSetAccelGroup :: ActionClass self => self -> AccelGroup -> IO () -actionName :: ActionClass self => Attr self String -actionLabel :: ActionClass self => Attr self String -actionShortLabel :: ActionClass self => Attr self String -actionTooltip :: ActionClass self => Attr self (Maybe String) -actionStockId :: ActionClass self => Attr self (Maybe String) -actionVisibleHorizontal :: ActionClass self => Attr self Bool -actionVisibleOverflown :: ActionClass self => Attr self Bool -actionVisibleVertical :: ActionClass self => Attr self Bool -actionIsImportant :: ActionClass self => Attr self Bool -actionHideIfEmpty :: ActionClass self => Attr self Bool -actionSensitive :: ActionClass self => Attr self Bool -actionVisible :: ActionClass self => Attr self Bool -actionAccelPath :: ActionClass self => ReadWriteAttr self (Maybe String) String -onActionActivate :: ActionClass self => self -> IO () -> IO (ConnectId self) -afterActionActivate :: ActionClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.ActionMenuToolbar.ActionGroup -data ActionGroup -instance ActionGroupClass ActionGroup -instance GObjectClass ActionGroup -class GObjectClass o => ActionGroupClass o -instance ActionGroupClass ActionGroup -castToActionGroup :: GObjectClass obj => obj -> ActionGroup -toActionGroup :: ActionGroupClass o => o -> ActionGroup -actionGroupNew :: String -> IO ActionGroup -actionGroupGetName :: ActionGroup -> IO String -actionGroupGetSensitive :: ActionGroup -> IO Bool -actionGroupSetSensitive :: ActionGroup -> Bool -> IO () -actionGroupGetVisible :: ActionGroup -> IO Bool -actionGroupSetVisible :: ActionGroup -> Bool -> IO () -actionGroupGetAction :: ActionGroup -> String -> IO (Maybe Action) -actionGroupListActions :: ActionGroup -> IO [Action] -actionGroupAddAction :: ActionClass action => ActionGroup -> action -> IO () -actionGroupAddActionWithAccel :: ActionClass action => ActionGroup -> action -> Maybe String -> IO () -actionGroupRemoveAction :: ActionClass action => ActionGroup -> action -> IO () -actionGroupAddActions :: ActionGroup -> [ActionEntry] -> IO () -actionGroupAddToggleActions :: ActionGroup -> [ToggleActionEntry] -> IO () -actionGroupAddRadioActions :: ActionGroup -> [RadioActionEntry] -> Int -> (RadioAction -> IO ()) -> IO () -actionGroupSetTranslateFunc :: ActionGroup -> (String -> IO String) -> IO () -actionGroupSetTranslationDomain :: ActionGroup -> String -> IO () -actionGroupTranslateString :: ActionGroup -> String -> IO String -actionGroupName :: Attr ActionGroup String -actionGroupSensitive :: Attr ActionGroup Bool -actionGroupVisible :: Attr ActionGroup Bool - -module Graphics.UI.Gtk.Display.Image -data Image -instance GObjectClass Image -instance ImageClass Image -instance MiscClass Image -instance ObjectClass Image -instance WidgetClass Image -class MiscClass o => ImageClass o -instance ImageClass Image -castToImage :: GObjectClass obj => obj -> Image -toImage :: ImageClass o => o -> Image -imageNewFromFile :: FilePath -> IO Image -imageNewFromPixbuf :: Pixbuf -> IO Image -imageNewFromStock :: String -> IconSize -> IO Image -imageNew :: IO Image -imageNewFromIconName :: String -> IconSize -> IO Image -imageGetPixbuf :: Image -> IO Pixbuf -imageSetFromPixbuf :: Image -> Pixbuf -> IO () -imageSetFromFile :: Image -> FilePath -> IO () -imageSetFromStock :: Image -> String -> IconSize -> IO () -imageSetFromIconName :: Image -> String -> IconSize -> IO () -imageSetPixelSize :: Image -> Int -> IO () -imageGetPixelSize :: Image -> IO Int -imageClear :: Image -> IO () -type IconSize = Int -iconSizeMenu :: IconSize -iconSizeSmallToolbar :: IconSize -iconSizeLargeToolbar :: IconSize -iconSizeButton :: IconSize -iconSizeDialog :: IconSize -imagePixbuf :: PixbufClass pixbuf => ReadWriteAttr Image Pixbuf pixbuf -imagePixmap :: PixmapClass pixmap => ReadWriteAttr Image Pixmap pixmap -imageImage :: ImageClass image => ReadWriteAttr Image Image image -imageMask :: PixmapClass pixmap => ReadWriteAttr Image Pixmap pixmap -imageFile :: Attr Image String -imageStock :: Attr Image String -imageIconSize :: Attr Image Int -imagePixelSize :: Attr Image Int -imageIconName :: Attr Image String -imageStorageType :: ReadAttr Image ImageType - -module Graphics.UI.Gtk.Entry.SpinButton -data SpinButton -instance EditableClass SpinButton -instance EntryClass SpinButton -instance GObjectClass SpinButton -instance ObjectClass SpinButton -instance SpinButtonClass SpinButton -instance WidgetClass SpinButton -class EntryClass o => SpinButtonClass o -instance SpinButtonClass SpinButton -castToSpinButton :: GObjectClass obj => obj -> SpinButton -toSpinButton :: SpinButtonClass o => o -> SpinButton -spinButtonNew :: Adjustment -> Double -> Int -> IO SpinButton -spinButtonNewWithRange :: Double -> Double -> Double -> IO SpinButton -spinButtonConfigure :: SpinButtonClass self => self -> Adjustment -> Double -> Int -> IO () -spinButtonSetAdjustment :: SpinButtonClass self => self -> Adjustment -> IO () -spinButtonGetAdjustment :: SpinButtonClass self => self -> IO Adjustment -spinButtonSetDigits :: SpinButtonClass self => self -> Int -> IO () -spinButtonGetDigits :: SpinButtonClass self => self -> IO Int -spinButtonSetIncrements :: SpinButtonClass self => self -> Double -> Double -> IO () -spinButtonGetIncrements :: SpinButtonClass self => self -> IO (Double, Double) -spinButtonSetRange :: SpinButtonClass self => self -> Double -> Double -> IO () -spinButtonGetRange :: SpinButtonClass self => self -> IO (Double, Double) -spinButtonGetValue :: SpinButtonClass self => self -> IO Double -spinButtonGetValueAsInt :: SpinButtonClass self => self -> IO Int -spinButtonSetValue :: SpinButtonClass self => self -> Double -> IO () -data SpinButtonUpdatePolicy -UpdateAlways :: SpinButtonUpdatePolicy -UpdateIfValid :: SpinButtonUpdatePolicy -instance Enum SpinButtonUpdatePolicy -instance Eq SpinButtonUpdatePolicy -spinButtonSetUpdatePolicy :: SpinButtonClass self => self -> SpinButtonUpdatePolicy -> IO () -spinButtonGetUpdatePolicy :: SpinButtonClass self => self -> IO SpinButtonUpdatePolicy -spinButtonSetNumeric :: SpinButtonClass self => self -> Bool -> IO () -spinButtonGetNumeric :: SpinButtonClass self => self -> IO Bool -data SpinType -SpinStepForward :: SpinType -SpinStepBackward :: SpinType -SpinPageForward :: SpinType -SpinPageBackward :: SpinType -SpinHome :: SpinType -SpinEnd :: SpinType -SpinUserDefined :: SpinType -instance Enum SpinType -instance Eq SpinType -spinButtonSpin :: SpinButtonClass self => self -> SpinType -> Double -> IO () -spinButtonSetWrap :: SpinButtonClass self => self -> Bool -> IO () -spinButtonGetWrap :: SpinButtonClass self => self -> IO Bool -spinButtonSetSnapToTicks :: SpinButtonClass self => self -> Bool -> IO () -spinButtonGetSnapToTicks :: SpinButtonClass self => self -> IO Bool -spinButtonUpdate :: SpinButtonClass self => self -> IO () -spinButtonAdjustment :: SpinButtonClass self => Attr self Adjustment -spinButtonClimbRate :: SpinButtonClass self => Attr self Double -spinButtonDigits :: SpinButtonClass self => Attr self Int -spinButtonSnapToTicks :: SpinButtonClass self => Attr self Bool -spinButtonNumeric :: SpinButtonClass self => Attr self Bool -spinButtonWrap :: SpinButtonClass self => Attr self Bool -spinButtonUpdatePolicy :: SpinButtonClass self => Attr self SpinButtonUpdatePolicy -spinButtonValue :: SpinButtonClass self => Attr self Double -onInput :: SpinButtonClass sb => sb -> IO (Maybe Double) -> IO (ConnectId sb) -afterInput :: SpinButtonClass sb => sb -> IO (Maybe Double) -> IO (ConnectId sb) -onOutput :: SpinButtonClass sb => sb -> IO Bool -> IO (ConnectId sb) -afterOutput :: SpinButtonClass sb => sb -> IO Bool -> IO (ConnectId sb) -onValueSpinned :: SpinButtonClass sb => sb -> IO () -> IO (ConnectId sb) -afterValueSpinned :: SpinButtonClass sb => sb -> IO () -> IO (ConnectId sb) - -module Graphics.UI.Gtk.Gdk.Pixbuf -data Pixbuf -instance GObjectClass Pixbuf -instance PixbufClass Pixbuf -class GObjectClass o => PixbufClass o -instance PixbufClass Pixbuf -data PixbufError -PixbufErrorCorruptImage :: PixbufError -PixbufErrorInsufficientMemory :: PixbufError -PixbufErrorBadOption :: PixbufError -PixbufErrorUnknownType :: PixbufError -PixbufErrorUnsupportedOperation :: PixbufError -PixbufErrorFailed :: PixbufError -instance Enum PixbufError -instance GErrorClass PixbufError -data Colorspace -ColorspaceRgb :: Colorspace -instance Enum Colorspace -pixbufGetColorSpace :: Pixbuf -> IO Colorspace -pixbufGetNChannels :: Pixbuf -> IO Int -pixbufGetHasAlpha :: Pixbuf -> IO Bool -pixbufGetBitsPerSample :: Pixbuf -> IO Int -data PixbufData i e -instance HasBounds PixbufData -instance Storable e => MArray PixbufData e IO -pixbufGetPixels :: (Ix i, Num i, Storable e) => Pixbuf -> IO (PixbufData i e) -pixbufGetWidth :: Pixbuf -> IO Int -pixbufGetHeight :: Pixbuf -> IO Int -pixbufGetRowstride :: Pixbuf -> IO Int -pixbufGetOption :: Pixbuf -> String -> IO (Maybe String) -pixbufNewFromFile :: FilePath -> IO (Either (PixbufError, String) Pixbuf) -type ImageType = String -pixbufGetFormats :: [ImageType] -pixbufSave :: Pixbuf -> FilePath -> ImageType -> [(String, String)] -> IO (Maybe (PixbufError, String)) -pixbufNew :: Colorspace -> Bool -> Int -> Int -> Int -> IO Pixbuf -pixbufNewFromXPMData :: [String] -> IO Pixbuf -data InlineImage -pixbufNewFromInline :: Ptr InlineImage -> IO Pixbuf -pixbufNewSubpixbuf :: Pixbuf -> Int -> Int -> Int -> Int -> IO Pixbuf -pixbufCopy :: Pixbuf -> IO Pixbuf -data InterpType -InterpNearest :: InterpType -InterpTiles :: InterpType -InterpBilinear :: InterpType -InterpHyper :: InterpType -instance Enum InterpType -pixbufScaleSimple :: Pixbuf -> Int -> Int -> InterpType -> IO Pixbuf -pixbufScale :: Pixbuf -> Pixbuf -> Int -> Int -> Int -> Int -> Double -> Double -> Double -> Double -> InterpType -> IO () -pixbufComposite :: Pixbuf -> Pixbuf -> Int -> Int -> Int -> Int -> Double -> Double -> Double -> Double -> InterpType -> Word8 -> IO () -pixbufAddAlpha :: Pixbuf -> Maybe (Word8, Word8, Word8) -> IO Pixbuf -pixbufCopyArea :: Pixbuf -> Int -> Int -> Int -> Int -> Pixbuf -> Int -> Int -> IO () -pixbufFill :: Pixbuf -> Word8 -> Word8 -> Word8 -> Word8 -> IO () -pixbufGetFromDrawable :: DrawableClass d => d -> Rectangle -> IO (Maybe Pixbuf) - -module Graphics.UI.Gtk.Gdk.Region -makeNewRegion :: Ptr Region -> IO Region -newtype Region -Region :: ForeignPtr Region -> Region -regionNew :: IO Region -data FillRule -EvenOddRule :: FillRule -WindingRule :: FillRule -instance Enum FillRule -regionPolygon :: [Point] -> FillRule -> IO Region -regionCopy :: Region -> IO Region -regionRectangle :: Rectangle -> IO Region -regionGetClipbox :: Region -> IO Rectangle -regionGetRectangles :: Region -> IO [Rectangle] -regionEmpty :: Region -> IO Bool -regionEqual :: Region -> Region -> IO Bool -regionPointIn :: Region -> Point -> IO Bool -data OverlapType -OverlapRectangleIn :: OverlapType -OverlapRectangleOut :: OverlapType -OverlapRectanglePart :: OverlapType -instance Enum OverlapType -regionRectIn :: Region -> Rectangle -> IO OverlapType -regionOffset :: Region -> Int -> Int -> IO () -regionShrink :: Region -> Int -> Int -> IO () -regionUnionWithRect :: Region -> Rectangle -> IO () -regionIntersect :: Region -> Region -> IO () -regionUnion :: Region -> Region -> IO () -regionSubtract :: Region -> Region -> IO () -regionXor :: Region -> Region -> IO () - -module Graphics.UI.Gtk.Gdk.Events -data Modifier -Shift :: Modifier -Control :: Modifier -Alt :: Modifier -Apple :: Modifier -Compose :: Modifier -instance Bounded Modifier -instance Enum Modifier -instance Eq Modifier -instance Flags Modifier -instance Ord Modifier -data Event -Event :: Bool -> Event -eventSent :: Event -> Bool -Expose :: Bool -> Rectangle -> Region -> Int -> Event -eventSent :: Event -> Bool -eventArea :: Event -> Rectangle -eventRegion :: Event -> Region -eventCount :: Event -> Int -Motion :: Bool -> Word32 -> Double -> Double -> [Modifier] -> Bool -> Double -> Double -> Event -eventSent :: Event -> Bool -eventTime :: Event -> Word32 -eventX :: Event -> Double -eventY :: Event -> Double -eventModifier :: Event -> [Modifier] -eventIsHint :: Event -> Bool -eventXRoot :: Event -> Double -eventYRoot :: Event -> Double -Button :: Bool -> Click -> Word32 -> Double -> Double -> [Modifier] -> MouseButton -> Double -> Double -> Event -eventSent :: Event -> Bool -eventClick :: Event -> Click -eventTime :: Event -> Word32 -eventX :: Event -> Double -eventY :: Event -> Double -eventModifier :: Event -> [Modifier] -eventButton :: Event -> MouseButton -eventXRoot :: Event -> Double -eventYRoot :: Event -> Double -Key :: Bool -> Bool -> Word32 -> [Modifier] -> Bool -> Bool -> Bool -> String -> Maybe Char -> Event -eventRelease :: Event -> Bool -eventSent :: Event -> Bool -eventTime :: Event -> Word32 -eventModifier :: Event -> [Modifier] -eventWithCapsLock :: Event -> Bool -eventWithNumLock :: Event -> Bool -eventWithScrollLock :: Event -> Bool -eventKeyName :: Event -> String -eventKeyChar :: Event -> Maybe Char -Crossing :: Bool -> Word32 -> Double -> Double -> Double -> Double -> CrossingMode -> NotifyType -> [Modifier] -> Event -eventSent :: Event -> Bool -eventTime :: Event -> Word32 -eventX :: Event -> Double -eventY :: Event -> Double -eventXRoot :: Event -> Double -eventYRoot :: Event -> Double -eventCrossingMode :: Event -> CrossingMode -eventNotifyType :: Event -> NotifyType -eventModifier :: Event -> [Modifier] -Focus :: Bool -> Bool -> Event -eventSent :: Event -> Bool -eventInFocus :: Event -> Bool -Configure :: Bool -> Int -> Int -> Int -> Int -> Event -eventSent :: Event -> Bool -eventXParent :: Event -> Int -eventYParent :: Event -> Int -eventWidth :: Event -> Int -eventHeight :: Event -> Int -Visibility :: Bool -> VisibilityState -> Event -eventSent :: Event -> Bool -eventVisible :: Event -> VisibilityState -Scroll :: Bool -> Word32 -> Double -> Double -> ScrollDirection -> Double -> Double -> Event -eventSent :: Event -> Bool -eventTime :: Event -> Word32 -eventX :: Event -> Double -eventY :: Event -> Double -eventDirection :: Event -> ScrollDirection -eventXRoot :: Event -> Double -eventYRoot :: Event -> Double -WindowState :: Bool -> [WindowState] -> [WindowState] -> Event -eventSent :: Event -> Bool -eventWindowMask :: Event -> [WindowState] -eventWindowState :: Event -> [WindowState] -Proximity :: Bool -> Word32 -> Bool -> Event -eventSent :: Event -> Bool -eventTime :: Event -> Word32 -eventInContact :: Event -> Bool -data VisibilityState -VisibilityUnobscured :: VisibilityState -VisibilityPartialObscured :: VisibilityState -VisibilityFullyObscured :: VisibilityState -instance Enum VisibilityState -data CrossingMode -CrossingNormal :: CrossingMode -CrossingGrab :: CrossingMode -CrossingUngrab :: CrossingMode -instance Enum CrossingMode -data NotifyType -NotifyAncestor :: NotifyType -NotifyVirtual :: NotifyType -NotifyInferior :: NotifyType -NotifyNonlinear :: NotifyType -NotifyNonlinearVirtual :: NotifyType -NotifyUnknown :: NotifyType -instance Enum NotifyType -data WindowState -WindowStateWithdrawn :: WindowState -WindowStateIconified :: WindowState -WindowStateMaximized :: WindowState -WindowStateSticky :: WindowState -WindowStateFullscreen :: WindowState -WindowStateAbove :: WindowState -WindowStateBelow :: WindowState -instance Bounded WindowState -instance Enum WindowState -instance Flags WindowState -data ScrollDirection -ScrollUp :: ScrollDirection -ScrollDown :: ScrollDirection -ScrollLeft :: ScrollDirection -ScrollRight :: ScrollDirection -instance Enum ScrollDirection -data MouseButton -LeftButton :: MouseButton -MiddleButton :: MouseButton -RightButton :: MouseButton -instance Enum MouseButton -instance Eq MouseButton -instance Show MouseButton -data Click -SingleClick :: Click -DoubleClick :: Click -TripleClick :: Click -ReleaseClick :: Click -data Rectangle -Rectangle :: Int -> Int -> Int -> Int -> Rectangle -instance Storable Rectangle - -module Graphics.UI.Gtk.Gdk.DrawWindow -data DrawWindow -instance DrawWindowClass DrawWindow -instance DrawableClass DrawWindow -instance GObjectClass DrawWindow -class DrawableClass o => DrawWindowClass o -instance DrawWindowClass DrawWindow -castToDrawWindow :: GObjectClass obj => obj -> DrawWindow -data WindowState -WindowStateWithdrawn :: WindowState -WindowStateIconified :: WindowState -WindowStateMaximized :: WindowState -WindowStateSticky :: WindowState -WindowStateFullscreen :: WindowState -WindowStateAbove :: WindowState -WindowStateBelow :: WindowState -instance Bounded WindowState -instance Enum WindowState -instance Flags WindowState -drawWindowGetState :: DrawWindowClass self => self -> IO [WindowState] -drawWindowClear :: DrawWindowClass self => self -> IO () -drawWindowClearArea :: DrawWindowClass self => self -> Int -> Int -> Int -> Int -> IO () -drawWindowClearAreaExpose :: DrawWindowClass self => self -> Int -> Int -> Int -> Int -> IO () -drawWindowRaise :: DrawWindowClass self => self -> IO () -drawWindowLower :: DrawWindowClass self => self -> IO () -drawWindowBeginPaintRect :: DrawWindowClass self => self -> Rectangle -> IO () -drawWindowBeginPaintRegion :: DrawWindowClass self => self -> Region -> IO () -drawWindowEndPaint :: DrawWindowClass self => self -> IO () -drawWindowInvalidateRect :: DrawWindowClass self => self -> Rectangle -> Bool -> IO () -drawWindowInvalidateRegion :: DrawWindowClass self => self -> Region -> Bool -> IO () -drawWindowGetUpdateArea :: DrawWindowClass self => self -> IO (Maybe Region) -drawWindowFreezeUpdates :: DrawWindowClass self => self -> IO () -drawWindowThawUpdates :: DrawWindowClass self => self -> IO () -drawWindowProcessUpdates :: DrawWindowClass self => self -> Bool -> IO () -drawWindowSetAcceptFocus :: DrawWindowClass self => self -> Bool -> IO () -drawWindowShapeCombineRegion :: DrawWindowClass self => self -> Maybe Region -> Int -> Int -> IO () -drawWindowSetChildShapes :: DrawWindowClass self => self -> IO () -drawWindowMergeChildShapes :: DrawWindowClass self => self -> IO () -drawWindowGetPointer :: DrawWindowClass self => self -> IO (Maybe (Bool, Int, Int, [Modifier])) - -module Graphics.UI.Gtk.General.StockItems -data StockItem -StockItem :: StockId -> String -> [Modifier] -> KeyVal -> String -> StockItem -siStockId :: StockItem -> StockId -siLabel :: StockItem -> String -siModifier :: StockItem -> [Modifier] -siKeyval :: StockItem -> KeyVal -siTransDom :: StockItem -> String -instance Storable StockItem -type StockId = String -siStockId :: StockItem -> StockId -siLabel :: StockItem -> String -siModifier :: StockItem -> [Modifier] -siKeyval :: StockItem -> KeyVal -siTransDom :: StockItem -> String -stockAddItem :: [StockItem] -> IO () -stockLookupItem :: StockId -> IO (Maybe StockItem) -stockListIds :: IO [StockId] -stockAdd :: StockId -stockApply :: StockId -stockBold :: StockId -stockCancel :: StockId -stockCDROM :: StockId -stockClear :: StockId -stockClose :: StockId -stockColorPicker :: StockId -stockConvert :: StockId -stockCopy :: StockId -stockCut :: StockId -stockDelete :: StockId -stockDialogError :: StockId -stockDialogInfo :: StockId -stockDialogQuestion :: StockId -stockDialogWarning :: StockId -stockDnd :: StockId -stockDndMultiple :: StockId -stockExecute :: StockId -stockFind :: StockId -stockFindAndRelpace :: StockId -stockFloppy :: StockId -stockGotoBottom :: StockId -stockGotoFirst :: StockId -stockGotoLast :: StockId -stockGotoTop :: StockId -stockGoBack :: StockId -stockGoDown :: StockId -stockGoForward :: StockId -stockGoUp :: StockId -stockHelp :: StockId -stockHome :: StockId -stockIndex :: StockId -stockItalic :: StockId -stockJumpTo :: StockId -stockJustifyCenter :: StockId -stockJustifyFill :: StockId -stockJustifyLeft :: StockId -stockJustifyRight :: StockId -stockMissingImage :: StockId -stockNew :: StockId -stockNo :: StockId -stockOk :: StockId -stockOpen :: StockId -stockPaste :: StockId -stockPreferences :: StockId -stockPrint :: StockId -stockPrintPreview :: StockId -stockProperties :: StockId -stockQuit :: StockId -stockRedo :: StockId -stockRefresh :: StockId -stockRemove :: StockId -stockRevertToSaved :: StockId -stockSave :: StockId -stockSaveAs :: StockId -stockSelectColor :: StockId -stockSelectFont :: StockId -stockSortAscending :: StockId -stockSortDescending :: StockId -stockSpellCheck :: StockId -stockStop :: StockId -stockStrikethrough :: StockId -stockUndelete :: StockId -stockUnderline :: StockId -stockUndo :: StockId -stockYes :: StockId -stockZoom100 :: StockId -stockZoomFit :: StockId -stockZoomIn :: StockId -stockZoomOut :: StockId - -module Graphics.UI.Gtk.Gdk.GC -data GC -instance GCClass GC -instance GObjectClass GC -class GObjectClass o => GCClass o -instance GCClass GC -castToGC :: GObjectClass obj => obj -> GC -gcNew :: DrawableClass d => d -> IO GC -data GCValues -GCValues :: Color -> Color -> Function -> Fill -> Maybe Pixmap -> Maybe Pixmap -> Maybe Pixmap -> SubwindowMode -> Int -> Int -> Int -> Int -> Bool -> Int -> LineStyle -> CapStyle -> JoinStyle -> GCValues -foreground :: GCValues -> Color -background :: GCValues -> Color -function :: GCValues -> Function -fill :: GCValues -> Fill -tile :: GCValues -> Maybe Pixmap -stipple :: GCValues -> Maybe Pixmap -clipMask :: GCValues -> Maybe Pixmap -subwindowMode :: GCValues -> SubwindowMode -tsXOrigin :: GCValues -> Int -tsYOrigin :: GCValues -> Int -clipXOrigin :: GCValues -> Int -clipYOrigin :: GCValues -> Int -graphicsExposure :: GCValues -> Bool -lineWidth :: GCValues -> Int -lineStyle :: GCValues -> LineStyle -capStyle :: GCValues -> CapStyle -joinStyle :: GCValues -> JoinStyle -instance Storable GCValues -newGCValues :: GCValues -data Color -Color :: Word16 -> Word16 -> Word16 -> Color -instance Storable Color -foreground :: GCValues -> Color -background :: GCValues -> Color -data Function -Copy :: Function -Invert :: Function -Xor :: Function -Clear :: Function -And :: Function -AndReverse :: Function -AndInvert :: Function -Noop :: Function -Or :: Function -Equiv :: Function -OrReverse :: Function -CopyInvert :: Function -OrInvert :: Function -Nand :: Function -Nor :: Function -Set :: Function -instance Enum Function -function :: GCValues -> Function -data Fill -Solid :: Fill -Tiled :: Fill -Stippled :: Fill -OpaqueStippled :: Fill -instance Enum Fill -fill :: GCValues -> Fill -tile :: GCValues -> Maybe Pixmap -stipple :: GCValues -> Maybe Pixmap -clipMask :: GCValues -> Maybe Pixmap -data SubwindowMode -ClipByChildren :: SubwindowMode -IncludeInferiors :: SubwindowMode -instance Enum SubwindowMode -subwindowMode :: GCValues -> SubwindowMode -tsXOrigin :: GCValues -> Int -tsYOrigin :: GCValues -> Int -clipXOrigin :: GCValues -> Int -clipYOrigin :: GCValues -> Int -graphicsExposure :: GCValues -> Bool -lineWidth :: GCValues -> Int -data LineStyle -LineSolid :: LineStyle -LineOnOffDash :: LineStyle -LineDoubleDash :: LineStyle -instance Enum LineStyle -lineStyle :: GCValues -> LineStyle -data CapStyle -CapNotLast :: CapStyle -CapButt :: CapStyle -CapRound :: CapStyle -CapProjecting :: CapStyle -instance Enum CapStyle -capStyle :: GCValues -> CapStyle -data JoinStyle -JoinMiter :: JoinStyle -JoinRound :: JoinStyle -JoinBevel :: JoinStyle -instance Enum JoinStyle -joinStyle :: GCValues -> JoinStyle -gcNewWithValues :: DrawableClass d => d -> GCValues -> IO GC -gcSetValues :: GC -> GCValues -> IO () -gcGetValues :: GC -> IO GCValues -gcSetClipRectangle :: GC -> Rectangle -> IO () -gcSetClipRegion :: GC -> Region -> IO () -gcSetDashes :: GC -> Int -> [(Int, Int)] -> IO () - -module Graphics.UI.Gtk.General.IconFactory -data IconFactory -instance GObjectClass IconFactory -instance IconFactoryClass IconFactory -class GObjectClass o => IconFactoryClass o -instance IconFactoryClass IconFactory -castToIconFactory :: GObjectClass obj => obj -> IconFactory -toIconFactory :: IconFactoryClass o => o -> IconFactory -iconFactoryNew :: IO IconFactory -iconFactoryAdd :: IconFactory -> String -> IconSet -> IO () -iconFactoryAddDefault :: IconFactory -> IO () -iconFactoryLookup :: IconFactory -> String -> IO (Maybe IconSet) -iconFactoryLookupDefault :: String -> IO (Maybe IconSet) -iconFactoryRemoveDefault :: IconFactory -> IO () -data IconSet -iconSetNew :: IO IconSet -iconSetNewFromPixbuf :: Pixbuf -> IO IconSet -iconSetAddSource :: IconSet -> IconSource -> IO () -iconSetRenderIcon :: WidgetClass widget => IconSet -> TextDirection -> StateType -> IconSize -> widget -> IO Pixbuf -iconSetGetSizes :: IconSet -> IO [IconSize] -data IconSource -iconSourceNew :: IO IconSource -data TextDirection -TextDirNone :: TextDirection -TextDirLtr :: TextDirection -TextDirRtl :: TextDirection -instance Enum TextDirection -instance Eq TextDirection -iconSourceGetDirection :: IconSource -> IO (Maybe TextDirection) -iconSourceSetDirection :: IconSource -> TextDirection -> IO () -iconSourceGetFilename :: IconSource -> IO (Maybe String) -iconSourceSetFilename :: IconSource -> FilePath -> IO () -iconSourceGetPixbuf :: IconSource -> IO (Maybe Pixbuf) -iconSourceSetPixbuf :: IconSource -> Pixbuf -> IO () -iconSourceGetSize :: IconSource -> IO (Maybe IconSize) -iconSourceSetSize :: IconSource -> IconSize -> IO () -iconSourceResetSize :: IconSource -> IO () -data StateType -StateNormal :: StateType -StateActive :: StateType -StatePrelight :: StateType -StateSelected :: StateType -StateInsensitive :: StateType -instance Enum StateType -instance Eq StateType -iconSourceGetState :: IconSource -> IO (Maybe StateType) -iconSourceSetState :: IconSource -> StateType -> IO () -iconSourceResetState :: IconSource -> IO () -type IconSize = Int -iconSizeInvalid :: IconSize -iconSizeMenu :: IconSize -iconSizeSmallToolbar :: IconSize -iconSizeLargeToolbar :: IconSize -iconSizeButton :: IconSize -iconSizeDialog :: IconSize -iconSizeCheck :: IconSize -> IO Bool -iconSizeRegister :: Int -> String -> Int -> IO IconSize -iconSizeRegisterAlias :: IconSize -> String -> IO () -iconSizeFromName :: String -> IO IconSize -iconSizeGetName :: IconSize -> IO (Maybe String) - -module Graphics.UI.Gtk.General.Style -data Style -instance GObjectClass Style -instance StyleClass Style -class GObjectClass o => StyleClass o -instance StyleClass Style -castToStyle :: GObjectClass obj => obj -> Style -toStyle :: StyleClass o => o -> Style -styleGetForeground :: StateType -> Style -> IO GC -styleGetBackground :: StateType -> Style -> IO GC -styleGetLight :: StateType -> Style -> IO GC -styleGetMiddle :: StateType -> Style -> IO GC -styleGetDark :: StateType -> Style -> IO GC -styleGetText :: StateType -> Style -> IO GC -styleGetBase :: StateType -> Style -> IO GC -styleGetAntiAliasing :: StateType -> Style -> IO GC - -module Graphics.UI.Gtk.Multiline.TextIter -newtype TextIter -TextIter :: ForeignPtr TextIter -> TextIter -data TextSearchFlags -TextSearchVisibleOnly :: TextSearchFlags -TextSearchTextOnly :: TextSearchFlags -instance Bounded TextSearchFlags -instance Enum TextSearchFlags -instance Eq TextSearchFlags -instance Flags TextSearchFlags -mkTextIterCopy :: Ptr TextIter -> IO TextIter -makeEmptyTextIter :: IO TextIter -textIterGetBuffer :: TextIter -> IO TextBuffer -textIterCopy :: TextIter -> IO TextIter -textIterGetOffset :: TextIter -> IO Int -textIterGetLine :: TextIter -> IO Int -textIterGetLineOffset :: TextIter -> IO Int -textIterGetVisibleLineOffset :: TextIter -> IO Int -textIterGetChar :: TextIter -> IO (Maybe Char) -textIterGetSlice :: TextIter -> TextIter -> IO String -textIterGetText :: TextIter -> TextIter -> IO String -textIterGetVisibleSlice :: TextIter -> TextIter -> IO String -textIterGetVisibleText :: TextIter -> TextIter -> IO String -textIterGetPixbuf :: TextIter -> IO (Maybe Pixbuf) -textIterBeginsTag :: TextIter -> TextTag -> IO Bool -textIterEndsTag :: TextIter -> TextTag -> IO Bool -textIterTogglesTag :: TextIter -> TextTag -> IO Bool -textIterHasTag :: TextIter -> TextTag -> IO Bool -textIterEditable :: TextIter -> Bool -> IO Bool -textIterCanInsert :: TextIter -> Bool -> IO Bool -textIterStartsWord :: TextIter -> IO Bool -textIterEndsWord :: TextIter -> IO Bool -textIterInsideWord :: TextIter -> IO Bool -textIterStartsLine :: TextIter -> IO Bool -textIterEndsLine :: TextIter -> IO Bool -textIterStartsSentence :: TextIter -> IO Bool -textIterEndsSentence :: TextIter -> IO Bool -textIterInsideSentence :: TextIter -> IO Bool -textIterIsCursorPosition :: TextIter -> IO Bool -textIterGetCharsInLine :: TextIter -> IO Int -textIterIsEnd :: TextIter -> IO Bool -textIterIsStart :: TextIter -> IO Bool -textIterForwardChar :: TextIter -> IO Bool -textIterBackwardChar :: TextIter -> IO Bool -textIterForwardChars :: TextIter -> Int -> IO Bool -textIterBackwardChars :: TextIter -> Int -> IO Bool -textIterForwardLine :: TextIter -> IO Bool -textIterBackwardLine :: TextIter -> IO Bool -textIterForwardLines :: TextIter -> Int -> IO Bool -textIterBackwardLines :: TextIter -> Int -> IO Bool -textIterForwardWordEnds :: TextIter -> Int -> IO Bool -textIterBackwardWordStarts :: TextIter -> Int -> IO Bool -textIterForwardWordEnd :: TextIter -> IO Bool -textIterBackwardWordStart :: TextIter -> IO Bool -textIterForwardCursorPosition :: TextIter -> IO Bool -textIterBackwardCursorPosition :: TextIter -> IO Bool -textIterForwardCursorPositions :: TextIter -> Int -> IO Bool -textIterBackwardCursorPositions :: TextIter -> Int -> IO Bool -textIterForwardSentenceEnds :: TextIter -> Int -> IO Bool -textIterBackwardSentenceStarts :: TextIter -> Int -> IO Bool -textIterForwardSentenceEnd :: TextIter -> IO Bool -textIterBackwardSentenceStart :: TextIter -> IO Bool -textIterSetOffset :: TextIter -> Int -> IO () -textIterSetLine :: TextIter -> Int -> IO () -textIterSetLineOffset :: TextIter -> Int -> IO () -textIterSetVisibleLineOffset :: TextIter -> Int -> IO () -textIterForwardToEnd :: TextIter -> IO () -textIterForwardToLineEnd :: TextIter -> IO Bool -textIterForwardToTagToggle :: TextIter -> Maybe TextTag -> IO Bool -textIterBackwardToTagToggle :: TextIter -> Maybe TextTag -> IO Bool -textIterForwardFindChar :: TextIter -> (Char -> Bool) -> Maybe TextIter -> IO Bool -textIterBackwardFindChar :: TextIter -> (Char -> Bool) -> Maybe TextIter -> IO Bool -textIterForwardSearch :: TextIter -> String -> [TextSearchFlags] -> Maybe TextIter -> IO (Maybe (TextIter, TextIter)) -textIterBackwardSearch :: TextIter -> String -> [TextSearchFlags] -> Maybe TextIter -> IO (Maybe (TextIter, TextIter)) -textIterEqual :: TextIter -> TextIter -> IO Bool -textIterCompare :: TextIter -> TextIter -> IO Ordering -textIterForwardVisibleLine :: TextIter -> IO Bool -textIterBackwardVisibleLine :: TextIter -> IO Bool -textIterForwardVisibleLines :: TextIter -> Int -> IO Bool -textIterBackwardVisibleLines :: TextIter -> Int -> IO Bool -textIterVisibleLineOffset :: Attr TextIter Int -textIterOffset :: Attr TextIter Int -textIterLineOffset :: Attr TextIter Int -textIterLine :: Attr TextIter Int - -module Graphics.UI.Gtk.Multiline.TextBuffer -data TextBuffer -instance GObjectClass TextBuffer -instance TextBufferClass TextBuffer -class GObjectClass o => TextBufferClass o -instance TextBufferClass SourceBuffer -instance TextBufferClass TextBuffer -castToTextBuffer :: GObjectClass obj => obj -> TextBuffer -toTextBuffer :: TextBufferClass o => o -> TextBuffer -textBufferNew :: Maybe TextTagTable -> IO TextBuffer -textBufferGetLineCount :: TextBufferClass self => self -> IO Int -textBufferGetCharCount :: TextBufferClass self => self -> IO Int -textBufferGetTagTable :: TextBufferClass self => self -> IO TextTagTable -textBufferInsert :: TextBufferClass self => self -> TextIter -> String -> IO () -textBufferInsertAtCursor :: TextBufferClass self => self -> String -> IO () -textBufferInsertInteractive :: TextBufferClass self => self -> TextIter -> String -> Bool -> IO Bool -textBufferInsertInteractiveAtCursor :: TextBufferClass self => self -> String -> Bool -> IO Bool -textBufferInsertRange :: TextBufferClass self => self -> TextIter -> TextIter -> TextIter -> IO () -textBufferInsertRangeInteractive :: TextBufferClass self => self -> TextIter -> TextIter -> TextIter -> Bool -> IO Bool -textBufferDelete :: TextBufferClass self => self -> TextIter -> TextIter -> IO () -textBufferDeleteInteractive :: TextBufferClass self => self -> TextIter -> TextIter -> Bool -> IO Bool -textBufferSetText :: TextBufferClass self => self -> String -> IO () -textBufferGetText :: TextBufferClass self => self -> TextIter -> TextIter -> Bool -> IO String -textBufferGetSlice :: TextBufferClass self => self -> TextIter -> TextIter -> Bool -> IO String -textBufferInsertPixbuf :: TextBufferClass self => self -> TextIter -> Pixbuf -> IO () -textBufferCreateMark :: TextBufferClass self => self -> Maybe MarkName -> TextIter -> Bool -> IO TextMark -textBufferMoveMark :: (TextBufferClass self, TextMarkClass mark) => self -> mark -> TextIter -> IO () -textBufferMoveMarkByName :: TextBufferClass self => self -> MarkName -> TextIter -> IO () -textBufferDeleteMark :: (TextBufferClass self, TextMarkClass mark) => self -> mark -> IO () -textBufferDeleteMarkByName :: TextBufferClass self => self -> MarkName -> IO () -textBufferGetMark :: TextBufferClass self => self -> MarkName -> IO (Maybe TextMark) -textBufferGetInsert :: TextBufferClass self => self -> IO TextMark -textBufferGetSelectionBound :: TextBufferClass self => self -> IO TextMark -textBufferPlaceCursor :: TextBufferClass self => self -> TextIter -> IO () -textBufferApplyTag :: (TextBufferClass self, TextTagClass tag) => self -> tag -> TextIter -> TextIter -> IO () -textBufferRemoveTag :: (TextBufferClass self, TextTagClass tag) => self -> tag -> TextIter -> TextIter -> IO () -textBufferApplyTagByName :: TextBufferClass self => self -> TagName -> TextIter -> TextIter -> IO () -textBufferRemoveTagByName :: TextBufferClass self => self -> TagName -> TextIter -> TextIter -> IO () -textBufferRemoveAllTags :: TextBufferClass self => self -> TextIter -> TextIter -> IO () -textBufferGetIterAtLineOffset :: TextBufferClass self => self -> Int -> Int -> IO TextIter -textBufferGetIterAtOffset :: TextBufferClass self => self -> Int -> IO TextIter -textBufferGetIterAtLine :: TextBufferClass self => self -> Int -> IO TextIter -textBufferGetIterAtMark :: (TextBufferClass self, TextMarkClass mark) => self -> mark -> IO TextIter -textBufferGetStartIter :: TextBufferClass self => self -> IO TextIter -textBufferGetEndIter :: TextBufferClass self => self -> IO TextIter -textBufferGetModified :: TextBufferClass self => self -> IO Bool -textBufferSetModified :: TextBufferClass self => self -> Bool -> IO () -textBufferDeleteSelection :: TextBufferClass self => self -> Bool -> Bool -> IO Bool -textBufferHasSelection :: TextBufferClass self => self -> IO Bool -textBufferGetSelectionBounds :: TextBufferClass self => self -> IO (TextIter, TextIter) -textBufferSelectRange :: TextBufferClass self => self -> TextIter -> TextIter -> IO () -textBufferGetBounds :: TextBufferClass self => self -> TextIter -> TextIter -> IO () -textBufferBeginUserAction :: TextBufferClass self => self -> IO () -textBufferEndUserAction :: TextBufferClass self => self -> IO () -textBufferBackspace :: TextBufferClass self => self -> TextIter -> Bool -> Bool -> IO Bool -textBufferInsertChildAnchor :: TextBufferClass self => self -> TextIter -> TextChildAnchor -> IO () -textBufferCreateChildAnchor :: TextBufferClass self => self -> TextIter -> IO TextChildAnchor -textBufferGetIterAtChildAnchor :: TextBufferClass self => self -> TextIter -> TextChildAnchor -> IO () -textBufferTagTable :: (TextBufferClass self, TextTagTableClass textTagTable) => ReadWriteAttr self TextTagTable textTagTable -textBufferText :: TextBufferClass self => Attr self String -textBufferModified :: TextBufferClass self => Attr self Bool -onApplyTag :: TextBufferClass self => self -> (TextTag -> TextIter -> TextIter -> IO ()) -> IO (ConnectId self) -afterApplyTag :: TextBufferClass self => self -> (TextTag -> TextIter -> TextIter -> IO ()) -> IO (ConnectId self) -onBeginUserAction :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -afterBeginUserAction :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -onBufferChanged :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -afterBufferChanged :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -onDeleteRange :: TextBufferClass self => self -> (TextIter -> TextIter -> IO ()) -> IO (ConnectId self) -afterDeleteRange :: TextBufferClass self => self -> (TextIter -> TextIter -> IO ()) -> IO (ConnectId self) -onEndUserAction :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -afterEndUserAction :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -onInsertPixbuf :: TextBufferClass self => self -> (TextIter -> Pixbuf -> IO ()) -> IO (ConnectId self) -afterInsertPixbuf :: TextBufferClass self => self -> (TextIter -> Pixbuf -> IO ()) -> IO (ConnectId self) -onInsertText :: TextBufferClass self => self -> (TextIter -> String -> IO ()) -> IO (ConnectId self) -afterInsertText :: TextBufferClass self => self -> (TextIter -> String -> IO ()) -> IO (ConnectId self) -onMarkDeleted :: TextBufferClass self => self -> (TextMark -> IO ()) -> IO (ConnectId self) -afterMarkDeleted :: TextBufferClass self => self -> (TextMark -> IO ()) -> IO (ConnectId self) -onMarkSet :: TextBufferClass self => self -> (TextIter -> TextMark -> IO ()) -> IO (ConnectId self) -afterMarkSet :: TextBufferClass self => self -> (TextIter -> TextMark -> IO ()) -> IO (ConnectId self) -onModifiedChanged :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -afterModifiedChanged :: TextBufferClass self => self -> IO () -> IO (ConnectId self) -onRemoveTag :: TextBufferClass self => self -> (TextTag -> TextIter -> TextIter -> IO ()) -> IO (ConnectId self) -afterRemoveTag :: TextBufferClass self => self -> (TextTag -> TextIter -> TextIter -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Abstract.Widget -data Widget -instance GObjectClass Widget -instance ObjectClass Widget -instance WidgetClass Widget -class ObjectClass o => WidgetClass o -instance WidgetClass AboutDialog -instance WidgetClass AccelLabel -instance WidgetClass Alignment -instance WidgetClass Arrow -instance WidgetClass AspectFrame -instance WidgetClass Bin -instance WidgetClass Box -instance WidgetClass Button -instance WidgetClass ButtonBox -instance WidgetClass CList -instance WidgetClass CTree -instance WidgetClass Calendar -instance WidgetClass CellView -instance WidgetClass CheckButton -instance WidgetClass CheckMenuItem -instance WidgetClass ColorButton -instance WidgetClass ColorSelection -instance WidgetClass ColorSelectionDialog -instance WidgetClass Combo -instance WidgetClass ComboBox -instance WidgetClass ComboBoxEntry -instance WidgetClass Container -instance WidgetClass Curve -instance WidgetClass Dialog -instance WidgetClass DrawingArea -instance WidgetClass Entry -instance WidgetClass EventBox -instance WidgetClass Expander -instance WidgetClass FileChooserButton -instance WidgetClass FileChooserDialog -instance WidgetClass FileChooserWidget -instance WidgetClass FileSelection -instance WidgetClass Fixed -instance WidgetClass FontButton -instance WidgetClass FontSelection -instance WidgetClass FontSelectionDialog -instance WidgetClass Frame -instance WidgetClass GammaCurve -instance WidgetClass HBox -instance WidgetClass HButtonBox -instance WidgetClass HPaned -instance WidgetClass HRuler -instance WidgetClass HScale -instance WidgetClass HScrollbar -instance WidgetClass HSeparator -instance WidgetClass HandleBox -instance WidgetClass IconView -instance WidgetClass Image -instance WidgetClass ImageMenuItem -instance WidgetClass InputDialog -instance WidgetClass Invisible -instance WidgetClass Item -instance WidgetClass Label -instance WidgetClass Layout -instance WidgetClass List -instance WidgetClass ListItem -instance WidgetClass Menu -instance WidgetClass MenuBar -instance WidgetClass MenuItem -instance WidgetClass MenuShell -instance WidgetClass MenuToolButton -instance WidgetClass MessageDialog -instance WidgetClass Misc -instance WidgetClass MozEmbed -instance WidgetClass Notebook -instance WidgetClass OptionMenu -instance WidgetClass Paned -instance WidgetClass Plug -instance WidgetClass Preview -instance WidgetClass ProgressBar -instance WidgetClass RadioButton -instance WidgetClass RadioMenuItem -instance WidgetClass RadioToolButton -instance WidgetClass Range -instance WidgetClass Ruler -instance WidgetClass Scale -instance WidgetClass Scrollbar -instance WidgetClass ScrolledWindow -instance WidgetClass Separator -instance WidgetClass SeparatorMenuItem -instance WidgetClass SeparatorToolItem -instance WidgetClass Socket -instance WidgetClass SourceView -instance WidgetClass SpinButton -instance WidgetClass Statusbar -instance WidgetClass Table -instance WidgetClass TearoffMenuItem -instance WidgetClass TextView -instance WidgetClass TipsQuery -instance WidgetClass ToggleButton -instance WidgetClass ToggleToolButton -instance WidgetClass ToolButton -instance WidgetClass ToolItem -instance WidgetClass Toolbar -instance WidgetClass TreeView -instance WidgetClass VBox -instance WidgetClass VButtonBox -instance WidgetClass VPaned -instance WidgetClass VRuler -instance WidgetClass VScale -instance WidgetClass VScrollbar -instance WidgetClass VSeparator -instance WidgetClass Viewport -instance WidgetClass Widget -instance WidgetClass Window -castToWidget :: GObjectClass obj => obj -> Widget -toWidget :: WidgetClass o => o -> Widget -type Allocation = Rectangle -data Requisition -Requisition :: Int -> Int -> Requisition -instance Storable Requisition -data Rectangle -Rectangle :: Int -> Int -> Int -> Int -> Rectangle -instance Storable Rectangle -widgetGetState :: WidgetClass w => w -> IO StateType -widgetGetSavedState :: WidgetClass w => w -> IO StateType -widgetShow :: WidgetClass self => self -> IO () -widgetShowNow :: WidgetClass self => self -> IO () -widgetHide :: WidgetClass self => self -> IO () -widgetShowAll :: WidgetClass self => self -> IO () -widgetHideAll :: WidgetClass self => self -> IO () -widgetDestroy :: WidgetClass self => self -> IO () -widgetQueueDraw :: WidgetClass self => self -> IO () -widgetHasIntersection :: WidgetClass self => self -> Rectangle -> IO Bool -widgetIntersect :: WidgetClass self => self -> Rectangle -> IO (Maybe Rectangle) -widgetRegionIntersect :: WidgetClass self => self -> Region -> IO Region -widgetActivate :: WidgetClass self => self -> IO Bool -widgetSetSensitivity :: WidgetClass self => self -> Bool -> IO () -widgetSetSizeRequest :: WidgetClass self => self -> Int -> Int -> IO () -widgetGetSizeRequest :: WidgetClass self => self -> IO (Int, Int) -widgetIsFocus :: WidgetClass self => self -> IO Bool -widgetGrabFocus :: WidgetClass self => self -> IO () -widgetSetAppPaintable :: WidgetClass self => self -> Bool -> IO () -widgetSetName :: WidgetClass self => self -> String -> IO () -widgetGetName :: WidgetClass self => self -> IO String -data EventMask -ExposureMask :: EventMask -PointerMotionMask :: EventMask -PointerMotionHintMask :: EventMask -ButtonMotionMask :: EventMask -Button1MotionMask :: EventMask -Button2MotionMask :: EventMask -Button3MotionMask :: EventMask -ButtonPressMask :: EventMask -ButtonReleaseMask :: EventMask -KeyPressMask :: EventMask -KeyReleaseMask :: EventMask -EnterNotifyMask :: EventMask -LeaveNotifyMask :: EventMask -FocusChangeMask :: EventMask -StructureMask :: EventMask -PropertyChangeMask :: EventMask -VisibilityNotifyMask :: EventMask -ProximityInMask :: EventMask -ProximityOutMask :: EventMask -SubstructureMask :: EventMask -ScrollMask :: EventMask -AllEventsMask :: EventMask -instance Bounded EventMask -instance Enum EventMask -instance Flags EventMask -widgetDelEvents :: WidgetClass self => self -> [EventMask] -> IO () -widgetAddEvents :: WidgetClass self => self -> [EventMask] -> IO () -widgetGetEvents :: WidgetClass self => self -> IO [EventMask] -data ExtensionMode -ExtensionEventsNone :: ExtensionMode -ExtensionEventsAll :: ExtensionMode -ExtensionEventsCursor :: ExtensionMode -instance Bounded ExtensionMode -instance Enum ExtensionMode -instance Flags ExtensionMode -widgetSetExtensionEvents :: WidgetClass self => self -> [ExtensionMode] -> IO () -widgetGetExtensionEvents :: WidgetClass self => self -> IO [ExtensionMode] -widgetGetToplevel :: WidgetClass self => self -> IO Widget -widgetIsAncestor :: (WidgetClass self, WidgetClass ancestor) => self -> ancestor -> IO Bool -widgetReparent :: (WidgetClass self, WidgetClass newParent) => self -> newParent -> IO () -data TextDirection -TextDirNone :: TextDirection -TextDirLtr :: TextDirection -TextDirRtl :: TextDirection -instance Enum TextDirection -instance Eq TextDirection -widgetSetDirection :: WidgetClass self => self -> TextDirection -> IO () -widgetGetDirection :: WidgetClass self => self -> IO TextDirection -widgetQueueDrawArea :: WidgetClass self => self -> Int -> Int -> Int -> Int -> IO () -widgetSetDoubleBuffered :: WidgetClass self => self -> Bool -> IO () -widgetSetRedrawOnAllocate :: WidgetClass self => self -> Bool -> IO () -widgetGetParentWindow :: WidgetClass self => self -> IO DrawWindow -widgetGetPointer :: WidgetClass self => self -> IO (Int, Int) -widgetTranslateCoordinates :: (WidgetClass self, WidgetClass destWidget) => self -> destWidget -> Int -> Int -> IO (Maybe (Int, Int)) -widgetPath :: WidgetClass self => self -> IO (Int, String, String) -widgetClassPath :: WidgetClass self => self -> IO (Int, String, String) -widgetGetCompositeName :: WidgetClass self => self -> IO (Maybe String) -widgetSetCompositeName :: WidgetClass self => self -> String -> IO () -widgetGetParent :: WidgetClass self => self -> IO (Maybe Widget) -widgetSetDefaultDirection :: TextDirection -> IO () -widgetGetDefaultDirection :: IO TextDirection -widgetModifyStyle :: (WidgetClass self, RcStyleClass style) => self -> style -> IO () -widgetGetModifierStyle :: WidgetClass self => self -> IO RcStyle -widgetModifyFg :: WidgetClass self => self -> StateType -> Color -> IO () -widgetModifyBg :: WidgetClass self => self -> StateType -> Color -> IO () -widgetModifyText :: WidgetClass self => self -> StateType -> Color -> IO () -widgetModifyBase :: WidgetClass self => self -> StateType -> Color -> IO () -widgetModifyFont :: WidgetClass self => self -> Maybe FontDescription -> IO () -widgetCreateLayout :: WidgetClass self => self -> String -> IO PangoLayout -widgetCreatePangoContext :: WidgetClass self => self -> IO PangoContext -widgetGetPangoContext :: WidgetClass self => self -> IO PangoContext -widgetRenderIcon :: WidgetClass self => self -> StockId -> IconSize -> String -> IO (Maybe Pixbuf) -widgetGetCanFocus :: WidgetClass self => self -> IO Bool -widgetSetCanFocus :: WidgetClass self => self -> Bool -> IO () -widgetExtensionEvents :: WidgetClass self => Attr self [ExtensionMode] -widgetDirection :: WidgetClass self => Attr self TextDirection -widgetCanFocus :: WidgetClass self => Attr self Bool -onButtonPress :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterButtonPress :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onButtonRelease :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterButtonRelease :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onClient :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterClient :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onConfigure :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterConfigure :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onDelete :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterDelete :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onDestroyEvent :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterDestroyEvent :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onDirectionChanged :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterDirectionChanged :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onEnterNotify :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterEnterNotify :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onLeaveNotify :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterLeaveNotify :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onExpose :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterExpose :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onExposeRect :: WidgetClass w => w -> (Rectangle -> IO ()) -> IO (ConnectId w) -afterExposeRect :: WidgetClass w => w -> (Rectangle -> IO ()) -> IO (ConnectId w) -onFocusIn :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterFocusIn :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onFocusOut :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterFocusOut :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onGrabFocus :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterGrabFocus :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onDestroy :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterDestroy :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onHide :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterHide :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onHierarchyChanged :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterHierarchyChanged :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onKeyPress :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterKeyPress :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onKeyRelease :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterKeyRelease :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onMnemonicActivate :: WidgetClass w => w -> (Bool -> IO Bool) -> IO (ConnectId w) -afterMnemonicActivate :: WidgetClass w => w -> (Bool -> IO Bool) -> IO (ConnectId w) -onMotionNotify :: WidgetClass w => w -> Bool -> (Event -> IO Bool) -> IO (ConnectId w) -afterMotionNotify :: WidgetClass w => w -> Bool -> (Event -> IO Bool) -> IO (ConnectId w) -onParentSet :: (WidgetClass w, WidgetClass old) => w -> (old -> IO ()) -> IO (ConnectId w) -afterParentSet :: (WidgetClass w, WidgetClass old) => w -> (old -> IO ()) -> IO (ConnectId w) -onPopupMenu :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterPopupMenu :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onProximityIn :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterProximityIn :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onProximityOut :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterProximityOut :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onRealize :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterRealize :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onScroll :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterScroll :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onShow :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterShow :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onSizeAllocate :: WidgetClass w => w -> (Allocation -> IO ()) -> IO (ConnectId w) -afterSizeAllocate :: WidgetClass w => w -> (Allocation -> IO ()) -> IO (ConnectId w) -onSizeRequest :: WidgetClass w => w -> IO Requisition -> IO (ConnectId w) -afterSizeRequest :: WidgetClass w => w -> IO Requisition -> IO (ConnectId w) -data StateType -StateNormal :: StateType -StateActive :: StateType -StatePrelight :: StateType -StateSelected :: StateType -StateInsensitive :: StateType -instance Enum StateType -instance Eq StateType -onStateChanged :: WidgetClass w => w -> (StateType -> IO ()) -> IO (ConnectId w) -afterStateChanged :: WidgetClass w => w -> (StateType -> IO ()) -> IO (ConnectId w) -onUnmap :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterUnmap :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onUnrealize :: WidgetClass w => w -> IO () -> IO (ConnectId w) -afterUnrealize :: WidgetClass w => w -> IO () -> IO (ConnectId w) -onVisibilityNotify :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterVisibilityNotify :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -onWindowState :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) -afterWindowState :: WidgetClass w => w -> (Event -> IO Bool) -> IO (ConnectId w) - -module Graphics.UI.Gtk.Gdk.Drawable -data Drawable -instance DrawableClass Drawable -instance GObjectClass Drawable -class GObjectClass o => DrawableClass o -instance DrawableClass DrawWindow -instance DrawableClass Drawable -instance DrawableClass Pixmap -castToDrawable :: GObjectClass obj => obj -> Drawable -toDrawable :: DrawableClass o => o -> Drawable -drawableGetDepth :: DrawableClass d => d -> IO Int -drawableGetSize :: DrawableClass d => d -> IO (Int, Int) -drawableGetClipRegion :: DrawableClass d => d -> IO Region -drawableGetVisibleRegion :: DrawableClass d => d -> IO Region -type Point = (Int, Int) -drawPoint :: DrawableClass d => d -> GC -> Point -> IO () -drawPoints :: DrawableClass d => d -> GC -> [Point] -> IO () -drawLine :: DrawableClass d => d -> GC -> Point -> Point -> IO () -drawLines :: DrawableClass d => d -> GC -> [Point] -> IO () -data Dither -RgbDitherNone :: Dither -RgbDitherNormal :: Dither -RgbDitherMax :: Dither -instance Enum Dither -drawPixbuf :: DrawableClass d => d -> GC -> Pixbuf -> Int -> Int -> Int -> Int -> Int -> Int -> Dither -> Int -> Int -> IO () -drawSegments :: DrawableClass d => d -> GC -> [(Point, Point)] -> IO () -drawRectangle :: DrawableClass d => d -> GC -> Bool -> Int -> Int -> Int -> Int -> IO () -drawArc :: DrawableClass d => d -> GC -> Bool -> Int -> Int -> Int -> Int -> Int -> Int -> IO () -drawPolygon :: DrawableClass d => d -> GC -> Bool -> [Point] -> IO () -drawGlyphs :: DrawableClass d => d -> GC -> Int -> Int -> GlyphItem -> IO () -drawLayoutLine :: DrawableClass d => d -> GC -> Int -> Int -> LayoutLine -> IO () -drawLayoutLineWithColors :: DrawableClass d => d -> GC -> Int -> Int -> LayoutLine -> Maybe Color -> Maybe Color -> IO () -drawLayout :: DrawableClass d => d -> GC -> Int -> Int -> PangoLayout -> IO () -drawLayoutWithColors :: DrawableClass d => d -> GC -> Int -> Int -> PangoLayout -> Maybe Color -> Maybe Color -> IO () -drawDrawable :: (DrawableClass src, DrawableClass dest) => dest -> GC -> src -> Int -> Int -> Int -> Int -> Int -> Int -> IO () - -module Graphics.UI.Gtk.Gdk.Pixmap -data Pixmap -instance DrawableClass Pixmap -instance GObjectClass Pixmap -instance PixmapClass Pixmap -class DrawableClass o => PixmapClass o -instance PixmapClass Pixmap -pixmapNew :: DrawableClass drawable => Maybe drawable -> Int -> Int -> Maybe Int -> IO Pixmap - -module Graphics.UI.Gtk.Pango.Font -data PangoUnit -instance Enum PangoUnit -instance Eq PangoUnit -instance Fractional PangoUnit -instance Integral PangoUnit -instance Num PangoUnit -instance Ord PangoUnit -instance Real PangoUnit -instance Show PangoUnit -data FontDescription -fontDescriptionNew :: IO FontDescription -fontDescriptionCopy :: FontDescription -> IO FontDescription -fontDescriptionSetFamily :: FontDescription -> String -> IO () -fontDescriptionGetFamily :: FontDescription -> IO (Maybe String) -fontDescriptionSetStyle :: FontDescription -> FontStyle -> IO () -fontDescriptionGetStyle :: FontDescription -> IO (Maybe FontStyle) -fontDescriptionSetVariant :: FontDescription -> Variant -> IO () -fontDescriptionGetVariant :: FontDescription -> IO (Maybe Variant) -fontDescriptionSetWeight :: FontDescription -> Weight -> IO () -fontDescriptionGetWeight :: FontDescription -> IO (Maybe Weight) -fontDescriptionSetStretch :: FontDescription -> Stretch -> IO () -fontDescriptionGetStretch :: FontDescription -> IO (Maybe Stretch) -fontDescriptionSetSize :: FontDescription -> PangoUnit -> IO () -fontDescriptionGetSize :: FontDescription -> IO (Maybe PangoUnit) -data FontMask -PangoFontMaskFamily :: FontMask -PangoFontMaskStyle :: FontMask -PangoFontMaskVariant :: FontMask -PangoFontMaskWeight :: FontMask -PangoFontMaskStretch :: FontMask -PangoFontMaskSize :: FontMask -instance Bounded FontMask -instance Enum FontMask -instance Flags FontMask -fontDescriptionUnsetFields :: FontDescription -> [FontMask] -> IO () -fontDescriptionMerge :: FontDescription -> FontDescription -> Bool -> IO () -fontDescriptionBetterMatch :: FontDescription -> FontDescription -> FontDescription -> Bool -fontDescriptionFromString :: String -> IO FontDescription -fontDescriptionToString :: FontDescription -> IO String -data FontMap -instance FontMapClass FontMap -instance GObjectClass FontMap -pangoFontMapListFamilies :: FontMap -> IO [FontFamily] -data FontFamily -instance FontFamilyClass FontFamily -instance GObjectClass FontFamily -instance Show FontFamily -pangoFontFamilyIsMonospace :: FontFamily -> Bool -pangoFontFamilyListFaces :: FontFamily -> IO [FontFace] -data FontFace -instance FontFaceClass FontFace -instance GObjectClass FontFace -instance Show FontFace -pangoFontFaceListSizes :: FontFace -> IO (Maybe [PangoUnit]) -pangoFontFaceDescribe :: FontFace -> IO FontDescription -data FontMetrics -FontMetrics :: PangoUnit -> PangoUnit -> PangoUnit -> PangoUnit -> PangoUnit -> PangoUnit -> PangoUnit -> PangoUnit -> FontMetrics -ascent :: FontMetrics -> PangoUnit -descent :: FontMetrics -> PangoUnit -approximateCharWidth :: FontMetrics -> PangoUnit -approximateDigitWidth :: FontMetrics -> PangoUnit -underlineThickness :: FontMetrics -> PangoUnit -underlinePosition :: FontMetrics -> PangoUnit -strikethroughThickenss :: FontMetrics -> PangoUnit -strikethroughPosition :: FontMetrics -> PangoUnit -instance Show FontMetrics - -module Graphics.UI.Gtk.Pango.Context -data PangoContext -instance GObjectClass PangoContext -instance PangoContextClass PangoContext -data PangoDirection -PangoDirectionLtr :: PangoDirection -PangoDirectionRtl :: PangoDirection -PangoDirectionWeakLtr :: PangoDirection -PangoDirectionWeakRtl :: PangoDirection -PangoDirectionNeutral :: PangoDirection -instance Enum PangoDirection -instance Eq PangoDirection -instance Ord PangoDirection -contextListFamilies :: PangoContext -> IO [FontFamily] -contextGetMetrics :: PangoContext -> FontDescription -> Language -> IO FontMetrics -contextSetFontDescription :: PangoContext -> FontDescription -> IO () -contextGetFontDescription :: PangoContext -> IO FontDescription -data Language -instance Eq Language -instance Show Language -languageFromString :: String -> IO Language -contextSetLanguage :: PangoContext -> Language -> IO () -contextGetLanguage :: PangoContext -> IO Language -contextSetTextDir :: PangoContext -> PangoDirection -> IO () -contextGetTextDir :: PangoContext -> IO PangoDirection - -module Graphics.UI.Gtk.Pango.Markup -type Markup = String -data SpanAttribute -FontDescr :: String -> SpanAttribute -FontFamily :: String -> SpanAttribute -FontSize :: Size -> SpanAttribute -FontStyle :: FontStyle -> SpanAttribute -FontWeight :: Weight -> SpanAttribute -FontVariant :: Variant -> SpanAttribute -FontStretch :: Stretch -> SpanAttribute -FontForeground :: String -> SpanAttribute -FontBackground :: String -> SpanAttribute -FontUnderline :: Underline -> SpanAttribute -FontRise :: Double -> SpanAttribute -FontLang :: Language -> SpanAttribute -instance Show SpanAttribute -markSpan :: [SpanAttribute] -> String -> String -data Size -SizePoint :: Double -> Size -SizeUnreadable :: Size -SizeTiny :: Size -SizeSmall :: Size -SizeMedium :: Size -SizeLarge :: Size -SizeHuge :: Size -SizeGiant :: Size -SizeSmaller :: Size -SizeLarger :: Size -instance Show Size - -module Graphics.UI.Gtk.Display.Label -data Label -instance GObjectClass Label -instance LabelClass Label -instance MiscClass Label -instance ObjectClass Label -instance WidgetClass Label -class MiscClass o => LabelClass o -instance LabelClass AccelLabel -instance LabelClass Label -instance LabelClass TipsQuery -castToLabel :: GObjectClass obj => obj -> Label -toLabel :: LabelClass o => o -> Label -labelNew :: Maybe String -> IO Label -labelNewWithMnemonic :: String -> IO Label -labelSetText :: LabelClass self => self -> String -> IO () -labelSetLabel :: LabelClass self => self -> String -> IO () -labelSetTextWithMnemonic :: LabelClass self => self -> String -> IO () -labelSetMarkup :: LabelClass self => self -> Markup -> IO () -labelSetMarkupWithMnemonic :: LabelClass self => self -> Markup -> IO () -labelSetMnemonicWidget :: (LabelClass self, WidgetClass widget) => self -> widget -> IO () -labelGetMnemonicWidget :: LabelClass self => self -> IO (Maybe Widget) -type KeyVal = Word32 -labelGetMnemonicKeyval :: LabelClass self => self -> IO KeyVal -labelSetUseMarkup :: LabelClass self => self -> Bool -> IO () -labelGetUseMarkup :: LabelClass self => self -> IO Bool -labelSetUseUnderline :: LabelClass self => self -> Bool -> IO () -labelGetUseUnderline :: LabelClass self => self -> IO Bool -labelGetText :: LabelClass self => self -> IO String -labelGetLabel :: LabelClass self => self -> IO String -labelSetPattern :: LabelClass l => l -> [Int] -> IO () -data Justification -JustifyLeft :: Justification -JustifyRight :: Justification -JustifyCenter :: Justification -JustifyFill :: Justification -instance Enum Justification -instance Eq Justification -labelSetJustify :: LabelClass self => self -> Justification -> IO () -labelGetJustify :: LabelClass self => self -> IO Justification -labelGetLayout :: LabelClass self => self -> IO PangoLayout -labelSetLineWrap :: LabelClass self => self -> Bool -> IO () -labelGetLineWrap :: LabelClass self => self -> IO Bool -labelSetSelectable :: LabelClass self => self -> Bool -> IO () -labelGetSelectable :: LabelClass self => self -> IO Bool -labelSelectRegion :: LabelClass self => self -> Int -> Int -> IO () -labelGetSelectionBounds :: LabelClass self => self -> IO (Maybe (Int, Int)) -labelGetLayoutOffsets :: LabelClass self => self -> IO (Int, Int) -labelSetEllipsize :: LabelClass self => self -> EllipsizeMode -> IO () -labelGetEllipsize :: LabelClass self => self -> IO EllipsizeMode -labelSetWidthChars :: LabelClass self => self -> Int -> IO () -labelGetWidthChars :: LabelClass self => self -> IO Int -labelSetMaxWidthChars :: LabelClass self => self -> Int -> IO () -labelGetMaxWidthChars :: LabelClass self => self -> IO Int -labelSetSingleLineMode :: LabelClass self => self -> Bool -> IO () -labelGetSingleLineMode :: LabelClass self => self -> IO Bool -labelSetAngle :: LabelClass self => self -> Double -> IO () -labelGetAngle :: LabelClass self => self -> IO Double -labelLabel :: LabelClass self => Attr self String -labelUseMarkup :: LabelClass self => Attr self Bool -labelUseUnderline :: LabelClass self => Attr self Bool -labelJustify :: LabelClass self => Attr self Justification -labelWrap :: LabelClass self => Attr self Bool -labelSelectable :: LabelClass self => Attr self Bool -labelMnemonicWidget :: (LabelClass self, WidgetClass widget) => ReadWriteAttr self (Maybe Widget) widget -labelCursorPosition :: LabelClass self => ReadAttr self Int -labelSelectionBound :: LabelClass self => ReadAttr self Int -labelEllipsize :: LabelClass self => Attr self EllipsizeMode -labelWidthChars :: LabelClass self => Attr self Int -labelSingleLineMode :: LabelClass self => Attr self Bool -labelAngle :: LabelClass self => Attr self Double -labelMaxWidthChars :: LabelClass self => Attr self Int -labelLineWrap :: LabelClass self => Attr self Bool -labelText :: LabelClass self => Attr self String - -module Graphics.UI.Gtk.Pango.Rendering -data PangoAttribute -AttrLanguage :: Int -> Int -> Language -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paLang :: PangoAttribute -> Language -AttrFamily :: Int -> Int -> String -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paFamily :: PangoAttribute -> String -AttrStyle :: Int -> Int -> FontStyle -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paStyle :: PangoAttribute -> FontStyle -AttrWeight :: Int -> Int -> Weight -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paWeight :: PangoAttribute -> Weight -AttrVariant :: Int -> Int -> Variant -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paVariant :: PangoAttribute -> Variant -AttrStretch :: Int -> Int -> Stretch -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paStretch :: PangoAttribute -> Stretch -AttrSize :: Int -> Int -> PangoUnit -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paSize :: PangoAttribute -> PangoUnit -AttrAbsSize :: Int -> Int -> PangoUnit -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paSize :: PangoAttribute -> PangoUnit -AttrFontDescription :: Int -> Int -> FontDescription -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paFontDescription :: PangoAttribute -> FontDescription -AttrForeground :: Int -> Int -> Color -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paColor :: PangoAttribute -> Color -AttrBackground :: Int -> Int -> Color -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paColor :: PangoAttribute -> Color -AttrUnderline :: Int -> Int -> Underline -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paUnderline :: PangoAttribute -> Underline -AttrUnderlineColor :: Int -> Int -> Color -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paColor :: PangoAttribute -> Color -AttrStrikethrough :: Int -> Int -> Bool -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paStrikethrough :: PangoAttribute -> Bool -AttrStrikethroughColor :: Int -> Int -> Color -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paColor :: PangoAttribute -> Color -AttrRise :: Int -> Int -> PangoUnit -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paRise :: PangoAttribute -> PangoUnit -AttrShape :: Int -> Int -> PangoRectangle -> PangoRectangle -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paInk :: PangoAttribute -> PangoRectangle -paLogical :: PangoAttribute -> PangoRectangle -AttrScale :: Int -> Int -> Double -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paScale :: PangoAttribute -> Double -AttrFallback :: Int -> Int -> Bool -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paFallback :: PangoAttribute -> Bool -AttrLetterSpacing :: Int -> Int -> PangoUnit -> PangoAttribute -paStart :: PangoAttribute -> Int -paEnd :: PangoAttribute -> Int -paLetterSpacing :: PangoAttribute -> PangoUnit -data PangoItem -pangoItemize :: PangoContext -> String -> [PangoAttribute] -> IO [PangoItem] -pangoItemGetFontMetrics :: PangoItem -> IO FontMetrics -data GlyphItem -pangoShape :: PangoItem -> IO GlyphItem -glyphItemExtents :: GlyphItem -> IO (PangoRectangle, PangoRectangle) -glyphItemExtentsRange :: GlyphItem -> Int -> Int -> IO (PangoRectangle, PangoRectangle) -glyphItemIndexToX :: GlyphItem -> Int -> Bool -> IO PangoUnit -glyphItemXToIndex :: GlyphItem -> PangoUnit -> IO (Int, Bool) -glyphItemGetLogicalWidths :: GlyphItem -> Maybe Bool -> IO [PangoUnit] -glyphItemSplit :: GlyphItem -> Int -> IO (GlyphItem, GlyphItem) - -module Graphics.UI.Gtk.Pango.Layout -data PangoRectangle -PangoRectangle :: PangoUnit -> PangoUnit -> PangoUnit -> PangoUnit -> PangoRectangle -data PangoLayout -layoutEmpty :: PangoContext -> IO PangoLayout -layoutText :: PangoContext -> String -> IO PangoLayout -layoutCopy :: PangoLayout -> IO PangoLayout -layoutGetContext :: PangoLayout -> IO PangoContext -layoutContextChanged :: PangoLayout -> IO () -layoutSetText :: PangoLayout -> String -> IO () -layoutGetText :: PangoLayout -> IO String -layoutSetMarkup :: PangoLayout -> Markup -> IO String -escapeMarkup :: String -> String -layoutSetMarkupWithAccel :: PangoLayout -> Markup -> IO (Char, String) -layoutSetAttributes :: PangoLayout -> [PangoAttribute] -> IO () -layoutSetFontDescription :: PangoLayout -> Maybe FontDescription -> IO () -layoutGetFontDescription :: PangoLayout -> IO (Maybe FontDescription) -layoutSetWidth :: PangoLayout -> Maybe PangoUnit -> IO () -layoutGetWidth :: PangoLayout -> IO (Maybe PangoUnit) -data LayoutWrapMode -WrapWholeWords :: LayoutWrapMode -WrapAnywhere :: LayoutWrapMode -WrapPartialWords :: LayoutWrapMode -instance Enum LayoutWrapMode -layoutSetWrap :: PangoLayout -> LayoutWrapMode -> IO () -layoutGetWrap :: PangoLayout -> IO LayoutWrapMode -data EllipsizeMode -EllipsizeNone :: EllipsizeMode -EllipsizeStart :: EllipsizeMode -EllipsizeMiddle :: EllipsizeMode -EllipsizeEnd :: EllipsizeMode -instance Enum EllipsizeMode -instance Eq EllipsizeMode -layoutSetEllipsize :: PangoLayout -> EllipsizeMode -> IO () -layoutGetEllipsize :: PangoLayout -> IO EllipsizeMode -layoutSetIndent :: PangoLayout -> PangoUnit -> IO () -layoutGetIndent :: PangoLayout -> IO PangoUnit -layoutSetSpacing :: PangoLayout -> PangoUnit -> IO () -layoutGetSpacing :: PangoLayout -> IO PangoUnit -layoutSetJustify :: PangoLayout -> Bool -> IO () -layoutGetJustify :: PangoLayout -> IO Bool -layoutSetAutoDir :: PangoLayout -> Bool -> IO () -layoutGetAutoDir :: PangoLayout -> IO Bool -data LayoutAlignment -AlignLeft :: LayoutAlignment -AlignCenter :: LayoutAlignment -AlignRight :: LayoutAlignment -instance Enum LayoutAlignment -layoutSetAlignment :: PangoLayout -> LayoutAlignment -> IO () -layoutGetAlignment :: PangoLayout -> IO LayoutAlignment -data TabAlign -instance Enum TabAlign -type TabPosition = (PangoUnit, TabAlign) -layoutSetTabs :: PangoLayout -> [TabPosition] -> IO () -layoutResetTabs :: PangoLayout -> IO () -layoutGetTabs :: PangoLayout -> IO (Maybe [TabPosition]) -layoutSetSingleParagraphMode :: PangoLayout -> Bool -> IO () -layoutGetSingleParagraphMode :: PangoLayout -> IO Bool -layoutXYToIndex :: PangoLayout -> PangoUnit -> PangoUnit -> IO (Bool, Int, Int) -layoutIndexToPos :: PangoLayout -> Int -> IO PangoRectangle -layoutGetCursorPos :: PangoLayout -> Int -> IO (PangoRectangle, PangoRectangle) -data CursorPos -CursorPosPrevPara :: CursorPos -CursorPos :: Int -> Int -> CursorPos -CursorPosNextPara :: CursorPos -layoutMoveCursorVisually :: PangoLayout -> Bool -> Int -> Bool -> IO CursorPos -layoutGetExtents :: PangoLayout -> IO (PangoRectangle, PangoRectangle) -layoutGetPixelExtents :: PangoLayout -> IO (Rectangle, Rectangle) -layoutGetLineCount :: PangoLayout -> IO Int -layoutGetLine :: PangoLayout -> Int -> IO LayoutLine -layoutGetLines :: PangoLayout -> IO [LayoutLine] -data LayoutIter -layoutGetIter :: PangoLayout -> IO LayoutIter -layoutIterNextItem :: LayoutIter -> IO Bool -layoutIterNextChar :: LayoutIter -> IO Bool -layoutIterNextCluster :: LayoutIter -> IO Bool -layoutIterNextLine :: LayoutIter -> IO Bool -layoutIterAtLastLine :: LayoutIter -> IO Bool -layoutIterGetIndex :: LayoutIter -> IO Int -layoutIterGetBaseline :: LayoutIter -> IO PangoUnit -layoutIterGetItem :: LayoutIter -> IO (Maybe GlyphItem) -layoutIterGetLine :: LayoutIter -> IO (Maybe LayoutLine) -layoutIterGetCharExtents :: LayoutIter -> IO PangoRectangle -layoutIterGetClusterExtents :: LayoutIter -> IO (PangoRectangle, PangoRectangle) -layoutIterGetRunExtents :: LayoutIter -> IO (PangoRectangle, PangoRectangle) -layoutIterGetLineYRange :: LayoutIter -> IO (PangoUnit, PangoUnit) -layoutIterGetLineExtents :: LayoutIter -> IO (PangoRectangle, PangoRectangle) -data LayoutLine -layoutLineGetExtents :: LayoutLine -> IO (PangoRectangle, PangoRectangle) -layoutLineGetPixelExtents :: LayoutLine -> IO (Rectangle, Rectangle) -layoutLineIndexToX :: LayoutLine -> Int -> Bool -> IO PangoUnit -layoutLineXToIndex :: LayoutLine -> PangoUnit -> IO (Bool, Int, Int) -layoutLineGetXRanges :: LayoutLine -> Int -> Int -> IO [(PangoUnit, PangoUnit)] - -module Graphics.UI.Gtk.SourceView.SourceTagStyle -data SourceTagStyle -SourceTagStyle :: Bool -> Maybe Color -> Maybe Color -> Bool -> Bool -> Bool -> Bool -> SourceTagStyle -isDefault :: SourceTagStyle -> Bool -foreground :: SourceTagStyle -> Maybe Color -background :: SourceTagStyle -> Maybe Color -italic :: SourceTagStyle -> Bool -bold :: SourceTagStyle -> Bool -underline :: SourceTagStyle -> Bool -strikethrough :: SourceTagStyle -> Bool -instance Storable SourceTagStyle - -module Graphics.UI.Gtk.SourceView.SourceStyleScheme -data SourceStyleScheme -instance GObjectClass SourceStyleScheme -instance SourceStyleSchemeClass SourceStyleScheme -castToSourceStyleScheme :: GObjectClass obj => obj -> SourceStyleScheme -sourceStyleSchemeGetTagStyle :: SourceStyleScheme -> String -> IO SourceTagStyle -sourceStyleSchemeGetName :: SourceStyleScheme -> IO String -sourceStyleSchemeGetDefault :: IO SourceStyleScheme - -module Graphics.UI.Gtk.SourceView.SourceTag -data SourceTag -instance GObjectClass SourceTag -instance SourceTagClass SourceTag -instance TextTagClass SourceTag -castToSourceTag :: GObjectClass obj => obj -> SourceTag -syntaxTagNew :: String -> String -> String -> String -> IO SourceTag -patternTagNew :: String -> String -> String -> IO SourceTag -keywordListTagNew :: String -> String -> [String] -> Bool -> Bool -> Bool -> String -> String -> IO SourceTag -blockCommentTagNew :: String -> String -> String -> String -> IO SourceTag -lineCommentTagNew :: String -> String -> String -> IO SourceTag -stringTagNew :: String -> String -> String -> String -> Bool -> IO SourceTag -sourceTagGetStyle :: SourceTag -> IO SourceTagStyle -sourceTagSetStyle :: SourceTag -> SourceTagStyle -> IO () - -module Graphics.UI.Gtk.SourceView.SourceTagTable -data SourceTagTable -instance GObjectClass SourceTagTable -instance SourceTagTableClass SourceTagTable -instance TextTagTableClass SourceTagTable -class TextTagTableClass o => SourceTagTableClass o -instance SourceTagTableClass SourceTagTable -castToSourceTagTable :: GObjectClass obj => obj -> SourceTagTable -sourceTagTableNew :: IO SourceTagTable -sourceTagTableAddTags :: SourceTagTable -> [SourceTag] -> IO () -sourceTagTableRemoveSourceTags :: SourceTagTable -> IO () - -module Graphics.UI.Gtk.TreeList.TreeIter -newtype TreeIter -TreeIter :: ForeignPtr TreeIter -> TreeIter -createTreeIter :: Ptr TreeIter -> IO TreeIter -mallocTreeIter :: IO TreeIter -receiveTreeIter :: (TreeIter -> IO Bool) -> IO (Maybe TreeIter) - -module Graphics.UI.Gtk.Entry.EntryCompletion -data EntryCompletion -instance EntryCompletionClass EntryCompletion -instance GObjectClass EntryCompletion -class GObjectClass o => EntryCompletionClass o -instance EntryCompletionClass EntryCompletion -castToEntryCompletion :: GObjectClass obj => obj -> EntryCompletion -toEntryCompletion :: EntryCompletionClass o => o -> EntryCompletion -entryCompletionNew :: IO EntryCompletion -entryCompletionGetEntry :: EntryCompletion -> IO (Maybe Entry) -entryCompletionSetModel :: TreeModelClass model => EntryCompletion -> Maybe model -> IO () -entryCompletionGetModel :: EntryCompletion -> IO (Maybe TreeModel) -entryCompletionSetMatchFunc :: EntryCompletion -> (String -> TreeIter -> IO ()) -> IO () -entryCompletionSetMinimumKeyLength :: EntryCompletion -> Int -> IO () -entryCompletionGetMinimumKeyLength :: EntryCompletion -> IO Int -entryCompletionComplete :: EntryCompletion -> IO () -entryCompletionInsertActionText :: EntryCompletion -> Int -> String -> IO () -entryCompletionInsertActionMarkup :: EntryCompletion -> Int -> String -> IO () -entryCompletionDeleteAction :: EntryCompletion -> Int -> IO () -entryCompletionSetTextColumn :: EntryCompletion -> Int -> IO () -entryCompletionInsertPrefix :: EntryCompletion -> IO () -entryCompletionGetTextColumn :: EntryCompletion -> IO Int -entryCompletionSetInlineCompletion :: EntryCompletion -> Bool -> IO () -entryCompletionGetInlineCompletion :: EntryCompletion -> IO Bool -entryCompletionSetPopupCompletion :: EntryCompletion -> Bool -> IO () -entryCompletionGetPopupCompletion :: EntryCompletion -> IO Bool -entryCompletionSetPopupSetWidth :: EntryCompletion -> Bool -> IO () -entryCompletionGetPopupSetWidth :: EntryCompletion -> IO Bool -entryCompletionSetPopupSingleMatch :: EntryCompletion -> Bool -> IO () -entryCompletionGetPopupSingleMatch :: EntryCompletion -> IO Bool -entryCompletionModel :: TreeModelClass model => ReadWriteAttr EntryCompletion (Maybe TreeModel) (Maybe model) -entryCompletionMinimumKeyLength :: Attr EntryCompletion Int -entryCompletionTextColumn :: Attr EntryCompletion Int -entryCompletionInlineCompletion :: Attr EntryCompletion Bool -entryCompletionPopupCompletion :: Attr EntryCompletion Bool -entryCompletionPopupSetWidth :: Attr EntryCompletion Bool -entryCompletionPopupSingleMatch :: Attr EntryCompletion Bool -onInsertPrefix :: EntryCompletionClass self => self -> (String -> IO Bool) -> IO (ConnectId self) -afterInsertPrefix :: EntryCompletionClass self => self -> (String -> IO Bool) -> IO (ConnectId self) -onActionActivated :: EntryCompletionClass self => self -> (Int -> IO ()) -> IO (ConnectId self) -afterActionActivated :: EntryCompletionClass self => self -> (Int -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.TreeList.TreeModel -data TreeModel -instance GObjectClass TreeModel -instance TreeModelClass TreeModel -class GObjectClass o => TreeModelClass o -instance TreeModelClass ListStore -instance TreeModelClass TreeModel -instance TreeModelClass TreeModelSort -instance TreeModelClass TreeStore -castToTreeModel :: GObjectClass obj => obj -> TreeModel -toTreeModel :: TreeModelClass o => o -> TreeModel -data TreeModelFlags -TreeModelItersPersist :: TreeModelFlags -TreeModelListOnly :: TreeModelFlags -instance Bounded TreeModelFlags -instance Enum TreeModelFlags -instance Flags TreeModelFlags -type TreePath = [Int] -data TreeRowReference -data TreeIter -treeModelGetFlags :: TreeModelClass self => self -> IO [TreeModelFlags] -treeModelGetNColumns :: TreeModelClass self => self -> IO Int -treeModelGetColumnType :: TreeModelClass self => self -> Int -> IO TMType -treeModelGetValue :: TreeModelClass self => self -> TreeIter -> Int -> IO GenericValue -treeRowReferenceNew :: TreeModelClass self => self -> NativeTreePath -> IO TreeRowReference -treeRowReferenceGetPath :: TreeRowReference -> IO TreePath -treeRowReferenceValid :: TreeRowReference -> IO Bool -treeModelGetIter :: TreeModelClass self => self -> TreePath -> IO (Maybe TreeIter) -treeModelGetIterFromString :: TreeModelClass self => self -> String -> IO (Maybe TreeIter) -gtk_tree_model_get_iter_from_string :: Ptr TreeModel -> Ptr TreeIter -> Ptr CChar -> IO CInt -treeModelGetIterFirst :: TreeModelClass self => self -> IO (Maybe TreeIter) -treeModelGetPath :: TreeModelClass self => self -> TreeIter -> IO TreePath -treeModelIterNext :: TreeModelClass self => self -> TreeIter -> IO Bool -treeModelIterChildren :: TreeModelClass self => self -> TreeIter -> IO (Maybe TreeIter) -treeModelIterHasChild :: TreeModelClass self => self -> TreeIter -> IO Bool -treeModelIterNChildren :: TreeModelClass self => self -> Maybe TreeIter -> IO Int -treeModelIterNthChild :: TreeModelClass self => self -> Maybe TreeIter -> Int -> IO (Maybe TreeIter) -treeModelIterParent :: TreeModelClass self => self -> TreeIter -> IO (Maybe TreeIter) - -module Graphics.UI.Gtk.TreeList.ListStore -data ListStore -instance GObjectClass ListStore -instance ListStoreClass ListStore -instance TreeModelClass ListStore -class TreeModelClass o => ListStoreClass o -instance ListStoreClass ListStore -castToListStore :: GObjectClass obj => obj -> ListStore -toListStore :: ListStoreClass o => o -> ListStore -data TMType -TMinvalid :: TMType -TMuint :: TMType -TMint :: TMType -TMboolean :: TMType -TMenum :: TMType -TMflags :: TMType -TMfloat :: TMType -TMdouble :: TMType -TMstring :: TMType -TMobject :: TMType -instance Enum TMType -data GenericValue -GVuint :: Word -> GenericValue -GVint :: Int -> GenericValue -GVboolean :: Bool -> GenericValue -GVenum :: Int -> GenericValue -GVflags :: Int -> GenericValue -GVfloat :: Float -> GenericValue -GVdouble :: Double -> GenericValue -GVstring :: Maybe String -> GenericValue -GVobject :: GObject -> GenericValue -listStoreNew :: [TMType] -> IO ListStore -listStoreSetValue :: ListStoreClass self => self -> TreeIter -> Int -> GenericValue -> IO () -listStoreRemove :: ListStoreClass self => self -> TreeIter -> IO Bool -listStoreInsert :: ListStoreClass self => self -> Int -> IO TreeIter -listStoreInsertBefore :: ListStoreClass self => self -> TreeIter -> IO TreeIter -listStoreInsertAfter :: ListStoreClass self => self -> TreeIter -> IO TreeIter -listStorePrepend :: ListStoreClass self => self -> IO TreeIter -listStoreAppend :: ListStoreClass self => self -> IO TreeIter -listStoreClear :: ListStoreClass self => self -> IO () -listStoreReorder :: ListStoreClass self => self -> [Int] -> IO () -listStoreSwap :: ListStoreClass self => self -> TreeIter -> TreeIter -> IO () -listStoreMoveBefore :: ListStoreClass self => self -> TreeIter -> Maybe TreeIter -> IO () -listStoreMoveAfter :: ListStoreClass self => self -> TreeIter -> Maybe TreeIter -> IO () - -module Graphics.UI.Gtk.TreeList.TreeStore -data TreeStore -instance GObjectClass TreeStore -instance TreeModelClass TreeStore -instance TreeStoreClass TreeStore -class TreeModelClass o => TreeStoreClass o -instance TreeStoreClass TreeStore -castToTreeStore :: GObjectClass obj => obj -> TreeStore -toTreeStore :: TreeStoreClass o => o -> TreeStore -data TMType -TMinvalid :: TMType -TMuint :: TMType -TMint :: TMType -TMboolean :: TMType -TMenum :: TMType -TMflags :: TMType -TMfloat :: TMType -TMdouble :: TMType -TMstring :: TMType -TMobject :: TMType -instance Enum TMType -data GenericValue -GVuint :: Word -> GenericValue -GVint :: Int -> GenericValue -GVboolean :: Bool -> GenericValue -GVenum :: Int -> GenericValue -GVflags :: Int -> GenericValue -GVfloat :: Float -> GenericValue -GVdouble :: Double -> GenericValue -GVstring :: Maybe String -> GenericValue -GVobject :: GObject -> GenericValue -treeStoreNew :: [TMType] -> IO TreeStore -treeStoreSetValue :: TreeStoreClass self => self -> TreeIter -> Int -> GenericValue -> IO () -treeStoreRemove :: TreeStoreClass self => self -> TreeIter -> IO Bool -treeStoreInsert :: TreeStoreClass self => self -> Maybe TreeIter -> Int -> IO TreeIter -treeStoreInsertBefore :: TreeStoreClass self => self -> TreeIter -> IO TreeIter -treeStoreInsertAfter :: TreeStoreClass self => self -> TreeIter -> IO TreeIter -treeStorePrepend :: TreeStoreClass self => self -> Maybe TreeIter -> IO TreeIter -treeStoreAppend :: TreeStoreClass self => self -> Maybe TreeIter -> IO TreeIter -treeStoreIsAncestor :: TreeStoreClass self => self -> TreeIter -> TreeIter -> IO Bool -treeStoreIterDepth :: TreeStoreClass self => self -> TreeIter -> IO Int -treeStoreClear :: TreeStoreClass self => self -> IO () - -module Graphics.UI.Gtk.TreeList.TreeModelSort -data TreeModelSort -instance GObjectClass TreeModelSort -instance TreeModelClass TreeModelSort -instance TreeModelSortClass TreeModelSort -class GObjectClass o => TreeModelSortClass o -instance TreeModelSortClass TreeModelSort -castToTreeModelSort :: GObjectClass obj => obj -> TreeModelSort -toTreeModelSort :: TreeModelSortClass o => o -> TreeModelSort -treeModelSortNewWithModel :: TreeModelClass childModel => childModel -> IO TreeModelSort -treeModelSortGetModel :: TreeModelSortClass self => self -> IO TreeModel -treeModelSortConvertChildPathToPath :: TreeModelSortClass self => self -> TreePath -> IO TreePath -treeModelSortConvertPathToChildPath :: TreeModelSortClass self => self -> TreePath -> IO TreePath -treeModelSortConvertChildIterToIter :: TreeModelSortClass self => self -> TreeIter -> IO TreeIter -treeModelSortConvertIterToChildIter :: TreeModelSortClass self => self -> TreeIter -> IO TreeIter -treeModelSortResetDefaultSortFunc :: TreeModelSortClass self => self -> IO () -treeModelSortClearCache :: TreeModelSortClass self => self -> IO () -treeModelSortIterIsValid :: TreeModelSortClass self => self -> TreeIter -> IO Bool - -module Graphics.UI.Gtk.Glade -class GObjectClass o => GladeXMLClass o -instance GladeXMLClass GladeXML -data GladeXML -instance GObjectClass GladeXML -instance GladeXMLClass GladeXML -xmlNew :: FilePath -> IO (Maybe GladeXML) -xmlNewWithRootAndDomain :: FilePath -> Maybe String -> Maybe String -> IO (Maybe GladeXML) -xmlGetWidget :: WidgetClass widget => GladeXML -> (GObject -> widget) -> String -> IO widget -xmlGetWidgetRaw :: GladeXML -> String -> IO (Maybe Widget) - -module Graphics.UI.Gtk.Layout.Alignment -data Alignment -instance AlignmentClass Alignment -instance BinClass Alignment -instance ContainerClass Alignment -instance GObjectClass Alignment -instance ObjectClass Alignment -instance WidgetClass Alignment -class BinClass o => AlignmentClass o -instance AlignmentClass Alignment -castToAlignment :: GObjectClass obj => obj -> Alignment -toAlignment :: AlignmentClass o => o -> Alignment -alignmentNew :: Float -> Float -> Float -> Float -> IO Alignment -alignmentSet :: AlignmentClass self => self -> Float -> Float -> Float -> Float -> IO () -alignmentSetPadding :: AlignmentClass self => self -> Int -> Int -> Int -> Int -> IO () -alignmentGetPadding :: AlignmentClass self => self -> IO (Int, Int, Int, Int) -alignmentXAlign :: AlignmentClass self => Attr self Float -alignmentYAlign :: AlignmentClass self => Attr self Float -alignmentXScale :: AlignmentClass self => Attr self Float -alignmentYScale :: AlignmentClass self => Attr self Float -alignmentTopPadding :: AlignmentClass self => Attr self Int -alignmentBottomPadding :: AlignmentClass self => Attr self Int -alignmentLeftPadding :: AlignmentClass self => Attr self Int -alignmentRightPadding :: AlignmentClass self => Attr self Int - -module Graphics.UI.Gtk.Layout.AspectFrame -data AspectFrame -instance AspectFrameClass AspectFrame -instance BinClass AspectFrame -instance ContainerClass AspectFrame -instance FrameClass AspectFrame -instance GObjectClass AspectFrame -instance ObjectClass AspectFrame -instance WidgetClass AspectFrame -class FrameClass o => AspectFrameClass o -instance AspectFrameClass AspectFrame -castToAspectFrame :: GObjectClass obj => obj -> AspectFrame -toAspectFrame :: AspectFrameClass o => o -> AspectFrame -aspectFrameNew :: Float -> Float -> Maybe Float -> IO AspectFrame -aspectFrameSet :: AspectFrameClass self => self -> Float -> Float -> Maybe Float -> IO () -aspectFrameXAlign :: AspectFrameClass self => Attr self Float -aspectFrameYAlign :: AspectFrameClass self => Attr self Float -aspectFrameRatio :: AspectFrameClass self => Attr self Float -aspectFrameObeyChild :: AspectFrameClass self => Attr self Bool - -module Graphics.UI.Gtk.Layout.Expander -data Expander -instance BinClass Expander -instance ContainerClass Expander -instance ExpanderClass Expander -instance GObjectClass Expander -instance ObjectClass Expander -instance WidgetClass Expander -class BinClass o => ExpanderClass o -instance ExpanderClass Expander -castToExpander :: GObjectClass obj => obj -> Expander -toExpander :: ExpanderClass o => o -> Expander -expanderNew :: String -> IO Expander -expanderNewWithMnemonic :: String -> IO Expander -expanderSetExpanded :: Expander -> Bool -> IO () -expanderGetExpanded :: Expander -> IO Bool -expanderSetSpacing :: Expander -> Int -> IO () -expanderGetSpacing :: Expander -> IO Int -expanderSetLabel :: Expander -> String -> IO () -expanderGetLabel :: Expander -> IO String -expanderSetUseUnderline :: Expander -> Bool -> IO () -expanderGetUseUnderline :: Expander -> IO Bool -expanderSetUseMarkup :: Expander -> Bool -> IO () -expanderGetUseMarkup :: Expander -> IO Bool -expanderSetLabelWidget :: WidgetClass labelWidget => Expander -> labelWidget -> IO () -expanderGetLabelWidget :: Expander -> IO Widget -expanderExpanded :: Attr Expander Bool -expanderLabel :: Attr Expander String -expanderUseUnderline :: Attr Expander Bool -expanderUseMarkup :: Attr Expander Bool -expanderSpacing :: Attr Expander Int -expanderLabelWidget :: WidgetClass labelWidget => ReadWriteAttr Expander Widget labelWidget -onActivate :: Expander -> IO () -> IO (ConnectId Expander) -afterActivate :: Expander -> IO () -> IO (ConnectId Expander) - -module Graphics.UI.Gtk.Layout.HBox -data HBox -instance BoxClass HBox -instance ContainerClass HBox -instance GObjectClass HBox -instance HBoxClass HBox -instance ObjectClass HBox -instance WidgetClass HBox -class BoxClass o => HBoxClass o -instance HBoxClass Combo -instance HBoxClass FileChooserButton -instance HBoxClass HBox -instance HBoxClass Statusbar -castToHBox :: GObjectClass obj => obj -> HBox -toHBox :: HBoxClass o => o -> HBox -hBoxNew :: Bool -> Int -> IO HBox - -module Graphics.UI.Gtk.Layout.HButtonBox -data HButtonBox -instance BoxClass HButtonBox -instance ButtonBoxClass HButtonBox -instance ContainerClass HButtonBox -instance GObjectClass HButtonBox -instance HButtonBoxClass HButtonBox -instance ObjectClass HButtonBox -instance WidgetClass HButtonBox -class ButtonBoxClass o => HButtonBoxClass o -instance HButtonBoxClass HButtonBox -castToHButtonBox :: GObjectClass obj => obj -> HButtonBox -toHButtonBox :: HButtonBoxClass o => o -> HButtonBox -hButtonBoxNew :: IO HButtonBox - -module Graphics.UI.Gtk.Layout.HPaned -data HPaned -instance ContainerClass HPaned -instance GObjectClass HPaned -instance HPanedClass HPaned -instance ObjectClass HPaned -instance PanedClass HPaned -instance WidgetClass HPaned -class PanedClass o => HPanedClass o -instance HPanedClass HPaned -castToHPaned :: GObjectClass obj => obj -> HPaned -toHPaned :: HPanedClass o => o -> HPaned -hPanedNew :: IO HPaned - -module Graphics.UI.Gtk.Layout.VBox -data VBox -instance BoxClass VBox -instance ContainerClass VBox -instance GObjectClass VBox -instance ObjectClass VBox -instance VBoxClass VBox -instance WidgetClass VBox -class BoxClass o => VBoxClass o -instance VBoxClass ColorSelection -instance VBoxClass FileChooserWidget -instance VBoxClass FontSelection -instance VBoxClass GammaCurve -instance VBoxClass VBox -castToVBox :: GObjectClass obj => obj -> VBox -toVBox :: VBoxClass o => o -> VBox -vBoxNew :: Bool -> Int -> IO VBox - -module Graphics.UI.Gtk.Layout.VButtonBox -data VButtonBox -instance BoxClass VButtonBox -instance ButtonBoxClass VButtonBox -instance ContainerClass VButtonBox -instance GObjectClass VButtonBox -instance ObjectClass VButtonBox -instance VButtonBoxClass VButtonBox -instance WidgetClass VButtonBox -class ButtonBoxClass o => VButtonBoxClass o -instance VButtonBoxClass VButtonBox -castToVButtonBox :: GObjectClass obj => obj -> VButtonBox -toVButtonBox :: VButtonBoxClass o => o -> VButtonBox -vButtonBoxNew :: IO VButtonBox - -module Graphics.UI.Gtk.Layout.VPaned -data VPaned -instance ContainerClass VPaned -instance GObjectClass VPaned -instance ObjectClass VPaned -instance PanedClass VPaned -instance VPanedClass VPaned -instance WidgetClass VPaned -class PanedClass o => VPanedClass o -instance VPanedClass VPaned -castToVPaned :: GObjectClass obj => obj -> VPaned -toVPaned :: VPanedClass o => o -> VPaned -vPanedNew :: IO VPaned - -module Graphics.UI.Gtk.MenuComboToolbar.CheckMenuItem -data CheckMenuItem -instance BinClass CheckMenuItem -instance CheckMenuItemClass CheckMenuItem -instance ContainerClass CheckMenuItem -instance GObjectClass CheckMenuItem -instance ItemClass CheckMenuItem -instance MenuItemClass CheckMenuItem -instance ObjectClass CheckMenuItem -instance WidgetClass CheckMenuItem -class MenuItemClass o => CheckMenuItemClass o -instance CheckMenuItemClass CheckMenuItem -instance CheckMenuItemClass RadioMenuItem -castToCheckMenuItem :: GObjectClass obj => obj -> CheckMenuItem -toCheckMenuItem :: CheckMenuItemClass o => o -> CheckMenuItem -checkMenuItemNew :: IO CheckMenuItem -checkMenuItemNewWithLabel :: String -> IO CheckMenuItem -checkMenuItemNewWithMnemonic :: String -> IO CheckMenuItem -checkMenuItemSetActive :: CheckMenuItemClass self => self -> Bool -> IO () -checkMenuItemGetActive :: CheckMenuItemClass self => self -> IO Bool -checkMenuItemToggled :: CheckMenuItemClass self => self -> IO () -checkMenuItemSetInconsistent :: CheckMenuItemClass self => self -> Bool -> IO () -checkMenuItemGetInconsistent :: CheckMenuItemClass self => self -> IO Bool -checkMenuItemGetDrawAsRadio :: CheckMenuItemClass self => self -> IO Bool -checkMenuItemSetDrawAsRadio :: CheckMenuItemClass self => self -> Bool -> IO () -checkMenuItemActive :: CheckMenuItemClass self => Attr self Bool -checkMenuItemInconsistent :: CheckMenuItemClass self => Attr self Bool -checkMenuItemDrawAsRadio :: CheckMenuItemClass self => Attr self Bool - -module Graphics.UI.Gtk.MenuComboToolbar.ComboBox -data ComboBox -instance BinClass ComboBox -instance ComboBoxClass ComboBox -instance ContainerClass ComboBox -instance GObjectClass ComboBox -instance ObjectClass ComboBox -instance WidgetClass ComboBox -class BinClass o => ComboBoxClass o -instance ComboBoxClass ComboBox -instance ComboBoxClass ComboBoxEntry -castToComboBox :: GObjectClass obj => obj -> ComboBox -toComboBox :: ComboBoxClass o => o -> ComboBox -comboBoxNew :: IO ComboBox -comboBoxNewText :: IO ComboBox -comboBoxNewWithModel :: TreeModelClass model => model -> IO ComboBox -comboBoxSetWrapWidth :: ComboBoxClass self => self -> Int -> IO () -comboBoxSetRowSpanColumn :: ComboBoxClass self => self -> Int -> IO () -comboBoxSetColumnSpanColumn :: ComboBoxClass self => self -> Int -> IO () -comboBoxGetActive :: ComboBoxClass self => self -> IO (Maybe Int) -comboBoxSetActive :: ComboBoxClass self => self -> Int -> IO () -comboBoxGetActiveIter :: ComboBoxClass self => self -> IO (Maybe TreeIter) -comboBoxSetActiveIter :: ComboBoxClass self => self -> TreeIter -> IO () -comboBoxGetModel :: ComboBoxClass self => self -> IO (Maybe TreeModel) -comboBoxSetModel :: (ComboBoxClass self, TreeModelClass model) => self -> Maybe model -> IO () -comboBoxAppendText :: ComboBoxClass self => self -> String -> IO () -comboBoxInsertText :: ComboBoxClass self => self -> Int -> String -> IO () -comboBoxPrependText :: ComboBoxClass self => self -> String -> IO () -comboBoxRemoveText :: ComboBoxClass self => self -> Int -> IO () -comboBoxPopup :: ComboBoxClass self => self -> IO () -comboBoxPopdown :: ComboBoxClass self => self -> IO () -comboBoxGetWrapWidth :: ComboBoxClass self => self -> IO Int -comboBoxGetRowSpanColumn :: ComboBoxClass self => self -> IO Int -comboBoxGetColumnSpanColumn :: ComboBoxClass self => self -> IO Int -comboBoxGetActiveText :: ComboBoxClass self => self -> IO (Maybe String) -comboBoxSetAddTearoffs :: ComboBoxClass self => self -> Bool -> IO () -comboBoxGetAddTearoffs :: ComboBoxClass self => self -> IO Bool -comboBoxSetFocusOnClick :: ComboBoxClass self => self -> Bool -> IO () -comboBoxGetFocusOnClick :: ComboBoxClass self => self -> IO Bool -comboBoxModel :: (ComboBoxClass self, TreeModelClass model) => ReadWriteAttr self (Maybe TreeModel) (Maybe model) -comboBoxWrapWidth :: ComboBoxClass self => Attr self Int -comboBoxRowSpanColumn :: ComboBoxClass self => Attr self Int -comboBoxColumnSpanColumn :: ComboBoxClass self => Attr self Int -comboBoxAddTearoffs :: ComboBoxClass self => Attr self Bool -comboBoxHasFrame :: ComboBoxClass self => Attr self Bool -comboBoxFocusOnClick :: ComboBoxClass self => Attr self Bool -onChanged :: ComboBoxClass self => self -> IO () -> IO (ConnectId self) -afterChanged :: ComboBoxClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.MenuComboToolbar.ComboBoxEntry -data ComboBoxEntry -instance BinClass ComboBoxEntry -instance ComboBoxClass ComboBoxEntry -instance ComboBoxEntryClass ComboBoxEntry -instance ContainerClass ComboBoxEntry -instance GObjectClass ComboBoxEntry -instance ObjectClass ComboBoxEntry -instance WidgetClass ComboBoxEntry -class ComboBoxClass o => ComboBoxEntryClass o -instance ComboBoxEntryClass ComboBoxEntry -castToComboBoxEntry :: GObjectClass obj => obj -> ComboBoxEntry -toComboBoxEntry :: ComboBoxEntryClass o => o -> ComboBoxEntry -comboBoxEntryNew :: IO ComboBoxEntry -comboBoxEntryNewWithModel :: TreeModelClass model => model -> Int -> IO ComboBoxEntry -comboBoxEntryNewText :: IO ComboBoxEntry -comboBoxEntrySetTextColumn :: ComboBoxEntryClass self => self -> Int -> IO () -comboBoxEntryGetTextColumn :: ComboBoxEntryClass self => self -> IO Int -comboBoxEntryTextColumn :: ComboBoxEntryClass self => Attr self Int - -module Graphics.UI.Gtk.MenuComboToolbar.ImageMenuItem -data ImageMenuItem -instance BinClass ImageMenuItem -instance ContainerClass ImageMenuItem -instance GObjectClass ImageMenuItem -instance ImageMenuItemClass ImageMenuItem -instance ItemClass ImageMenuItem -instance MenuItemClass ImageMenuItem -instance ObjectClass ImageMenuItem -instance WidgetClass ImageMenuItem -class MenuItemClass o => ImageMenuItemClass o -instance ImageMenuItemClass ImageMenuItem -castToImageMenuItem :: GObjectClass obj => obj -> ImageMenuItem -toImageMenuItem :: ImageMenuItemClass o => o -> ImageMenuItem -imageMenuItemNew :: IO ImageMenuItem -imageMenuItemNewFromStock :: String -> IO ImageMenuItem -imageMenuItemNewWithLabel :: String -> IO ImageMenuItem -imageMenuItemNewWithMnemonic :: String -> IO ImageMenuItem -imageMenuItemSetImage :: (ImageMenuItemClass self, WidgetClass image) => self -> image -> IO () -imageMenuItemGetImage :: ImageMenuItemClass self => self -> IO (Maybe Widget) -imageMenuItemImage :: (ImageMenuItemClass self, WidgetClass image) => ReadWriteAttr self (Maybe Widget) image - -module Graphics.UI.Gtk.MenuComboToolbar.MenuBar -data MenuBar -instance ContainerClass MenuBar -instance GObjectClass MenuBar -instance MenuBarClass MenuBar -instance MenuShellClass MenuBar -instance ObjectClass MenuBar -instance WidgetClass MenuBar -class MenuShellClass o => MenuBarClass o -instance MenuBarClass MenuBar -castToMenuBar :: GObjectClass obj => obj -> MenuBar -toMenuBar :: MenuBarClass o => o -> MenuBar -data PackDirection -PackDirectionLtr :: PackDirection -PackDirectionRtl :: PackDirection -PackDirectionTtb :: PackDirection -PackDirectionBtt :: PackDirection -instance Enum PackDirection -menuBarNew :: IO MenuBar -menuBarSetPackDirection :: MenuBarClass self => self -> PackDirection -> IO () -menuBarGetPackDirection :: MenuBarClass self => self -> IO PackDirection -menuBarSetChildPackDirection :: MenuBarClass self => self -> PackDirection -> IO () -menuBarGetChildPackDirection :: MenuBarClass self => self -> IO PackDirection -menuBarPackDirection :: MenuBarClass self => Attr self PackDirection -menuBarChildPackDirection :: MenuBarClass self => Attr self PackDirection - -module Graphics.UI.Gtk.MenuComboToolbar.MenuItem -data MenuItem -instance BinClass MenuItem -instance ContainerClass MenuItem -instance GObjectClass MenuItem -instance ItemClass MenuItem -instance MenuItemClass MenuItem -instance ObjectClass MenuItem -instance WidgetClass MenuItem -class ItemClass o => MenuItemClass o -instance MenuItemClass CheckMenuItem -instance MenuItemClass ImageMenuItem -instance MenuItemClass MenuItem -instance MenuItemClass RadioMenuItem -instance MenuItemClass SeparatorMenuItem -instance MenuItemClass TearoffMenuItem -castToMenuItem :: GObjectClass obj => obj -> MenuItem -toMenuItem :: MenuItemClass o => o -> MenuItem -menuItemNew :: IO MenuItem -menuItemNewWithLabel :: String -> IO MenuItem -menuItemNewWithMnemonic :: String -> IO MenuItem -menuItemSetSubmenu :: (MenuItemClass self, MenuClass submenu) => self -> submenu -> IO () -menuItemGetSubmenu :: MenuItemClass self => self -> IO (Maybe Widget) -menuItemRemoveSubmenu :: MenuItemClass self => self -> IO () -menuItemSelect :: MenuItemClass self => self -> IO () -menuItemDeselect :: MenuItemClass self => self -> IO () -menuItemActivate :: MenuItemClass self => self -> IO () -menuItemSetRightJustified :: MenuItemClass self => self -> Bool -> IO () -menuItemGetRightJustified :: MenuItemClass self => self -> IO Bool -menuItemSetAccelPath :: MenuItemClass self => self -> Maybe String -> IO () -menuItemSubmenu :: (MenuItemClass self, MenuClass submenu) => ReadWriteAttr self (Maybe Widget) submenu -menuItemRightJustified :: MenuItemClass self => Attr self Bool -onActivateItem :: MenuItemClass self => self -> IO () -> IO (ConnectId self) -afterActivateItem :: MenuItemClass self => self -> IO () -> IO (ConnectId self) -onActivateLeaf :: MenuItemClass self => self -> IO () -> IO (ConnectId self) -afterActivateLeaf :: MenuItemClass self => self -> IO () -> IO (ConnectId self) -onSelect :: ItemClass i => i -> IO () -> IO (ConnectId i) -afterSelect :: ItemClass i => i -> IO () -> IO (ConnectId i) -onDeselect :: ItemClass i => i -> IO () -> IO (ConnectId i) -afterDeselect :: ItemClass i => i -> IO () -> IO (ConnectId i) -onToggle :: ItemClass i => i -> IO () -> IO (ConnectId i) -afterToggle :: ItemClass i => i -> IO () -> IO (ConnectId i) - -module Graphics.UI.Gtk.MenuComboToolbar.MenuShell -data MenuShell -instance ContainerClass MenuShell -instance GObjectClass MenuShell -instance MenuShellClass MenuShell -instance ObjectClass MenuShell -instance WidgetClass MenuShell -class ContainerClass o => MenuShellClass o -instance MenuShellClass Menu -instance MenuShellClass MenuBar -instance MenuShellClass MenuShell -castToMenuShell :: GObjectClass obj => obj -> MenuShell -toMenuShell :: MenuShellClass o => o -> MenuShell -menuShellAppend :: (MenuShellClass self, MenuItemClass child) => self -> child -> IO () -menuShellPrepend :: (MenuShellClass self, MenuItemClass child) => self -> child -> IO () -menuShellInsert :: (MenuShellClass self, MenuItemClass child) => self -> child -> Int -> IO () -menuShellDeactivate :: MenuShellClass self => self -> IO () -menuShellActivateItem :: (MenuShellClass self, MenuItemClass menuItem) => self -> menuItem -> Bool -> IO () -menuShellSelectItem :: (MenuShellClass self, MenuItemClass menuItem) => self -> menuItem -> IO () -menuShellDeselect :: MenuShellClass self => self -> IO () -menuShellSelectFirst :: MenuShellClass self => self -> Bool -> IO () -menuShellCancel :: MenuShellClass self => self -> IO () -menuShellSetTakeFocus :: MenuShellClass self => self -> Bool -> IO () -menuShellGetTakeFocus :: MenuShellClass self => self -> IO Bool -menuShellTakeFocus :: MenuShellClass self => Attr self Bool -onActivateCurrent :: MenuShellClass self => self -> (Bool -> IO ()) -> IO (ConnectId self) -afterActivateCurrent :: MenuShellClass self => self -> (Bool -> IO ()) -> IO (ConnectId self) -onCancel :: MenuShellClass self => self -> IO () -> IO (ConnectId self) -afterCancel :: MenuShellClass self => self -> IO () -> IO (ConnectId self) -onDeactivated :: MenuShellClass self => self -> IO () -> IO (ConnectId self) -afterDeactivated :: MenuShellClass self => self -> IO () -> IO (ConnectId self) -data MenuDirectionType -MenuDirParent :: MenuDirectionType -MenuDirChild :: MenuDirectionType -MenuDirNext :: MenuDirectionType -MenuDirPrev :: MenuDirectionType -instance Enum MenuDirectionType -instance Eq MenuDirectionType -onMoveCurrent :: MenuShellClass self => self -> (MenuDirectionType -> IO ()) -> IO (ConnectId self) -afterMoveCurrent :: MenuShellClass self => self -> (MenuDirectionType -> IO ()) -> IO (ConnectId self) -onSelectionDone :: MenuShellClass self => self -> IO () -> IO (ConnectId self) -afterSelectionDone :: MenuShellClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.MenuComboToolbar.MenuToolButton -data MenuToolButton -instance BinClass MenuToolButton -instance ContainerClass MenuToolButton -instance GObjectClass MenuToolButton -instance MenuToolButtonClass MenuToolButton -instance ObjectClass MenuToolButton -instance ToolItemClass MenuToolButton -instance WidgetClass MenuToolButton -class ToolItemClass o => MenuToolButtonClass o -instance MenuToolButtonClass MenuToolButton -castToMenuToolButton :: GObjectClass obj => obj -> MenuToolButton -toMenuToolButton :: MenuToolButtonClass o => o -> MenuToolButton -menuToolButtonNew :: WidgetClass iconWidget => Maybe iconWidget -> Maybe String -> IO MenuToolButton -menuToolButtonNewFromStock :: String -> IO MenuToolButton -menuToolButtonSetMenu :: (MenuToolButtonClass self, MenuClass menu) => self -> Maybe menu -> IO () -menuToolButtonGetMenu :: MenuToolButtonClass self => self -> IO (Maybe Menu) -menuToolButtonSetArrowTooltip :: MenuToolButtonClass self => self -> Tooltips -> String -> String -> IO () -menuToolButtonMenu :: (MenuToolButtonClass self, MenuClass menu) => ReadWriteAttr self (Maybe Menu) (Maybe menu) -onShowMenu :: MenuToolButtonClass self => self -> IO () -> IO (ConnectId self) -afterShowMenu :: MenuToolButtonClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.MenuComboToolbar.OptionMenu -data OptionMenu -instance BinClass OptionMenu -instance ButtonClass OptionMenu -instance ContainerClass OptionMenu -instance GObjectClass OptionMenu -instance ObjectClass OptionMenu -instance OptionMenuClass OptionMenu -instance WidgetClass OptionMenu -class ButtonClass o => OptionMenuClass o -instance OptionMenuClass OptionMenu -castToOptionMenu :: GObjectClass obj => obj -> OptionMenu -toOptionMenu :: OptionMenuClass o => o -> OptionMenu -optionMenuNew :: IO OptionMenu -optionMenuGetMenu :: OptionMenuClass self => self -> IO Menu -optionMenuSetMenu :: (OptionMenuClass self, MenuClass menu) => self -> menu -> IO () -optionMenuRemoveMenu :: OptionMenuClass self => self -> IO () -optionMenuSetHistory :: OptionMenuClass self => self -> Int -> IO () -optionMenuGetHistory :: OptionMenuClass self => self -> IO Int -optionMenuMenu :: (OptionMenuClass self, MenuClass menu) => ReadWriteAttr self Menu menu -onOMChanged :: OptionMenuClass self => self -> IO () -> IO (ConnectId self) -afterOMChanged :: OptionMenuClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.MenuComboToolbar.RadioMenuItem -data RadioMenuItem -instance BinClass RadioMenuItem -instance CheckMenuItemClass RadioMenuItem -instance ContainerClass RadioMenuItem -instance GObjectClass RadioMenuItem -instance ItemClass RadioMenuItem -instance MenuItemClass RadioMenuItem -instance ObjectClass RadioMenuItem -instance RadioMenuItemClass RadioMenuItem -instance WidgetClass RadioMenuItem -class CheckMenuItemClass o => RadioMenuItemClass o -instance RadioMenuItemClass RadioMenuItem -castToRadioMenuItem :: GObjectClass obj => obj -> RadioMenuItem -toRadioMenuItem :: RadioMenuItemClass o => o -> RadioMenuItem -radioMenuItemNew :: IO RadioMenuItem -radioMenuItemNewWithLabel :: String -> IO RadioMenuItem -radioMenuItemNewWithMnemonic :: String -> IO RadioMenuItem -radioMenuItemNewFromWidget :: RadioMenuItem -> IO RadioMenuItem -radioMenuItemNewWithLabelFromWidget :: RadioMenuItem -> String -> IO RadioMenuItem -radioMenuItemNewWithMnemonicFromWidget :: RadioMenuItem -> String -> IO RadioMenuItem - -module Graphics.UI.Gtk.MenuComboToolbar.RadioToolButton -data RadioToolButton -instance BinClass RadioToolButton -instance ContainerClass RadioToolButton -instance GObjectClass RadioToolButton -instance ObjectClass RadioToolButton -instance RadioToolButtonClass RadioToolButton -instance ToggleToolButtonClass RadioToolButton -instance ToolButtonClass RadioToolButton -instance ToolItemClass RadioToolButton -instance WidgetClass RadioToolButton -class ToggleToolButtonClass o => RadioToolButtonClass o -instance RadioToolButtonClass RadioToolButton -castToRadioToolButton :: GObjectClass obj => obj -> RadioToolButton -toRadioToolButton :: RadioToolButtonClass o => o -> RadioToolButton -radioToolButtonNew :: IO RadioToolButton -radioToolButtonNewFromStock :: String -> IO RadioToolButton -radioToolButtonNewFromWidget :: RadioToolButtonClass groupMember => groupMember -> IO RadioToolButton -radioToolButtonNewWithStockFromWidget :: RadioToolButtonClass groupMember => groupMember -> String -> IO RadioToolButton -radioToolButtonGetGroup :: RadioToolButtonClass self => self -> IO [RadioToolButton] -radioToolButtonSetGroup :: RadioToolButtonClass self => self -> RadioToolButton -> IO () -radioToolButtonGroup :: RadioToolButtonClass self => ReadWriteAttr self [RadioToolButton] RadioToolButton - -module Graphics.UI.Gtk.MenuComboToolbar.SeparatorMenuItem -data SeparatorMenuItem -instance BinClass SeparatorMenuItem -instance ContainerClass SeparatorMenuItem -instance GObjectClass SeparatorMenuItem -instance ItemClass SeparatorMenuItem -instance MenuItemClass SeparatorMenuItem -instance ObjectClass SeparatorMenuItem -instance SeparatorMenuItemClass SeparatorMenuItem -instance WidgetClass SeparatorMenuItem -class MenuItemClass o => SeparatorMenuItemClass o -instance SeparatorMenuItemClass SeparatorMenuItem -castToSeparatorMenuItem :: GObjectClass obj => obj -> SeparatorMenuItem -toSeparatorMenuItem :: SeparatorMenuItemClass o => o -> SeparatorMenuItem -separatorMenuItemNew :: IO SeparatorMenuItem - -module Graphics.UI.Gtk.MenuComboToolbar.SeparatorToolItem -data SeparatorToolItem -instance BinClass SeparatorToolItem -instance ContainerClass SeparatorToolItem -instance GObjectClass SeparatorToolItem -instance ObjectClass SeparatorToolItem -instance SeparatorToolItemClass SeparatorToolItem -instance ToolItemClass SeparatorToolItem -instance WidgetClass SeparatorToolItem -class ToolItemClass o => SeparatorToolItemClass o -instance SeparatorToolItemClass SeparatorToolItem -castToSeparatorToolItem :: GObjectClass obj => obj -> SeparatorToolItem -toSeparatorToolItem :: SeparatorToolItemClass o => o -> SeparatorToolItem -separatorToolItemNew :: IO SeparatorToolItem -separatorToolItemSetDraw :: SeparatorToolItemClass self => self -> Bool -> IO () -separatorToolItemGetDraw :: SeparatorToolItemClass self => self -> IO Bool -separatorToolItemDraw :: SeparatorToolItemClass self => Attr self Bool - -module Graphics.UI.Gtk.MenuComboToolbar.TearoffMenuItem -data TearoffMenuItem -instance BinClass TearoffMenuItem -instance ContainerClass TearoffMenuItem -instance GObjectClass TearoffMenuItem -instance ItemClass TearoffMenuItem -instance MenuItemClass TearoffMenuItem -instance ObjectClass TearoffMenuItem -instance TearoffMenuItemClass TearoffMenuItem -instance WidgetClass TearoffMenuItem -class MenuItemClass o => TearoffMenuItemClass o -instance TearoffMenuItemClass TearoffMenuItem -castToTearoffMenuItem :: GObjectClass obj => obj -> TearoffMenuItem -toTearoffMenuItem :: TearoffMenuItemClass o => o -> TearoffMenuItem -tearoffMenuItemNew :: IO TearoffMenuItem - -module Graphics.UI.Gtk.MenuComboToolbar.ToggleToolButton -data ToggleToolButton -instance BinClass ToggleToolButton -instance ContainerClass ToggleToolButton -instance GObjectClass ToggleToolButton -instance ObjectClass ToggleToolButton -instance ToggleToolButtonClass ToggleToolButton -instance ToolButtonClass ToggleToolButton -instance ToolItemClass ToggleToolButton -instance WidgetClass ToggleToolButton -class ToolButtonClass o => ToggleToolButtonClass o -instance ToggleToolButtonClass RadioToolButton -instance ToggleToolButtonClass ToggleToolButton -castToToggleToolButton :: GObjectClass obj => obj -> ToggleToolButton -toToggleToolButton :: ToggleToolButtonClass o => o -> ToggleToolButton -toggleToolButtonNew :: IO ToggleToolButton -toggleToolButtonNewFromStock :: String -> IO ToggleToolButton -toggleToolButtonSetActive :: ToggleToolButtonClass self => self -> Bool -> IO () -toggleToolButtonGetActive :: ToggleToolButtonClass self => self -> IO Bool -toggleToolButtonActive :: ToggleToolButtonClass self => Attr self Bool -onToolButtonToggled :: ToggleToolButtonClass self => self -> IO () -> IO (ConnectId self) -afterToolButtonToggled :: ToggleToolButtonClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.MenuComboToolbar.ToolButton -data ToolButton -instance BinClass ToolButton -instance ContainerClass ToolButton -instance GObjectClass ToolButton -instance ObjectClass ToolButton -instance ToolButtonClass ToolButton -instance ToolItemClass ToolButton -instance WidgetClass ToolButton -class ToolItemClass o => ToolButtonClass o -instance ToolButtonClass RadioToolButton -instance ToolButtonClass ToggleToolButton -instance ToolButtonClass ToolButton -castToToolButton :: GObjectClass obj => obj -> ToolButton -toToolButton :: ToolButtonClass o => o -> ToolButton -toolButtonNew :: WidgetClass iconWidget => Maybe iconWidget -> Maybe String -> IO ToolButton -toolButtonNewFromStock :: String -> IO ToolButton -toolButtonSetLabel :: ToolButtonClass self => self -> Maybe String -> IO () -toolButtonGetLabel :: ToolButtonClass self => self -> IO (Maybe String) -toolButtonSetUseUnderline :: ToolButtonClass self => self -> Bool -> IO () -toolButtonGetUseUnderline :: ToolButtonClass self => self -> IO Bool -toolButtonSetStockId :: ToolButtonClass self => self -> Maybe String -> IO () -toolButtonGetStockId :: ToolButtonClass self => self -> IO (Maybe String) -toolButtonSetIconWidget :: (ToolButtonClass self, WidgetClass iconWidget) => self -> Maybe iconWidget -> IO () -toolButtonGetIconWidget :: ToolButtonClass self => self -> IO (Maybe Widget) -toolButtonSetLabelWidget :: (ToolButtonClass self, WidgetClass labelWidget) => self -> Maybe labelWidget -> IO () -toolButtonGetLabelWidget :: ToolButtonClass self => self -> IO (Maybe Widget) -toolButtonSetIconName :: ToolButtonClass self => self -> String -> IO () -toolButtonGetIconName :: ToolButtonClass self => self -> IO String -toolButtonLabel :: ToolButtonClass self => Attr self (Maybe String) -toolButtonUseUnderline :: ToolButtonClass self => Attr self Bool -toolButtonLabelWidget :: (ToolButtonClass self, WidgetClass labelWidget) => ReadWriteAttr self (Maybe Widget) (Maybe labelWidget) -toolButtonStockId :: ToolButtonClass self => ReadWriteAttr self (Maybe String) (Maybe String) -toolButtonIconName :: ToolButtonClass self => Attr self String -toolButtonIconWidget :: (ToolButtonClass self, WidgetClass iconWidget) => ReadWriteAttr self (Maybe Widget) (Maybe iconWidget) -onToolButtonClicked :: ToolButtonClass self => self -> IO () -> IO (ConnectId self) -afterToolButtonClicked :: ToolButtonClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.MenuComboToolbar.ToolItem -data ToolItem -instance BinClass ToolItem -instance ContainerClass ToolItem -instance GObjectClass ToolItem -instance ObjectClass ToolItem -instance ToolItemClass ToolItem -instance WidgetClass ToolItem -class BinClass o => ToolItemClass o -instance ToolItemClass MenuToolButton -instance ToolItemClass RadioToolButton -instance ToolItemClass SeparatorToolItem -instance ToolItemClass ToggleToolButton -instance ToolItemClass ToolButton -instance ToolItemClass ToolItem -castToToolItem :: GObjectClass obj => obj -> ToolItem -toToolItem :: ToolItemClass o => o -> ToolItem -toolItemNew :: IO ToolItem -toolItemSetHomogeneous :: ToolItemClass self => self -> Bool -> IO () -toolItemGetHomogeneous :: ToolItemClass self => self -> IO Bool -toolItemSetExpand :: ToolItemClass self => self -> Bool -> IO () -toolItemGetExpand :: ToolItemClass self => self -> IO Bool -toolItemSetTooltip :: ToolItemClass self => self -> Tooltips -> String -> String -> IO () -toolItemSetUseDragWindow :: ToolItemClass self => self -> Bool -> IO () -toolItemGetUseDragWindow :: ToolItemClass self => self -> IO Bool -toolItemSetVisibleHorizontal :: ToolItemClass self => self -> Bool -> IO () -toolItemGetVisibleHorizontal :: ToolItemClass self => self -> IO Bool -toolItemSetVisibleVertical :: ToolItemClass self => self -> Bool -> IO () -toolItemGetVisibleVertical :: ToolItemClass self => self -> IO Bool -toolItemSetIsImportant :: ToolItemClass self => self -> Bool -> IO () -toolItemGetIsImportant :: ToolItemClass self => self -> IO Bool -type IconSize = Int -toolItemGetIconSize :: ToolItemClass self => self -> IO IconSize -data Orientation -OrientationHorizontal :: Orientation -OrientationVertical :: Orientation -instance Enum Orientation -instance Eq Orientation -toolItemGetOrientation :: ToolItemClass self => self -> IO Orientation -data ToolbarStyle -ToolbarIcons :: ToolbarStyle -ToolbarText :: ToolbarStyle -ToolbarBoth :: ToolbarStyle -ToolbarBothHoriz :: ToolbarStyle -instance Enum ToolbarStyle -instance Eq ToolbarStyle -toolItemGetToolbarStyle :: ToolItemClass self => self -> IO ToolbarStyle -data ReliefStyle -ReliefNormal :: ReliefStyle -ReliefHalf :: ReliefStyle -ReliefNone :: ReliefStyle -instance Enum ReliefStyle -instance Eq ReliefStyle -toolItemGetReliefStyle :: ToolItemClass self => self -> IO ReliefStyle -toolItemRetrieveProxyMenuItem :: ToolItemClass self => self -> IO (Maybe Widget) -toolItemGetProxyMenuItem :: ToolItemClass self => self -> String -> IO (Maybe Widget) -toolItemSetProxyMenuItem :: (ToolItemClass self, MenuItemClass menuItem) => self -> String -> menuItem -> IO () -toolItemVisibleHorizontal :: ToolItemClass self => Attr self Bool -toolItemVisibleVertical :: ToolItemClass self => Attr self Bool -toolItemIsImportant :: ToolItemClass self => Attr self Bool -toolItemExpand :: ToolItemClass self => Attr self Bool -toolItemHomogeneous :: ToolItemClass self => Attr self Bool -toolItemUseDragWindow :: ToolItemClass self => Attr self Bool - -module Graphics.UI.Gtk.Misc.Adjustment -data Adjustment -instance AdjustmentClass Adjustment -instance GObjectClass Adjustment -instance ObjectClass Adjustment -class ObjectClass o => AdjustmentClass o -instance AdjustmentClass Adjustment -castToAdjustment :: GObjectClass obj => obj -> Adjustment -toAdjustment :: AdjustmentClass o => o -> Adjustment -adjustmentNew :: Double -> Double -> Double -> Double -> Double -> Double -> IO Adjustment -adjustmentSetLower :: Adjustment -> Double -> IO () -adjustmentGetLower :: Adjustment -> IO Double -adjustmentSetPageIncrement :: Adjustment -> Double -> IO () -adjustmentGetPageIncrement :: Adjustment -> IO Double -adjustmentSetPageSize :: Adjustment -> Double -> IO () -adjustmentGetPageSize :: Adjustment -> IO Double -adjustmentSetStepIncrement :: Adjustment -> Double -> IO () -adjustmentGetStepIncrement :: Adjustment -> IO Double -adjustmentSetUpper :: Adjustment -> Double -> IO () -adjustmentGetUpper :: Adjustment -> IO Double -adjustmentSetValue :: Adjustment -> Double -> IO () -adjustmentGetValue :: Adjustment -> IO Double -adjustmentClampPage :: Adjustment -> Double -> Double -> IO () -adjustmentValue :: Attr Adjustment Double -adjustmentLower :: Attr Adjustment Double -adjustmentUpper :: Attr Adjustment Double -adjustmentStepIncrement :: Attr Adjustment Double -adjustmentPageIncrement :: Attr Adjustment Double -adjustmentPageSize :: Attr Adjustment Double -onAdjChanged :: Adjustment -> IO () -> IO (ConnectId Adjustment) -afterAdjChanged :: Adjustment -> IO () -> IO (ConnectId Adjustment) -onValueChanged :: Adjustment -> IO () -> IO (ConnectId Adjustment) -afterValueChanged :: Adjustment -> IO () -> IO (ConnectId Adjustment) - -module Graphics.UI.Gtk.Misc.Arrow -data Arrow -instance ArrowClass Arrow -instance GObjectClass Arrow -instance MiscClass Arrow -instance ObjectClass Arrow -instance WidgetClass Arrow -class MiscClass o => ArrowClass o -instance ArrowClass Arrow -castToArrow :: GObjectClass obj => obj -> Arrow -toArrow :: ArrowClass o => o -> Arrow -data ArrowType -ArrowUp :: ArrowType -ArrowDown :: ArrowType -ArrowLeft :: ArrowType -ArrowRight :: ArrowType -instance Enum ArrowType -instance Eq ArrowType -data ShadowType -ShadowNone :: ShadowType -ShadowIn :: ShadowType -ShadowOut :: ShadowType -ShadowEtchedIn :: ShadowType -ShadowEtchedOut :: ShadowType -instance Enum ShadowType -instance Eq ShadowType -arrowNew :: ArrowType -> ShadowType -> IO Arrow -arrowSet :: ArrowClass self => self -> ArrowType -> ShadowType -> IO () -arrowArrowType :: ArrowClass self => Attr self ArrowType -arrowShadowType :: ArrowClass self => Attr self ShadowType - -module Graphics.UI.Gtk.Misc.Calendar -data Calendar -instance CalendarClass Calendar -instance GObjectClass Calendar -instance ObjectClass Calendar -instance WidgetClass Calendar -class WidgetClass o => CalendarClass o -instance CalendarClass Calendar -castToCalendar :: GObjectClass obj => obj -> Calendar -toCalendar :: CalendarClass o => o -> Calendar -data CalendarDisplayOptions -CalendarShowHeading :: CalendarDisplayOptions -CalendarShowDayNames :: CalendarDisplayOptions -CalendarNoMonthChange :: CalendarDisplayOptions -CalendarShowWeekNumbers :: CalendarDisplayOptions -CalendarWeekStartMonday :: CalendarDisplayOptions -instance Bounded CalendarDisplayOptions -instance Enum CalendarDisplayOptions -instance Eq CalendarDisplayOptions -instance Flags CalendarDisplayOptions -calendarNew :: IO Calendar -calendarSelectMonth :: CalendarClass self => self -> Int -> Int -> IO Bool -calendarSelectDay :: CalendarClass self => self -> Int -> IO () -calendarMarkDay :: CalendarClass self => self -> Int -> IO Bool -calendarUnmarkDay :: CalendarClass self => self -> Int -> IO Bool -calendarClearMarks :: CalendarClass self => self -> IO () -calendarDisplayOptions :: CalendarClass self => self -> [CalendarDisplayOptions] -> IO () -calendarSetDisplayOptions :: CalendarClass self => self -> [CalendarDisplayOptions] -> IO () -calendarGetDisplayOptions :: CalendarClass self => self -> IO [CalendarDisplayOptions] -calendarGetDate :: CalendarClass self => self -> IO (Int, Int, Int) -calendarFreeze :: CalendarClass self => self -> IO a -> IO a -calendarYear :: CalendarClass self => Attr self Int -calendarMonth :: CalendarClass self => Attr self Int -calendarDay :: CalendarClass self => Attr self Int -calendarShowHeading :: CalendarClass self => Attr self Bool -calendarShowDayNames :: CalendarClass self => Attr self Bool -calendarNoMonthChange :: CalendarClass self => Attr self Bool -calendarShowWeekNumbers :: CalendarClass self => Attr self Bool -onDaySelected :: CalendarClass self => self -> IO () -> IO (ConnectId self) -afterDaySelected :: CalendarClass self => self -> IO () -> IO (ConnectId self) -onDaySelectedDoubleClick :: CalendarClass self => self -> IO () -> IO (ConnectId self) -afterDaySelectedDoubleClick :: CalendarClass self => self -> IO () -> IO (ConnectId self) -onMonthChanged :: CalendarClass self => self -> IO () -> IO (ConnectId self) -afterMonthChanged :: CalendarClass self => self -> IO () -> IO (ConnectId self) -onNextMonth :: CalendarClass self => self -> IO () -> IO (ConnectId self) -afterNextMonth :: CalendarClass self => self -> IO () -> IO (ConnectId self) -onNextYear :: CalendarClass self => self -> IO () -> IO (ConnectId self) -afterNextYear :: CalendarClass self => self -> IO () -> IO (ConnectId self) -onPrevMonth :: CalendarClass self => self -> IO () -> IO (ConnectId self) -afterPrevMonth :: CalendarClass self => self -> IO () -> IO (ConnectId self) -onPrevYear :: CalendarClass self => self -> IO () -> IO (ConnectId self) -afterPrevYear :: CalendarClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Misc.DrawingArea -data DrawingArea -instance DrawingAreaClass DrawingArea -instance GObjectClass DrawingArea -instance ObjectClass DrawingArea -instance WidgetClass DrawingArea -class WidgetClass o => DrawingAreaClass o -instance DrawingAreaClass Curve -instance DrawingAreaClass DrawingArea -castToDrawingArea :: GObjectClass obj => obj -> DrawingArea -toDrawingArea :: DrawingAreaClass o => o -> DrawingArea -drawingAreaNew :: IO DrawingArea -drawingAreaGetDrawWindow :: DrawingArea -> IO DrawWindow -drawingAreaGetSize :: DrawingArea -> IO (Int, Int) - -module Graphics.UI.Gtk.Misc.EventBox -data EventBox -instance BinClass EventBox -instance ContainerClass EventBox -instance EventBoxClass EventBox -instance GObjectClass EventBox -instance ObjectClass EventBox -instance WidgetClass EventBox -class BinClass o => EventBoxClass o -instance EventBoxClass EventBox -castToEventBox :: GObjectClass obj => obj -> EventBox -toEventBox :: EventBoxClass o => o -> EventBox -eventBoxNew :: IO EventBox -eventBoxSetVisibleWindow :: EventBox -> Bool -> IO () -eventBoxGetVisibleWindow :: EventBox -> IO Bool -eventBoxSetAboveChild :: EventBox -> Bool -> IO () -eventBoxGetAboveChild :: EventBox -> IO Bool -eventBoxVisibleWindow :: Attr EventBox Bool -eventBoxAboveChild :: Attr EventBox Bool - -module Graphics.UI.Gtk.Misc.HandleBox -data HandleBox -instance BinClass HandleBox -instance ContainerClass HandleBox -instance GObjectClass HandleBox -instance HandleBoxClass HandleBox -instance ObjectClass HandleBox -instance WidgetClass HandleBox -class BinClass o => HandleBoxClass o -instance HandleBoxClass HandleBox -castToHandleBox :: GObjectClass obj => obj -> HandleBox -toHandleBox :: HandleBoxClass o => o -> HandleBox -handleBoxNew :: IO HandleBox -data ShadowType -ShadowNone :: ShadowType -ShadowIn :: ShadowType -ShadowOut :: ShadowType -ShadowEtchedIn :: ShadowType -ShadowEtchedOut :: ShadowType -instance Enum ShadowType -instance Eq ShadowType -handleBoxSetShadowType :: HandleBoxClass self => self -> ShadowType -> IO () -handleBoxGetShadowType :: HandleBoxClass self => self -> IO ShadowType -data PositionType -PosLeft :: PositionType -PosRight :: PositionType -PosTop :: PositionType -PosBottom :: PositionType -instance Enum PositionType -instance Eq PositionType -handleBoxSetHandlePosition :: HandleBoxClass self => self -> PositionType -> IO () -handleBoxGetHandlePosition :: HandleBoxClass self => self -> IO PositionType -handleBoxSetSnapEdge :: HandleBoxClass self => self -> PositionType -> IO () -handleBoxGetSnapEdge :: HandleBoxClass self => self -> IO PositionType -handleBoxShadowType :: HandleBoxClass self => Attr self ShadowType -handleBoxHandlePosition :: HandleBoxClass self => Attr self PositionType -handleBoxSnapEdge :: HandleBoxClass self => Attr self PositionType -handleBoxSnapEdgeSet :: HandleBoxClass self => Attr self Bool -onChildAttached :: HandleBoxClass self => self -> IO () -> IO (ConnectId self) -afterChildAttached :: HandleBoxClass self => self -> IO () -> IO (ConnectId self) -onChildDetached :: HandleBoxClass self => self -> IO () -> IO (ConnectId self) -afterChildDetached :: HandleBoxClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Misc.Tooltips -data Tooltips -instance GObjectClass Tooltips -instance ObjectClass Tooltips -instance TooltipsClass Tooltips -class ObjectClass o => TooltipsClass o -instance TooltipsClass Tooltips -castToTooltips :: GObjectClass obj => obj -> Tooltips -toTooltips :: TooltipsClass o => o -> Tooltips -tooltipsNew :: IO Tooltips -tooltipsEnable :: TooltipsClass self => self -> IO () -tooltipsDisable :: TooltipsClass self => self -> IO () -tooltipsSetDelay :: TooltipsClass self => self -> Int -> IO () -tooltipsSetTip :: (TooltipsClass self, WidgetClass widget) => self -> widget -> String -> String -> IO () -tooltipsDataGet :: WidgetClass w => w -> IO (Maybe (Tooltips, String, String)) - -module Graphics.UI.Gtk.Misc.Viewport -data Viewport -instance BinClass Viewport -instance ContainerClass Viewport -instance GObjectClass Viewport -instance ObjectClass Viewport -instance ViewportClass Viewport -instance WidgetClass Viewport -class BinClass o => ViewportClass o -instance ViewportClass Viewport -castToViewport :: GObjectClass obj => obj -> Viewport -toViewport :: ViewportClass o => o -> Viewport -viewportNew :: Adjustment -> Adjustment -> IO Viewport -viewportGetHAdjustment :: ViewportClass self => self -> IO Adjustment -viewportGetVAdjustment :: ViewportClass self => self -> IO Adjustment -viewportSetHAdjustment :: ViewportClass self => self -> Adjustment -> IO () -viewportSetVAdjustment :: ViewportClass self => self -> Adjustment -> IO () -data ShadowType -ShadowNone :: ShadowType -ShadowIn :: ShadowType -ShadowOut :: ShadowType -ShadowEtchedIn :: ShadowType -ShadowEtchedOut :: ShadowType -instance Enum ShadowType -instance Eq ShadowType -viewportSetShadowType :: ViewportClass self => self -> ShadowType -> IO () -viewportGetShadowType :: ViewportClass self => self -> IO ShadowType -viewportHAdjustment :: ViewportClass self => Attr self Adjustment -viewportVAdjustment :: ViewportClass self => Attr self Adjustment -viewportShadowType :: ViewportClass self => Attr self ShadowType - -module Graphics.UI.Gtk.Mogul.WidgetTable -type WidgetName = String -widgetLookup :: WidgetClass w => WidgetName -> String -> (ForeignPtr w -> w) -> IO w -newNamedWidget :: WidgetClass w => WidgetName -> IO w -> IO w -isValidName :: WidgetName -> IO Bool - -module Graphics.UI.Gtk.Mogul.GetWidget -getMisc :: String -> IO Misc -getLabel :: String -> IO Label -getAccelLabel :: String -> IO AccelLabel -getTipsQuery :: String -> IO TipsQuery -getArrow :: String -> IO Arrow -getImage :: String -> IO Image -getContainer :: String -> IO Container -getBin :: String -> IO Bin -getAlignment :: String -> IO Alignment -getFrame :: String -> IO Frame -getAspectFrame :: String -> IO AspectFrame -getButton :: String -> IO Button -getToggleButton :: String -> IO ToggleButton -getCheckButton :: String -> IO CheckButton -getRadioButton :: String -> IO RadioButton -getOptionMenu :: String -> IO OptionMenu -getItem :: String -> IO Item -getMenuItem :: String -> IO MenuItem -getCheckMenuItem :: String -> IO CheckMenuItem -getRadioMenuItem :: String -> IO RadioMenuItem -getTearoffMenuItem :: String -> IO TearoffMenuItem -getListItem :: String -> IO ListItem -getWindow :: String -> IO Window -getDialog :: String -> IO Dialog -getColorSelectionDialog :: String -> IO ColorSelectionDialog -getFileSelection :: String -> IO FileSelection -getFontSelectionDialog :: String -> IO FontSelectionDialog -getInputDialog :: String -> IO InputDialog -getMessageDialog :: String -> IO MessageDialog -getEventBox :: String -> IO EventBox -getHandleBox :: String -> IO HandleBox -getScrolledWindow :: String -> IO ScrolledWindow -getViewport :: String -> IO Viewport -getBox :: String -> IO Box -getButtonBox :: String -> IO ButtonBox -getHButtonBox :: String -> IO HButtonBox -getVButtonBox :: String -> IO VButtonBox -getVBox :: String -> IO VBox -getColorSelection :: String -> IO ColorSelection -getFontSelection :: String -> IO FontSelection -getGammaCurve :: String -> IO GammaCurve -getHBox :: String -> IO HBox -getCombo :: String -> IO Combo -getStatusbar :: String -> IO Statusbar -getCList :: String -> IO CList -getCTree :: String -> IO CTree -getFixed :: String -> IO Fixed -getPaned :: String -> IO Paned -getHPaned :: String -> IO HPaned -getVPaned :: String -> IO VPaned -getLayout :: String -> IO Layout -getList :: String -> IO List -getMenuShell :: String -> IO MenuShell -getMenu :: String -> IO Menu -getMenuBar :: String -> IO MenuBar -getNotebook :: String -> IO Notebook -getTable :: String -> IO Table -getTextView :: String -> IO TextView -getToolbar :: String -> IO Toolbar -getTreeView :: String -> IO TreeView -getCalendar :: String -> IO Calendar -getDrawingArea :: String -> IO DrawingArea -getCurve :: String -> IO Curve -getEntry :: String -> IO Entry -getSpinButton :: String -> IO SpinButton -getRuler :: String -> IO Ruler -getHRuler :: String -> IO HRuler -getVRuler :: String -> IO VRuler -getRange :: String -> IO Range -getScale :: String -> IO Scale -getHScale :: String -> IO HScale -getVScale :: String -> IO VScale -getScrollbar :: String -> IO Scrollbar -getHScrollbar :: String -> IO HScrollbar -getVScrollbar :: String -> IO VScrollbar -getSeparator :: String -> IO Separator -getHSeparator :: String -> IO HSeparator -getVSeparator :: String -> IO VSeparator -getInvisible :: String -> IO Invisible -getPreview :: String -> IO Preview -getProgressBar :: String -> IO ProgressBar - -module Graphics.UI.Gtk.MozEmbed -data MozEmbed -instance BinClass MozEmbed -instance ContainerClass MozEmbed -instance GObjectClass MozEmbed -instance MozEmbedClass MozEmbed -instance ObjectClass MozEmbed -instance WidgetClass MozEmbed -mozEmbedNew :: IO MozEmbed -mozEmbedSetCompPath :: String -> IO () -mozEmbedDefaultCompPath :: String -mozEmbedSetProfilePath :: FilePath -> String -> IO () -mozEmbedPushStartup :: IO () -mozEmbedPopStartup :: IO () -mozEmbedLoadUrl :: MozEmbed -> String -> IO () -mozEmbedStopLoad :: MozEmbed -> IO () -mozEmbedRenderData :: MozEmbed -> String -> String -> String -> IO () -mozEmbedOpenStream :: MozEmbed -> String -> String -> IO () -mozEmbedAppendData :: MozEmbed -> String -> IO () -mozEmbedCloseStream :: MozEmbed -> IO () -mozEmbedGoBack :: MozEmbed -> IO () -mozEmbedGoForward :: MozEmbed -> IO () -mozEmbedCanGoBack :: MozEmbed -> IO Bool -mozEmbedCanGoForward :: MozEmbed -> IO Bool -mozEmbedGetTitle :: MozEmbed -> IO String -mozEmbedGetLocation :: MozEmbed -> IO String -mozEmbedGetLinkMessage :: MozEmbed -> IO String -mozEmbedGetJsStatus :: MozEmbed -> IO String -onOpenURI :: MozEmbed -> (String -> IO Bool) -> IO (ConnectId MozEmbed) -onKeyDown :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onKeyPress :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onKeyUp :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onMouseDown :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onMouseUp :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onMouseClick :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onMouseDoubleClick :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onMouseOver :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) -onMouseOut :: MozEmbed -> (Ptr a -> IO Int) -> IO (ConnectId MozEmbed) - -module Graphics.UI.Gtk.Multiline.TextView -data TextView -instance ContainerClass TextView -instance GObjectClass TextView -instance ObjectClass TextView -instance TextViewClass TextView -instance WidgetClass TextView -class ContainerClass o => TextViewClass o -instance TextViewClass SourceView -instance TextViewClass TextView -data TextChildAnchor -instance GObjectClass TextChildAnchor -instance TextChildAnchorClass TextChildAnchor -class GObjectClass o => TextChildAnchorClass o -instance TextChildAnchorClass TextChildAnchor -castToTextView :: GObjectClass obj => obj -> TextView -toTextView :: TextViewClass o => o -> TextView -data DeleteType -DeleteChars :: DeleteType -DeleteWordEnds :: DeleteType -DeleteWords :: DeleteType -DeleteDisplayLines :: DeleteType -DeleteDisplayLineEnds :: DeleteType -DeleteParagraphEnds :: DeleteType -DeleteParagraphs :: DeleteType -DeleteWhitespace :: DeleteType -instance Enum DeleteType -instance Eq DeleteType -data DirectionType -DirTabForward :: DirectionType -DirTabBackward :: DirectionType -DirUp :: DirectionType -DirDown :: DirectionType -DirLeft :: DirectionType -DirRight :: DirectionType -instance Enum DirectionType -instance Eq DirectionType -data Justification -JustifyLeft :: Justification -JustifyRight :: Justification -JustifyCenter :: Justification -JustifyFill :: Justification -instance Enum Justification -instance Eq Justification -data MovementStep -MovementLogicalPositions :: MovementStep -MovementVisualPositions :: MovementStep -MovementWords :: MovementStep -MovementDisplayLines :: MovementStep -MovementDisplayLineEnds :: MovementStep -MovementParagraphs :: MovementStep -MovementParagraphEnds :: MovementStep -MovementPages :: MovementStep -MovementBufferEnds :: MovementStep -MovementHorizontalPages :: MovementStep -instance Enum MovementStep -instance Eq MovementStep -data TextWindowType -TextWindowPrivate :: TextWindowType -TextWindowWidget :: TextWindowType -TextWindowText :: TextWindowType -TextWindowLeft :: TextWindowType -TextWindowRight :: TextWindowType -TextWindowTop :: TextWindowType -TextWindowBottom :: TextWindowType -instance Enum TextWindowType -instance Eq TextWindowType -data WrapMode -WrapNone :: WrapMode -WrapChar :: WrapMode -WrapWord :: WrapMode -WrapWordChar :: WrapMode -instance Enum WrapMode -instance Eq WrapMode -textViewNew :: IO TextView -textViewNewWithBuffer :: TextBufferClass buffer => buffer -> IO TextView -textViewSetBuffer :: (TextViewClass self, TextBufferClass buffer) => self -> buffer -> IO () -textViewGetBuffer :: TextViewClass self => self -> IO TextBuffer -textViewScrollToMark :: (TextViewClass self, TextMarkClass mark) => self -> mark -> Double -> Maybe (Double, Double) -> IO () -textViewScrollToIter :: TextViewClass self => self -> TextIter -> Double -> Maybe (Double, Double) -> IO Bool -textViewScrollMarkOnscreen :: (TextViewClass self, TextMarkClass mark) => self -> mark -> IO () -textViewMoveMarkOnscreen :: (TextViewClass self, TextMarkClass mark) => self -> mark -> IO Bool -textViewPlaceCursorOnscreen :: TextViewClass self => self -> IO Bool -textViewGetLineAtY :: TextViewClass self => self -> Int -> IO (TextIter, Int) -textViewGetLineYrange :: TextViewClass self => self -> TextIter -> IO (Int, Int) -textViewGetIterAtLocation :: TextViewClass self => self -> Int -> Int -> IO TextIter -textViewBufferToWindowCoords :: TextViewClass self => self -> TextWindowType -> (Int, Int) -> IO (Int, Int) -textViewWindowToBufferCoords :: TextViewClass self => self -> TextWindowType -> (Int, Int) -> IO (Int, Int) -textViewGetWindow :: TextViewClass self => self -> TextWindowType -> IO (Maybe DrawWindow) -textViewGetWindowType :: TextViewClass self => self -> DrawWindow -> IO TextWindowType -textViewSetBorderWindowSize :: TextViewClass self => self -> TextWindowType -> Int -> IO () -textViewGetBorderWindowSize :: TextViewClass self => self -> TextWindowType -> IO Int -textViewForwardDisplayLine :: TextViewClass self => self -> TextIter -> IO Bool -textViewBackwardDisplayLine :: TextViewClass self => self -> TextIter -> IO Bool -textViewForwardDisplayLineEnd :: TextViewClass self => self -> TextIter -> IO Bool -textViewBackwardDisplayLineStart :: TextViewClass self => self -> TextIter -> IO Bool -textViewStartsDisplayLine :: TextViewClass self => self -> TextIter -> IO Bool -textViewMoveVisually :: TextViewClass self => self -> TextIter -> Int -> IO Bool -textViewAddChildAtAnchor :: (TextViewClass self, WidgetClass child) => self -> child -> TextChildAnchor -> IO () -textChildAnchorNew :: IO TextChildAnchor -textChildAnchorGetWidgets :: TextChildAnchor -> IO [Widget] -textChildAnchorGetDeleted :: TextChildAnchor -> IO Bool -textViewAddChildInWindow :: (TextViewClass self, WidgetClass child) => self -> child -> TextWindowType -> Int -> Int -> IO () -textViewMoveChild :: (TextViewClass self, WidgetClass child) => self -> child -> Int -> Int -> IO () -textViewSetWrapMode :: TextViewClass self => self -> WrapMode -> IO () -textViewGetWrapMode :: TextViewClass self => self -> IO WrapMode -textViewSetEditable :: TextViewClass self => self -> Bool -> IO () -textViewGetEditable :: TextViewClass self => self -> IO Bool -textViewSetCursorVisible :: TextViewClass self => self -> Bool -> IO () -textViewGetCursorVisible :: TextViewClass self => self -> IO Bool -textViewSetPixelsAboveLines :: TextViewClass self => self -> Int -> IO () -textViewGetPixelsAboveLines :: TextViewClass self => self -> IO Int -textViewSetPixelsBelowLines :: TextViewClass self => self -> Int -> IO () -textViewGetPixelsBelowLines :: TextViewClass self => self -> IO Int -textViewSetPixelsInsideWrap :: TextViewClass self => self -> Int -> IO () -textViewGetPixelsInsideWrap :: TextViewClass self => self -> IO Int -textViewSetJustification :: TextViewClass self => self -> Justification -> IO () -textViewGetJustification :: TextViewClass self => self -> IO Justification -textViewSetLeftMargin :: TextViewClass self => self -> Int -> IO () -textViewGetLeftMargin :: TextViewClass self => self -> IO Int -textViewSetRightMargin :: TextViewClass self => self -> Int -> IO () -textViewGetRightMargin :: TextViewClass self => self -> IO Int -textViewSetIndent :: TextViewClass self => self -> Int -> IO () -textViewGetIndent :: TextViewClass self => self -> IO Int -textViewGetDefaultAttributes :: TextViewClass self => self -> IO TextAttributes -textViewGetVisibleRect :: TextViewClass self => self -> IO Rectangle -textViewGetIterLocation :: TextViewClass self => self -> TextIter -> IO Rectangle -textViewGetIterAtPosition :: TextViewClass self => self -> Int -> Int -> IO (TextIter, Int) -textViewSetOverwrite :: TextViewClass self => self -> Bool -> IO () -textViewGetOverwrite :: TextViewClass self => self -> IO Bool -textViewSetAcceptsTab :: TextViewClass self => self -> Bool -> IO () -textViewGetAcceptsTab :: TextViewClass self => self -> IO Bool -textViewPixelsAboveLines :: TextViewClass self => Attr self Int -textViewPixelsBelowLines :: TextViewClass self => Attr self Int -textViewPixelsInsideWrap :: TextViewClass self => Attr self Int -textViewEditable :: TextViewClass self => Attr self Bool -textViewWrapMode :: TextViewClass self => Attr self WrapMode -textViewJustification :: TextViewClass self => Attr self Justification -textViewLeftMargin :: TextViewClass self => Attr self Int -textViewRightMargin :: TextViewClass self => Attr self Int -textViewIndent :: TextViewClass self => Attr self Int -textViewCursorVisible :: TextViewClass self => Attr self Bool -textViewBuffer :: TextViewClass self => Attr self TextBuffer -textViewOverwrite :: TextViewClass self => Attr self Bool -textViewAcceptsTab :: TextViewClass self => Attr self Bool -onCopyClipboard :: TextViewClass self => self -> IO () -> IO (ConnectId self) -afterCopyClipboard :: TextViewClass self => self -> IO () -> IO (ConnectId self) -onCutClipboard :: TextViewClass self => self -> IO () -> IO (ConnectId self) -afterCutClipboard :: TextViewClass self => self -> IO () -> IO (ConnectId self) -onDeleteFromCursor :: TextViewClass self => self -> (DeleteType -> Int -> IO ()) -> IO (ConnectId self) -afterDeleteFromCursor :: TextViewClass self => self -> (DeleteType -> Int -> IO ()) -> IO (ConnectId self) -onInsertAtCursor :: TextViewClass self => self -> (String -> IO ()) -> IO (ConnectId self) -afterInsertAtCursor :: TextViewClass self => self -> (String -> IO ()) -> IO (ConnectId self) -onMoveCursor :: TextViewClass self => self -> (MovementStep -> Int -> Bool -> IO ()) -> IO (ConnectId self) -afterMoveCursor :: TextViewClass self => self -> (MovementStep -> Int -> Bool -> IO ()) -> IO (ConnectId self) -onMoveFocus :: TextViewClass self => self -> (DirectionType -> IO ()) -> IO (ConnectId self) -afterMoveFocus :: TextViewClass self => self -> (DirectionType -> IO ()) -> IO (ConnectId self) -onPageHorizontally :: TextViewClass self => self -> (Int -> Bool -> IO ()) -> IO (ConnectId self) -afterPageHorizontally :: TextViewClass self => self -> (Int -> Bool -> IO ()) -> IO (ConnectId self) -onPasteClipboard :: TextViewClass self => self -> IO () -> IO (ConnectId self) -afterPasteClipboard :: TextViewClass self => self -> IO () -> IO (ConnectId self) -onPopulatePopup :: TextViewClass self => self -> (Menu -> IO ()) -> IO (ConnectId self) -afterPopulatePopup :: TextViewClass self => self -> (Menu -> IO ()) -> IO (ConnectId self) -onSetAnchor :: TextViewClass self => self -> IO () -> IO (ConnectId self) -afterSetAnchor :: TextViewClass self => self -> IO () -> IO (ConnectId self) -onSetScrollAdjustments :: TextViewClass self => self -> (Adjustment -> Adjustment -> IO ()) -> IO (ConnectId self) -afterSetScrollAdjustments :: TextViewClass self => self -> (Adjustment -> Adjustment -> IO ()) -> IO (ConnectId self) -onToggleOverwrite :: TextViewClass self => self -> IO () -> IO (ConnectId self) -afterToggleOverwrite :: TextViewClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Ornaments.Frame -data Frame -instance BinClass Frame -instance ContainerClass Frame -instance FrameClass Frame -instance GObjectClass Frame -instance ObjectClass Frame -instance WidgetClass Frame -class BinClass o => FrameClass o -instance FrameClass AspectFrame -instance FrameClass Frame -castToFrame :: GObjectClass obj => obj -> Frame -toFrame :: FrameClass o => o -> Frame -frameNew :: IO Frame -frameSetLabel :: FrameClass self => self -> String -> IO () -frameGetLabel :: FrameClass self => self -> IO String -frameSetLabelWidget :: (FrameClass self, WidgetClass labelWidget) => self -> labelWidget -> IO () -frameGetLabelWidget :: FrameClass self => self -> IO (Maybe Widget) -frameSetLabelAlign :: FrameClass self => self -> Float -> Float -> IO () -frameGetLabelAlign :: FrameClass self => self -> IO (Float, Float) -data ShadowType -ShadowNone :: ShadowType -ShadowIn :: ShadowType -ShadowOut :: ShadowType -ShadowEtchedIn :: ShadowType -ShadowEtchedOut :: ShadowType -instance Enum ShadowType -instance Eq ShadowType -frameSetShadowType :: FrameClass self => self -> ShadowType -> IO () -frameGetShadowType :: FrameClass self => self -> IO ShadowType -frameLabel :: FrameClass self => Attr self String -frameLabelXAlign :: FrameClass self => Attr self Float -frameLabelYAlign :: FrameClass self => Attr self Float -frameShadowType :: FrameClass self => Attr self ShadowType -frameLabelWidget :: (FrameClass self, WidgetClass labelWidget) => ReadWriteAttr self (Maybe Widget) labelWidget - -module Graphics.UI.Gtk.Ornaments.HSeparator -data HSeparator -instance GObjectClass HSeparator -instance HSeparatorClass HSeparator -instance ObjectClass HSeparator -instance SeparatorClass HSeparator -instance WidgetClass HSeparator -class SeparatorClass o => HSeparatorClass o -instance HSeparatorClass HSeparator -castToHSeparator :: GObjectClass obj => obj -> HSeparator -toHSeparator :: HSeparatorClass o => o -> HSeparator -hSeparatorNew :: IO HSeparator - -module Graphics.UI.Gtk.Ornaments.VSeparator -data VSeparator -instance GObjectClass VSeparator -instance ObjectClass VSeparator -instance SeparatorClass VSeparator -instance VSeparatorClass VSeparator -instance WidgetClass VSeparator -class SeparatorClass o => VSeparatorClass o -instance VSeparatorClass VSeparator -castToVSeparator :: GObjectClass obj => obj -> VSeparator -toVSeparator :: VSeparatorClass o => o -> VSeparator -vSeparatorNew :: IO VSeparator - -module Graphics.UI.Gtk.Scrolling.HScrollbar -data HScrollbar -instance GObjectClass HScrollbar -instance HScrollbarClass HScrollbar -instance ObjectClass HScrollbar -instance RangeClass HScrollbar -instance ScrollbarClass HScrollbar -instance WidgetClass HScrollbar -class ScrollbarClass o => HScrollbarClass o -instance HScrollbarClass HScrollbar -castToHScrollbar :: GObjectClass obj => obj -> HScrollbar -toHScrollbar :: HScrollbarClass o => o -> HScrollbar -hScrollbarNew :: Adjustment -> IO HScrollbar -hScrollbarNewDefaults :: IO HScrollbar - -module Graphics.UI.Gtk.Scrolling.ScrolledWindow -data ScrolledWindow -instance BinClass ScrolledWindow -instance ContainerClass ScrolledWindow -instance GObjectClass ScrolledWindow -instance ObjectClass ScrolledWindow -instance ScrolledWindowClass ScrolledWindow -instance WidgetClass ScrolledWindow -class BinClass o => ScrolledWindowClass o -instance ScrolledWindowClass ScrolledWindow -castToScrolledWindow :: GObjectClass obj => obj -> ScrolledWindow -toScrolledWindow :: ScrolledWindowClass o => o -> ScrolledWindow -scrolledWindowNew :: Maybe Adjustment -> Maybe Adjustment -> IO ScrolledWindow -scrolledWindowGetHAdjustment :: ScrolledWindowClass self => self -> IO Adjustment -scrolledWindowGetVAdjustment :: ScrolledWindowClass self => self -> IO Adjustment -data PolicyType -PolicyAlways :: PolicyType -PolicyAutomatic :: PolicyType -PolicyNever :: PolicyType -instance Enum PolicyType -instance Eq PolicyType -scrolledWindowSetPolicy :: ScrolledWindowClass self => self -> PolicyType -> PolicyType -> IO () -scrolledWindowGetPolicy :: ScrolledWindowClass self => self -> IO (PolicyType, PolicyType) -scrolledWindowAddWithViewport :: (ScrolledWindowClass self, WidgetClass child) => self -> child -> IO () -data CornerType -CornerTopLeft :: CornerType -CornerBottomLeft :: CornerType -CornerTopRight :: CornerType -CornerBottomRight :: CornerType -instance Enum CornerType -instance Eq CornerType -scrolledWindowSetPlacement :: ScrolledWindowClass self => self -> CornerType -> IO () -scrolledWindowGetPlacement :: ScrolledWindowClass self => self -> IO CornerType -data ShadowType -ShadowNone :: ShadowType -ShadowIn :: ShadowType -ShadowOut :: ShadowType -ShadowEtchedIn :: ShadowType -ShadowEtchedOut :: ShadowType -instance Enum ShadowType -instance Eq ShadowType -scrolledWindowSetShadowType :: ScrolledWindowClass self => self -> ShadowType -> IO () -scrolledWindowGetShadowType :: ScrolledWindowClass self => self -> IO ShadowType -scrolledWindowSetHAdjustment :: ScrolledWindowClass self => self -> Adjustment -> IO () -scrolledWindowSetVAdjustment :: ScrolledWindowClass self => self -> Adjustment -> IO () -scrolledWindowGetHScrollbar :: ScrolledWindowClass self => self -> IO (Maybe HScrollbar) -scrolledWindowGetVScrollbar :: ScrolledWindowClass self => self -> IO (Maybe VScrollbar) -scrolledWindowHAdjustment :: ScrolledWindowClass self => Attr self Adjustment -scrolledWindowVAdjustment :: ScrolledWindowClass self => Attr self Adjustment -scrolledWindowHscrollbarPolicy :: ScrolledWindowClass self => Attr self PolicyType -scrolledWindowVscrollbarPolicy :: ScrolledWindowClass self => Attr self PolicyType -scrolledWindowWindowPlacement :: ScrolledWindowClass self => Attr self CornerType -scrolledWindowShadowType :: ScrolledWindowClass self => Attr self ShadowType -scrolledWindowPlacement :: ScrolledWindowClass self => Attr self CornerType - -module Graphics.UI.Gtk.Scrolling.VScrollbar -data VScrollbar -instance GObjectClass VScrollbar -instance ObjectClass VScrollbar -instance RangeClass VScrollbar -instance ScrollbarClass VScrollbar -instance VScrollbarClass VScrollbar -instance WidgetClass VScrollbar -class ScrollbarClass o => VScrollbarClass o -instance VScrollbarClass VScrollbar -castToVScrollbar :: GObjectClass obj => obj -> VScrollbar -toVScrollbar :: VScrollbarClass o => o -> VScrollbar -vScrollbarNew :: Adjustment -> IO VScrollbar -vScrollbarNewDefaults :: IO VScrollbar - -module Graphics.UI.Gtk.Selectors.ColorButton -data ColorButton -instance BinClass ColorButton -instance ButtonClass ColorButton -instance ColorButtonClass ColorButton -instance ContainerClass ColorButton -instance GObjectClass ColorButton -instance ObjectClass ColorButton -instance WidgetClass ColorButton -class ButtonClass o => ColorButtonClass o -instance ColorButtonClass ColorButton -castToColorButton :: GObjectClass obj => obj -> ColorButton -toColorButton :: ColorButtonClass o => o -> ColorButton -colorButtonNew :: IO ColorButton -colorButtonNewWithColor :: Color -> IO ColorButton -colorButtonSetColor :: ColorButtonClass self => self -> Color -> IO () -colorButtonGetColor :: ColorButtonClass self => self -> IO Color -colorButtonSetAlpha :: ColorButtonClass self => self -> Word16 -> IO () -colorButtonGetAlpha :: ColorButtonClass self => self -> IO Word16 -colorButtonSetUseAlpha :: ColorButtonClass self => self -> Bool -> IO () -colorButtonGetUseAlpha :: ColorButtonClass self => self -> IO Bool -colorButtonSetTitle :: ColorButtonClass self => self -> String -> IO () -colorButtonGetTitle :: ColorButtonClass self => self -> IO String -colorButtonUseAlpha :: ColorButtonClass self => Attr self Bool -colorButtonTitle :: ColorButtonClass self => Attr self String -colorButtonAlpha :: ColorButtonClass self => Attr self Word16 -onColorSet :: ColorButtonClass self => self -> IO () -> IO (ConnectId self) -afterColorSet :: ColorButtonClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Selectors.ColorSelection -data ColorSelection -instance BoxClass ColorSelection -instance ColorSelectionClass ColorSelection -instance ContainerClass ColorSelection -instance GObjectClass ColorSelection -instance ObjectClass ColorSelection -instance VBoxClass ColorSelection -instance WidgetClass ColorSelection -class VBoxClass o => ColorSelectionClass o -instance ColorSelectionClass ColorSelection -castToColorSelection :: GObjectClass obj => obj -> ColorSelection -toColorSelection :: ColorSelectionClass o => o -> ColorSelection -colorSelectionNew :: IO ColorSelection -colorSelectionGetCurrentAlpha :: ColorSelectionClass self => self -> IO Int -colorSelectionSetCurrentAlpha :: ColorSelectionClass self => self -> Int -> IO () -colorSelectionGetCurrentColor :: ColorSelectionClass self => self -> IO Color -colorSelectionSetCurrentColor :: ColorSelectionClass self => self -> Color -> IO () -colorSelectionGetHasOpacityControl :: ColorSelectionClass self => self -> IO Bool -colorSelectionSetHasOpacityControl :: ColorSelectionClass self => self -> Bool -> IO () -colorSelectionGetHasPalette :: ColorSelectionClass self => self -> IO Bool -colorSelectionSetHasPalette :: ColorSelectionClass self => self -> Bool -> IO () -colorSelectionGetPreviousAlpha :: ColorSelectionClass self => self -> IO Int -colorSelectionSetPreviousAlpha :: ColorSelectionClass self => self -> Int -> IO () -colorSelectionGetPreviousColor :: ColorSelectionClass self => self -> IO Color -colorSelectionSetPreviousColor :: ColorSelectionClass self => self -> Color -> IO () -colorSelectionIsAdjusting :: ColorSelectionClass self => self -> IO Bool -colorSelectionHasOpacityControl :: ColorSelectionClass self => Attr self Bool -colorSelectionHasPalette :: ColorSelectionClass self => Attr self Bool -colorSelectionCurrentAlpha :: ColorSelectionClass self => Attr self Int -colorSelectionPreviousAlpha :: ColorSelectionClass self => Attr self Int - -module Graphics.UI.Gtk.Selectors.ColorSelectionDialog -data ColorSelectionDialog -instance BinClass ColorSelectionDialog -instance ColorSelectionDialogClass ColorSelectionDialog -instance ContainerClass ColorSelectionDialog -instance DialogClass ColorSelectionDialog -instance GObjectClass ColorSelectionDialog -instance ObjectClass ColorSelectionDialog -instance WidgetClass ColorSelectionDialog -instance WindowClass ColorSelectionDialog -class DialogClass o => ColorSelectionDialogClass o -instance ColorSelectionDialogClass ColorSelectionDialog -castToColorSelectionDialog :: GObjectClass obj => obj -> ColorSelectionDialog -toColorSelectionDialog :: ColorSelectionDialogClass o => o -> ColorSelectionDialog -colorSelectionDialogNew :: String -> IO ColorSelectionDialog - -module Graphics.UI.Gtk.Selectors.FileChooser -data FileChooser -instance FileChooserClass FileChooser -instance GObjectClass FileChooser -class GObjectClass o => FileChooserClass o -instance FileChooserClass FileChooser -instance FileChooserClass FileChooserButton -instance FileChooserClass FileChooserDialog -instance FileChooserClass FileChooserWidget -castToFileChooser :: GObjectClass obj => obj -> FileChooser -toFileChooser :: FileChooserClass o => o -> FileChooser -data FileChooserAction -FileChooserActionOpen :: FileChooserAction -FileChooserActionSave :: FileChooserAction -FileChooserActionSelectFolder :: FileChooserAction -FileChooserActionCreateFolder :: FileChooserAction -instance Enum FileChooserAction -data FileChooserError -FileChooserErrorNonexistent :: FileChooserError -FileChooserErrorBadFilename :: FileChooserError -instance Enum FileChooserError -instance GErrorClass FileChooserError -data FileChooserConfirmation -FileChooserConfirmationConfirm :: FileChooserConfirmation -FileChooserConfirmationAcceptFilename :: FileChooserConfirmation -FileChooserConfirmationSelectAgain :: FileChooserConfirmation -instance Enum FileChooserConfirmation -fileChooserSetAction :: FileChooserClass self => self -> FileChooserAction -> IO () -fileChooserGetAction :: FileChooserClass self => self -> IO FileChooserAction -fileChooserSetLocalOnly :: FileChooserClass self => self -> Bool -> IO () -fileChooserGetLocalOnly :: FileChooserClass self => self -> IO Bool -fileChooserSetSelectMultiple :: FileChooserClass self => self -> Bool -> IO () -fileChooserGetSelectMultiple :: FileChooserClass self => self -> IO Bool -fileChooserSetCurrentName :: FileChooserClass self => self -> FilePath -> IO () -fileChooserGetFilename :: FileChooserClass self => self -> IO (Maybe FilePath) -fileChooserSetFilename :: FileChooserClass self => self -> FilePath -> IO Bool -fileChooserSelectFilename :: FileChooserClass self => self -> FilePath -> IO Bool -fileChooserUnselectFilename :: FileChooserClass self => self -> FilePath -> IO () -fileChooserSelectAll :: FileChooserClass self => self -> IO () -fileChooserUnselectAll :: FileChooserClass self => self -> IO () -fileChooserGetFilenames :: FileChooserClass self => self -> IO [FilePath] -fileChooserSetCurrentFolder :: FileChooserClass self => self -> FilePath -> IO Bool -fileChooserGetCurrentFolder :: FileChooserClass self => self -> IO (Maybe FilePath) -fileChooserGetURI :: FileChooserClass self => self -> IO (Maybe String) -fileChooserSetURI :: FileChooserClass self => self -> String -> IO Bool -fileChooserSelectURI :: FileChooserClass self => self -> String -> IO Bool -fileChooserUnselectURI :: FileChooserClass self => self -> String -> IO () -fileChooserGetURIs :: FileChooserClass self => self -> IO [String] -fileChooserSetCurrentFolderURI :: FileChooserClass self => self -> String -> IO Bool -fileChooserGetCurrentFolderURI :: FileChooserClass self => self -> IO String -fileChooserSetPreviewWidget :: (FileChooserClass self, WidgetClass previewWidget) => self -> previewWidget -> IO () -fileChooserGetPreviewWidget :: FileChooserClass self => self -> IO (Maybe Widget) -fileChooserSetPreviewWidgetActive :: FileChooserClass self => self -> Bool -> IO () -fileChooserGetPreviewWidgetActive :: FileChooserClass self => self -> IO Bool -fileChooserSetUsePreviewLabel :: FileChooserClass self => self -> Bool -> IO () -fileChooserGetUsePreviewLabel :: FileChooserClass self => self -> IO Bool -fileChooserGetPreviewFilename :: FileChooserClass self => self -> IO (Maybe FilePath) -fileChooserGetPreviewURI :: FileChooserClass self => self -> IO (Maybe String) -fileChooserSetExtraWidget :: (FileChooserClass self, WidgetClass extraWidget) => self -> extraWidget -> IO () -fileChooserGetExtraWidget :: FileChooserClass self => self -> IO (Maybe Widget) -fileChooserAddFilter :: FileChooserClass self => self -> FileFilter -> IO () -fileChooserRemoveFilter :: FileChooserClass self => self -> FileFilter -> IO () -fileChooserListFilters :: FileChooserClass self => self -> IO [FileFilter] -fileChooserSetFilter :: FileChooserClass self => self -> FileFilter -> IO () -fileChooserGetFilter :: FileChooserClass self => self -> IO (Maybe FileFilter) -fileChooserAddShortcutFolder :: FileChooserClass self => self -> FilePath -> IO () -fileChooserRemoveShortcutFolder :: FileChooserClass self => self -> FilePath -> IO () -fileChooserListShortcutFolders :: FileChooserClass self => self -> IO [String] -fileChooserAddShortcutFolderURI :: FileChooserClass self => self -> String -> IO () -fileChooserRemoveShortcutFolderURI :: FileChooserClass self => self -> String -> IO () -fileChooserListShortcutFolderURIs :: FileChooserClass self => self -> IO [String] -fileChooserErrorDomain :: GErrorDomain -fileChooserSetShowHidden :: FileChooserClass self => self -> Bool -> IO () -fileChooserGetShowHidden :: FileChooserClass self => self -> IO Bool -fileChooserSetDoOverwriteConfirmation :: FileChooserClass self => self -> Bool -> IO () -fileChooserGetDoOverwriteConfirmation :: FileChooserClass self => self -> IO Bool -fileChooserUsePreviewLabel :: FileChooserClass self => Attr self Bool -fileChooserShowHidden :: FileChooserClass self => Attr self Bool -fileChooserSelectMultiple :: FileChooserClass self => Attr self Bool -fileChooserPreviewWidgetActive :: FileChooserClass self => Attr self Bool -fileChooserPreviewWidget :: (FileChooserClass self, WidgetClass previewWidget) => ReadWriteAttr self (Maybe Widget) previewWidget -fileChooserLocalOnly :: FileChooserClass self => Attr self Bool -fileChooserFilter :: FileChooserClass self => ReadWriteAttr self (Maybe FileFilter) FileFilter -fileChooserExtraWidget :: (FileChooserClass self, WidgetClass extraWidget) => ReadWriteAttr self (Maybe Widget) extraWidget -fileChooserDoOverwriteConfirmation :: FileChooserClass self => Attr self Bool -fileChooserAction :: FileChooserClass self => Attr self FileChooserAction -onCurrentFolderChanged :: FileChooserClass self => self -> IO () -> IO (ConnectId self) -afterCurrentFolderChanged :: FileChooserClass self => self -> IO () -> IO (ConnectId self) -onFileActivated :: FileChooserClass self => self -> IO () -> IO (ConnectId self) -afterFileActivated :: FileChooserClass self => self -> IO () -> IO (ConnectId self) -onUpdatePreview :: FileChooserClass self => self -> IO () -> IO (ConnectId self) -afterUpdatePreview :: FileChooserClass self => self -> IO () -> IO (ConnectId self) -onConfirmOverwrite :: FileChooserClass self => self -> IO FileChooserConfirmation -> IO (ConnectId self) -afterConfirmOverwrite :: FileChooserClass self => self -> IO FileChooserConfirmation -> IO (ConnectId self) - -module Graphics.UI.Gtk.Selectors.FileChooserButton -data FileChooserButton -instance BoxClass FileChooserButton -instance ContainerClass FileChooserButton -instance FileChooserButtonClass FileChooserButton -instance FileChooserClass FileChooserButton -instance GObjectClass FileChooserButton -instance HBoxClass FileChooserButton -instance ObjectClass FileChooserButton -instance WidgetClass FileChooserButton -class HBoxClass o => FileChooserButtonClass o -instance FileChooserButtonClass FileChooserButton -castToFileChooserButton :: GObjectClass obj => obj -> FileChooserButton -toFileChooserButton :: FileChooserButtonClass o => o -> FileChooserButton -fileChooserButtonNew :: String -> FileChooserAction -> IO FileChooserButton -fileChooserButtonNewWithBackend :: String -> FileChooserAction -> String -> IO FileChooserButton -fileChooserButtonNewWithDialog :: FileChooserDialogClass dialog => dialog -> IO FileChooserButton -fileChooserButtonGetTitle :: FileChooserButtonClass self => self -> IO String -fileChooserButtonSetTitle :: FileChooserButtonClass self => self -> String -> IO () -fileChooserButtonGetWidthChars :: FileChooserButtonClass self => self -> IO Int -fileChooserButtonSetWidthChars :: FileChooserButtonClass self => self -> Int -> IO () -fileChooserButtonDialog :: (FileChooserButtonClass self, FileChooserDialogClass fileChooserDialog) => WriteAttr self fileChooserDialog -fileChooserButtonTitle :: FileChooserButtonClass self => Attr self String -fileChooserButtonWidthChars :: FileChooserButtonClass self => Attr self Int - -module Graphics.UI.Gtk.Selectors.FileChooserWidget -data FileChooserWidget -instance BoxClass FileChooserWidget -instance ContainerClass FileChooserWidget -instance FileChooserClass FileChooserWidget -instance FileChooserWidgetClass FileChooserWidget -instance GObjectClass FileChooserWidget -instance ObjectClass FileChooserWidget -instance VBoxClass FileChooserWidget -instance WidgetClass FileChooserWidget -class VBoxClass o => FileChooserWidgetClass o -instance FileChooserWidgetClass FileChooserWidget -castToFileChooserWidget :: GObjectClass obj => obj -> FileChooserWidget -toFileChooserWidget :: FileChooserWidgetClass o => o -> FileChooserWidget -data FileChooserAction -instance Enum FileChooserAction -fileChooserWidgetNew :: FileChooserAction -> IO FileChooserWidget -fileChooserWidgetNewWithBackend :: FileChooserAction -> String -> IO FileChooserWidget - -module Graphics.UI.Gtk.Selectors.FileFilter -data FileFilter -instance FileFilterClass FileFilter -instance GObjectClass FileFilter -instance ObjectClass FileFilter -class ObjectClass o => FileFilterClass o -instance FileFilterClass FileFilter -castToFileFilter :: GObjectClass obj => obj -> FileFilter -toFileFilter :: FileFilterClass o => o -> FileFilter -fileFilterNew :: IO FileFilter -fileFilterSetName :: FileFilter -> String -> IO () -fileFilterGetName :: FileFilter -> IO String -fileFilterAddMimeType :: FileFilter -> String -> IO () -fileFilterAddPattern :: FileFilter -> String -> IO () -fileFilterAddCustom :: FileFilter -> [FileFilterFlags] -> (Maybe String -> Maybe String -> Maybe String -> Maybe String -> IO Bool) -> IO () -fileFilterAddPixbufFormats :: FileFilter -> IO () -fileFilterName :: Attr FileFilter String - -module Graphics.UI.Gtk.Selectors.FileSelection -data FileSelection -instance BinClass FileSelection -instance ContainerClass FileSelection -instance DialogClass FileSelection -instance FileSelectionClass FileSelection -instance GObjectClass FileSelection -instance ObjectClass FileSelection -instance WidgetClass FileSelection -instance WindowClass FileSelection -class DialogClass o => FileSelectionClass o -instance FileSelectionClass FileSelection -castToFileSelection :: GObjectClass obj => obj -> FileSelection -toFileSelection :: FileSelectionClass o => o -> FileSelection -fileSelectionNew :: String -> IO FileSelection -fileSelectionSetFilename :: FileSelectionClass self => self -> String -> IO () -fileSelectionGetFilename :: FileSelectionClass self => self -> IO String -fileSelectionShowFileopButtons :: FileSelectionClass self => self -> IO () -fileSelectionHideFileopButtons :: FileSelectionClass self => self -> IO () -fileSelectionGetButtons :: FileSelectionClass fsel => fsel -> IO (Button, Button) -fileSelectionComplete :: FileSelectionClass self => self -> String -> IO () -fileSelectionGetSelections :: FileSelectionClass self => self -> IO [String] -fileSelectionSetSelectMultiple :: FileSelectionClass self => self -> Bool -> IO () -fileSelectionGetSelectMultiple :: FileSelectionClass self => self -> IO Bool -fileSelectionFilename :: FileSelectionClass self => Attr self String -fileSelectionShowFileops :: FileSelectionClass self => Attr self Bool -fileSelectionSelectMultiple :: FileSelectionClass self => Attr self Bool - -module Graphics.UI.Gtk.Selectors.FontButton -data FontButton -instance BinClass FontButton -instance ButtonClass FontButton -instance ContainerClass FontButton -instance FontButtonClass FontButton -instance GObjectClass FontButton -instance ObjectClass FontButton -instance WidgetClass FontButton -class ButtonClass o => FontButtonClass o -instance FontButtonClass FontButton -castToFontButton :: GObjectClass obj => obj -> FontButton -toFontButton :: FontButtonClass o => o -> FontButton -fontButtonNew :: IO FontButton -fontButtonNewWithFont :: String -> IO FontButton -fontButtonSetFontName :: FontButtonClass self => self -> String -> IO Bool -fontButtonGetFontName :: FontButtonClass self => self -> IO String -fontButtonSetShowStyle :: FontButtonClass self => self -> Bool -> IO () -fontButtonGetShowStyle :: FontButtonClass self => self -> IO Bool -fontButtonSetShowSize :: FontButtonClass self => self -> Bool -> IO () -fontButtonGetShowSize :: FontButtonClass self => self -> IO Bool -fontButtonSetUseFont :: FontButtonClass self => self -> Bool -> IO () -fontButtonGetUseFont :: FontButtonClass self => self -> IO Bool -fontButtonSetUseSize :: FontButtonClass self => self -> Bool -> IO () -fontButtonGetUseSize :: FontButtonClass self => self -> IO Bool -fontButtonSetTitle :: FontButtonClass self => self -> String -> IO () -fontButtonGetTitle :: FontButtonClass self => self -> IO String -fontButtonTitle :: FontButtonClass self => Attr self String -fontButtonFontName :: FontButtonClass self => Attr self String -fontButtonUseFont :: FontButtonClass self => Attr self Bool -fontButtonUseSize :: FontButtonClass self => Attr self Bool -fontButtonShowStyle :: FontButtonClass self => Attr self Bool -fontButtonShowSize :: FontButtonClass self => Attr self Bool -onFontSet :: FontButtonClass self => self -> IO () -> IO (ConnectId self) -afterFontSet :: FontButtonClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.Selectors.FontSelection -data FontSelection -instance BoxClass FontSelection -instance ContainerClass FontSelection -instance FontSelectionClass FontSelection -instance GObjectClass FontSelection -instance ObjectClass FontSelection -instance VBoxClass FontSelection -instance WidgetClass FontSelection -class VBoxClass o => FontSelectionClass o -instance FontSelectionClass FontSelection -castToFontSelection :: GObjectClass obj => obj -> FontSelection -toFontSelection :: FontSelectionClass o => o -> FontSelection -fontSelectionNew :: IO FontSelection -fontSelectionGetFontName :: FontSelectionClass self => self -> IO (Maybe String) -fontSelectionSetFontName :: FontSelectionClass self => self -> String -> IO Bool -fontSelectionGetPreviewText :: FontSelectionClass self => self -> IO String -fontSelectionSetPreviewText :: FontSelectionClass self => self -> String -> IO () -fontSelectionFontName :: FontSelectionClass self => Attr self String -fontSelectionPreviewText :: FontSelectionClass self => Attr self String - -module Graphics.UI.Gtk.Selectors.FontSelectionDialog -data FontSelectionDialog -instance BinClass FontSelectionDialog -instance ContainerClass FontSelectionDialog -instance DialogClass FontSelectionDialog -instance FontSelectionDialogClass FontSelectionDialog -instance GObjectClass FontSelectionDialog -instance ObjectClass FontSelectionDialog -instance WidgetClass FontSelectionDialog -instance WindowClass FontSelectionDialog -class DialogClass o => FontSelectionDialogClass o -instance FontSelectionDialogClass FontSelectionDialog -castToFontSelectionDialog :: GObjectClass obj => obj -> FontSelectionDialog -toFontSelectionDialog :: FontSelectionDialogClass o => o -> FontSelectionDialog -fontSelectionDialogNew :: String -> IO FontSelectionDialog -fontSelectionDialogGetFontName :: FontSelectionDialogClass self => self -> IO (Maybe String) -fontSelectionDialogSetFontName :: FontSelectionDialogClass self => self -> String -> IO Bool -fontSelectionDialogGetPreviewText :: FontSelectionDialogClass self => self -> IO String -fontSelectionDialogSetPreviewText :: FontSelectionDialogClass self => self -> String -> IO () -fontSelectionDialogPreviewText :: FontSelectionDialogClass self => Attr self String - -module Graphics.UI.Gtk.SourceView.SourceBuffer -data SourceBuffer -instance GObjectClass SourceBuffer -instance SourceBufferClass SourceBuffer -instance TextBufferClass SourceBuffer -class TextBufferClass o => SourceBufferClass o -instance SourceBufferClass SourceBuffer -castToSourceBuffer :: GObjectClass obj => obj -> SourceBuffer -sourceBufferNew :: Maybe SourceTagTable -> IO SourceBuffer -sourceBufferNewWithLanguage :: SourceLanguage -> IO SourceBuffer -sourceBufferSetCheckBrackets :: SourceBuffer -> Bool -> IO () -sourceBufferGetCheckBrackets :: SourceBuffer -> IO Bool -sourceBufferSetBracketsMatchStyle :: SourceBuffer -> SourceTagStyle -> IO () -sourceBufferSetHighlight :: SourceBuffer -> Bool -> IO () -sourceBufferGetHighlight :: SourceBuffer -> IO Bool -sourceBufferSetMaxUndoLevels :: SourceBuffer -> Int -> IO () -sourceBufferGetMaxUndoLevels :: SourceBuffer -> IO Int -sourceBufferSetLanguage :: SourceBuffer -> SourceLanguage -> IO () -sourceBufferGetLanguage :: SourceBuffer -> IO SourceLanguage -sourceBufferSetEscapeChar :: SourceBuffer -> Char -> IO () -sourceBufferGetEscapeChar :: SourceBuffer -> IO Char -sourceBufferCanUndo :: SourceBuffer -> IO Bool -sourceBufferCanRedo :: SourceBuffer -> IO Bool -sourceBufferUndo :: SourceBuffer -> IO () -sourceBufferRedo :: SourceBuffer -> IO () -sourceBufferBeginNotUndoableAction :: SourceBuffer -> IO () -sourceBufferEndNotUndoableAction :: SourceBuffer -> IO () -sourceBufferCreateMarker :: SourceBuffer -> String -> String -> TextIter -> IO SourceMarker -sourceBufferMoveMarker :: SourceBuffer -> SourceMarker -> TextIter -> IO () -sourceBufferDeleteMarker :: SourceBuffer -> SourceMarker -> IO () -sourceBufferGetMarker :: SourceBuffer -> String -> IO SourceMarker -sourceBufferGetMarkersInRegion :: SourceBuffer -> TextIter -> TextIter -> IO [SourceMarker] -sourceBufferGetFirstMarker :: SourceBuffer -> IO SourceMarker -sourceBufferGetLastMarker :: SourceBuffer -> IO SourceMarker -sourceBufferGetIterAtMarker :: SourceBuffer -> SourceMarker -> IO TextIter -sourceBufferGetNextMarker :: SourceBuffer -> TextIter -> IO (Maybe SourceMarker) -sourceBufferGetPrevMarker :: SourceBuffer -> TextIter -> IO (Maybe SourceMarker) - -module Graphics.UI.Gtk.SourceView.SourceIter -sourceIterForwardSearch :: TextIter -> String -> [SourceSearchFlags] -> Maybe TextIter -> IO (Maybe (TextIter, TextIter)) -sourceIterBackwardSearch :: TextIter -> String -> [SourceSearchFlags] -> Maybe TextIter -> IO (Maybe (TextIter, TextIter)) -sourceIterFindMatchingBracket :: TextIter -> IO Bool - -module Graphics.UI.Gtk.SourceView.SourceLanguage -data SourceLanguage -instance GObjectClass SourceLanguage -instance SourceLanguageClass SourceLanguage -castToSourceLanguage :: GObjectClass obj => obj -> SourceLanguage -sourceLanguageGetName :: SourceLanguage -> IO String -sourceLanguageGetSection :: SourceLanguage -> IO String -sourceLanguageGetTags :: SourceLanguage -> IO [SourceTag] -sourceLanguageGetEscapeChar :: SourceLanguage -> IO Char -sourceLanguageGetMimeTypes :: SourceLanguage -> IO [String] -sourceLanguageSetMimeTypes :: SourceLanguage -> [String] -> IO () -sourceLanguageGetStyleScheme :: SourceLanguage -> IO SourceStyleScheme -sourceLanguageSetStyleScheme :: SourceLanguage -> SourceStyleScheme -> IO () -sourceLanguageGetTagStyle :: SourceLanguage -> String -> IO SourceTagStyle -sourceLanguageSetTagStyle :: SourceLanguage -> String -> SourceTagStyle -> IO () -sourceLanguageGetTagDefaultStyle :: SourceLanguage -> String -> IO SourceTagStyle - -module Graphics.UI.Gtk.SourceView.SourceView -data SourceView -instance ContainerClass SourceView -instance GObjectClass SourceView -instance ObjectClass SourceView -instance SourceViewClass SourceView -instance TextViewClass SourceView -instance WidgetClass SourceView -class TextViewClass o => SourceViewClass o -instance SourceViewClass SourceView -castToSourceView :: GObjectClass obj => obj -> SourceView -sourceViewNew :: IO SourceView -sourceViewNewWithBuffer :: SourceBuffer -> IO SourceView -sourceViewSetShowLineNumbers :: SourceViewClass sv => sv -> Bool -> IO () -sourceViewGetShowLineNumbers :: SourceViewClass sv => sv -> IO Bool -sourceViewSetShowLineMarkers :: SourceViewClass sv => sv -> Bool -> IO () -sourceViewGetShowLineMarkers :: SourceViewClass sv => sv -> IO Bool -sourceViewSetTabsWidth :: SourceViewClass sv => sv -> Int -> IO () -sourceViewGetTabsWidth :: SourceViewClass sv => sv -> IO Int -sourceViewSetAutoIndent :: SourceViewClass sv => sv -> Bool -> IO () -sourceViewGetAutoIndent :: SourceViewClass sv => sv -> IO Bool -sourceViewSetInsertSpacesInsteadOfTabs :: SourceViewClass sv => sv -> Bool -> IO () -sourceViewGetInsertSpacesInsteadOfTabs :: SourceViewClass sv => sv -> IO Bool -sourceViewSetShowMargin :: SourceViewClass sv => sv -> Bool -> IO () -sourceViewGetShowMargin :: SourceViewClass sv => sv -> IO Bool -sourceViewSetMargin :: SourceViewClass sv => sv -> Int -> IO () -sourceViewGetMargin :: SourceViewClass sv => sv -> IO Int -sourceViewSetMarkerPixbuf :: SourceViewClass sv => sv -> String -> Pixbuf -> IO () -sourceViewGetMarkerPixbuf :: SourceViewClass sv => sv -> String -> IO Pixbuf -sourceViewSetSmartHomeEnd :: SourceViewClass sv => sv -> Bool -> IO () -sourceViewGetSmartHomeEnd :: SourceViewClass sv => sv -> IO Bool - -module Graphics.UI.Gtk.SourceView - -module Graphics.UI.Gtk.TreeList.CellRendererPixbuf -data CellRendererPixbuf -instance CellRendererClass CellRendererPixbuf -instance CellRendererPixbufClass CellRendererPixbuf -instance GObjectClass CellRendererPixbuf -instance ObjectClass CellRendererPixbuf -class CellRendererClass o => CellRendererPixbufClass o -instance CellRendererPixbufClass CellRendererPixbuf -castToCellRendererPixbuf :: GObjectClass obj => obj -> CellRendererPixbuf -toCellRendererPixbuf :: CellRendererPixbufClass o => o -> CellRendererPixbuf -cellRendererPixbufNew :: IO CellRendererPixbuf - -module Graphics.UI.Gtk.TreeList.CellRendererText -data CellRendererText -instance CellRendererClass CellRendererText -instance CellRendererTextClass CellRendererText -instance GObjectClass CellRendererText -instance ObjectClass CellRendererText -class CellRendererClass o => CellRendererTextClass o -instance CellRendererTextClass CellRendererText -castToCellRendererText :: GObjectClass obj => obj -> CellRendererText -toCellRendererText :: CellRendererTextClass o => o -> CellRendererText -cellRendererTextNew :: IO CellRendererText -cellText :: Attribute CellRendererText String -cellMarkup :: Attribute CellRendererText String -cellBackground :: Attribute CellRendererText (Maybe String) -cellForeground :: Attribute CellRendererText (Maybe String) -cellEditable :: Attribute CellRendererText (Maybe Bool) -onEdited :: TreeModelClass tm => CellRendererText -> tm -> (TreeIter -> String -> IO ()) -> IO (ConnectId CellRendererText) -afterEdited :: TreeModelClass tm => CellRendererText -> tm -> (TreeIter -> String -> IO ()) -> IO (ConnectId CellRendererText) - -module Graphics.UI.Gtk.TreeList.CellRendererToggle -data CellRendererToggle -instance CellRendererClass CellRendererToggle -instance CellRendererToggleClass CellRendererToggle -instance GObjectClass CellRendererToggle -instance ObjectClass CellRendererToggle -class CellRendererClass o => CellRendererToggleClass o -instance CellRendererToggleClass CellRendererToggle -castToCellRendererToggle :: GObjectClass obj => obj -> CellRendererToggle -toCellRendererToggle :: CellRendererToggleClass o => o -> CellRendererToggle -cellRendererToggleNew :: IO CellRendererToggle -cellRendererToggleGetRadio :: CellRendererToggleClass self => self -> IO Bool -cellRendererToggleSetRadio :: CellRendererToggleClass self => self -> Bool -> IO () -cellRendererToggleGetActive :: CellRendererToggleClass self => self -> IO Bool -cellRendererToggleSetActive :: CellRendererToggleClass self => self -> Bool -> IO () -cellActive :: Attribute CellRendererToggle Bool -cellRadio :: Attribute CellRendererToggle Bool - -module Graphics.UI.Gtk.TreeList.CellView -data CellView -instance CellViewClass CellView -instance GObjectClass CellView -instance ObjectClass CellView -instance WidgetClass CellView -class WidgetClass o => CellViewClass o -instance CellViewClass CellView -castToCellView :: GObjectClass obj => obj -> CellView -toCellView :: CellViewClass o => o -> CellView -cellViewNew :: IO CellView -cellViewNewWithMarkup :: String -> IO CellView -cellViewNewWithPixbuf :: Pixbuf -> IO CellView -cellViewNewWithText :: String -> IO CellView -cellViewSetModel :: (CellViewClass self, TreeModelClass model) => self -> Maybe model -> IO () -cellViewSetDisplayedRow :: CellViewClass self => self -> TreePath -> IO () -cellViewGetDisplayedRow :: CellViewClass self => self -> IO (Maybe TreePath) -cellViewGetSizeOfRow :: CellViewClass self => self -> TreePath -> IO Requisition -cellViewSetBackgroundColor :: CellViewClass self => self -> Color -> IO () -cellViewGetCellRenderers :: CellViewClass self => self -> IO [CellRenderer] -cellViewDisplayedRow :: CellViewClass self => ReadWriteAttr self (Maybe TreePath) TreePath - -module Graphics.UI.Gtk.TreeList.IconView -data IconView -instance ContainerClass IconView -instance GObjectClass IconView -instance IconViewClass IconView -instance ObjectClass IconView -instance WidgetClass IconView -class ContainerClass o => IconViewClass o -instance IconViewClass IconView -castToIconView :: GObjectClass obj => obj -> IconView -toIconView :: IconViewClass o => o -> IconView -iconViewNew :: IO IconView -iconViewNewWithModel :: TreeModelClass model => model -> IO IconView -iconViewSetModel :: (IconViewClass self, TreeModelClass model) => self -> Maybe model -> IO () -iconViewGetModel :: IconViewClass self => self -> IO (Maybe TreeModel) -iconViewSetTextColumn :: IconViewClass self => self -> Int -> IO () -iconViewGetTextColumn :: IconViewClass self => self -> IO Int -iconViewSetMarkupColumn :: IconViewClass self => self -> Int -> IO () -iconViewGetMarkupColumn :: IconViewClass self => self -> IO Int -iconViewSetPixbufColumn :: IconViewClass self => self -> Int -> IO () -iconViewGetPixbufColumn :: IconViewClass self => self -> IO Int -iconViewGetPathAtPos :: IconViewClass self => self -> Int -> Int -> IO TreePath -iconViewSelectedForeach :: IconViewClass self => self -> (TreePath -> IO ()) -> IO () -iconViewSetSelectionMode :: IconViewClass self => self -> SelectionMode -> IO () -iconViewGetSelectionMode :: IconViewClass self => self -> IO SelectionMode -iconViewSetOrientation :: IconViewClass self => self -> Orientation -> IO () -iconViewGetOrientation :: IconViewClass self => self -> IO Orientation -iconViewSetColumns :: IconViewClass self => self -> Int -> IO () -iconViewGetColumns :: IconViewClass self => self -> IO Int -iconViewSetItemWidth :: IconViewClass self => self -> Int -> IO () -iconViewGetItemWidth :: IconViewClass self => self -> IO Int -iconViewSetSpacing :: IconViewClass self => self -> Int -> IO () -iconViewGetSpacing :: IconViewClass self => self -> IO Int -iconViewSetRowSpacing :: IconViewClass self => self -> Int -> IO () -iconViewGetRowSpacing :: IconViewClass self => self -> IO Int -iconViewSetColumnSpacing :: IconViewClass self => self -> Int -> IO () -iconViewGetColumnSpacing :: IconViewClass self => self -> IO Int -iconViewSetMargin :: IconViewClass self => self -> Int -> IO () -iconViewGetMargin :: IconViewClass self => self -> IO Int -iconViewSelectPath :: IconViewClass self => self -> TreePath -> IO () -iconViewUnselectPath :: IconViewClass self => self -> TreePath -> IO () -iconViewPathIsSelected :: IconViewClass self => self -> TreePath -> IO Bool -iconViewGetSelectedItems :: IconViewClass self => self -> IO [TreePath] -iconViewSelectAll :: IconViewClass self => self -> IO () -iconViewUnselectAll :: IconViewClass self => self -> IO () -iconViewItemActivated :: IconViewClass self => self -> TreePath -> IO () -iconViewSelectionMode :: IconViewClass self => Attr self SelectionMode -iconViewPixbufColumn :: IconViewClass self => Attr self Int -iconViewTextColumn :: IconViewClass self => Attr self Int -iconViewMarkupColumn :: IconViewClass self => Attr self Int -iconViewModel :: (IconViewClass self, TreeModelClass model) => ReadWriteAttr self (Maybe TreeModel) (Maybe model) -iconViewColumns :: IconViewClass self => Attr self Int -iconViewItemWidth :: IconViewClass self => Attr self Int -iconViewSpacing :: IconViewClass self => Attr self Int -iconViewRowSpacing :: IconViewClass self => Attr self Int -iconViewColumnSpacing :: IconViewClass self => Attr self Int -iconViewMargin :: IconViewClass self => Attr self Int -iconViewOrientation :: IconViewClass self => Attr self Orientation -onSelectAll :: IconViewClass self => self -> IO () -> IO (ConnectId self) -afterSelectAll :: IconViewClass self => self -> IO () -> IO (ConnectId self) -onUnselectAll :: IconViewClass self => self -> IO () -> IO (ConnectId self) -afterUnselectAll :: IconViewClass self => self -> IO () -> IO (ConnectId self) -onSelectCursorItem :: IconViewClass self => self -> IO () -> IO (ConnectId self) -afterSelectCursorItem :: IconViewClass self => self -> IO () -> IO (ConnectId self) -onToggleCursorItem :: IconViewClass self => self -> IO () -> IO (ConnectId self) -afterToggleCursorItem :: IconViewClass self => self -> IO () -> IO (ConnectId self) -onActivateCursorItem :: IconViewClass self => self -> IO Bool -> IO (ConnectId self) -afterActivateCursorItem :: IconViewClass self => self -> IO Bool -> IO (ConnectId self) - -module Graphics.UI.Gtk.TreeList.TreeSelection -data TreeSelection -instance GObjectClass TreeSelection -instance TreeSelectionClass TreeSelection -class GObjectClass o => TreeSelectionClass o -instance TreeSelectionClass TreeSelection -castToTreeSelection :: GObjectClass obj => obj -> TreeSelection -toTreeSelection :: TreeSelectionClass o => o -> TreeSelection -data SelectionMode -SelectionNone :: SelectionMode -SelectionSingle :: SelectionMode -SelectionBrowse :: SelectionMode -SelectionMultiple :: SelectionMode -instance Enum SelectionMode -type TreeSelectionCB = TreePath -> IO Bool -type TreeSelectionForeachCB = TreeIter -> IO () -treeSelectionSetMode :: TreeSelectionClass self => self -> SelectionMode -> IO () -treeSelectionGetMode :: TreeSelectionClass self => self -> IO SelectionMode -treeSelectionSetSelectFunction :: TreeSelectionClass self => self -> TreeSelectionCB -> IO () -treeSelectionGetTreeView :: TreeSelectionClass self => self -> IO TreeView -treeSelectionGetSelected :: TreeSelectionClass self => self -> IO (Maybe TreeIter) -treeSelectionSelectedForeach :: TreeSelectionClass self => self -> TreeSelectionForeachCB -> IO () -treeSelectionGetSelectedRows :: TreeSelectionClass self => self -> IO [TreePath] -treeSelectionCountSelectedRows :: TreeSelectionClass self => self -> IO Int -treeSelectionSelectPath :: TreeSelectionClass self => self -> TreePath -> IO () -treeSelectionUnselectPath :: TreeSelectionClass self => self -> TreePath -> IO () -treeSelectionPathIsSelected :: TreeSelectionClass self => self -> TreePath -> IO Bool -treeSelectionSelectIter :: TreeSelectionClass self => self -> TreeIter -> IO () -treeSelectionUnselectIter :: TreeSelectionClass self => self -> TreeIter -> IO () -treeSelectionIterIsSelected :: TreeSelectionClass self => self -> TreeIter -> IO Bool -treeSelectionSelectAll :: TreeSelectionClass self => self -> IO () -treeSelectionUnselectAll :: TreeSelectionClass self => self -> IO () -treeSelectionSelectRange :: TreeSelectionClass self => self -> TreePath -> TreePath -> IO () -treeSelectionUnselectRange :: TreeSelectionClass self => self -> TreePath -> TreePath -> IO () -treeSelectionMode :: TreeSelectionClass self => Attr self SelectionMode -onSelectionChanged :: TreeSelectionClass self => self -> IO () -> IO (ConnectId self) -afterSelectionChanged :: TreeSelectionClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.TreeList.TreeViewColumn -data TreeViewColumn -instance GObjectClass TreeViewColumn -instance ObjectClass TreeViewColumn -instance TreeViewColumnClass TreeViewColumn -class ObjectClass o => TreeViewColumnClass o -instance TreeViewColumnClass TreeViewColumn -castToTreeViewColumn :: GObjectClass obj => obj -> TreeViewColumn -toTreeViewColumn :: TreeViewColumnClass o => o -> TreeViewColumn -treeViewColumnNew :: IO TreeViewColumn -treeViewColumnNewWithAttributes :: CellRendererClass cr => String -> cr -> [(String, Int)] -> IO TreeViewColumn -treeViewColumnPackStart :: CellRendererClass cell => TreeViewColumn -> cell -> Bool -> IO () -treeViewColumnPackEnd :: CellRendererClass cell => TreeViewColumn -> cell -> Bool -> IO () -treeViewColumnClear :: TreeViewColumn -> IO () -treeViewColumnGetCellRenderers :: TreeViewColumn -> IO [CellRenderer] -treeViewColumnAddAttribute :: CellRendererClass cellRenderer => TreeViewColumn -> cellRenderer -> String -> Int -> IO () -treeViewColumnAddAttributes :: CellRendererClass cr => TreeViewColumn -> cr -> [(String, Int)] -> IO () -treeViewColumnSetAttributes :: CellRendererClass cr => TreeViewColumn -> cr -> [(String, Int)] -> IO () -treeViewColumnClearAttributes :: CellRendererClass cellRenderer => TreeViewColumn -> cellRenderer -> IO () -treeViewColumnSetSpacing :: TreeViewColumn -> Int -> IO () -treeViewColumnGetSpacing :: TreeViewColumn -> IO Int -treeViewColumnSetVisible :: TreeViewColumn -> Bool -> IO () -treeViewColumnGetVisible :: TreeViewColumn -> IO Bool -treeViewColumnSetResizable :: TreeViewColumn -> Bool -> IO () -treeViewColumnGetResizable :: TreeViewColumn -> IO Bool -data TreeViewColumnSizing -TreeViewColumnGrowOnly :: TreeViewColumnSizing -TreeViewColumnAutosize :: TreeViewColumnSizing -TreeViewColumnFixed :: TreeViewColumnSizing -instance Enum TreeViewColumnSizing -instance Eq TreeViewColumnSizing -treeViewColumnSetSizing :: TreeViewColumn -> TreeViewColumnSizing -> IO () -treeViewColumnGetSizing :: TreeViewColumn -> IO TreeViewColumnSizing -treeViewColumnGetWidth :: TreeViewColumn -> IO Int -treeViewColumnSetFixedWidth :: TreeViewColumn -> Int -> IO () -treeViewColumnGetFixedWidth :: TreeViewColumn -> IO Int -treeViewColumnSetMinWidth :: TreeViewColumn -> Int -> IO () -treeViewColumnGetMinWidth :: TreeViewColumn -> IO Int -treeViewColumnSetMaxWidth :: TreeViewColumn -> Int -> IO () -treeViewColumnGetMaxWidth :: TreeViewColumn -> IO Int -treeViewColumnClicked :: TreeViewColumn -> IO () -treeViewColumnSetTitle :: TreeViewColumn -> String -> IO () -treeViewColumnGetTitle :: TreeViewColumn -> IO (Maybe String) -treeViewColumnSetClickable :: TreeViewColumn -> Bool -> IO () -treeViewColumnGetClickable :: TreeViewColumn -> IO Bool -treeViewColumnSetWidget :: WidgetClass widget => TreeViewColumn -> widget -> IO () -treeViewColumnGetWidget :: TreeViewColumn -> IO Widget -treeViewColumnSetAlignment :: TreeViewColumn -> Float -> IO () -treeViewColumnGetAlignment :: TreeViewColumn -> IO Float -treeViewColumnSetReorderable :: TreeViewColumn -> Bool -> IO () -treeViewColumnGetReorderable :: TreeViewColumn -> IO Bool -treeViewColumnSetSortColumnId :: TreeViewColumn -> Int -> IO () -treeViewColumnGetSortColumnId :: TreeViewColumn -> IO Int -treeViewColumnSetSortIndicator :: TreeViewColumn -> Bool -> IO () -treeViewColumnGetSortIndicator :: TreeViewColumn -> IO Bool -treeViewColumnSetSortOrder :: TreeViewColumn -> SortType -> IO () -treeViewColumnGetSortOrder :: TreeViewColumn -> IO SortType -data SortType -SortAscending :: SortType -SortDescending :: SortType -instance Enum SortType -instance Eq SortType -treeViewColumnVisible :: Attr TreeViewColumn Bool -treeViewColumnResizable :: Attr TreeViewColumn Bool -treeViewColumnWidth :: ReadAttr TreeViewColumn Int -treeViewColumnSpacing :: Attr TreeViewColumn Int -treeViewColumnSizing :: Attr TreeViewColumn TreeViewColumnSizing -treeViewColumnFixedWidth :: Attr TreeViewColumn Int -treeViewColumnMinWidth :: Attr TreeViewColumn Int -treeViewColumnMaxWidth :: Attr TreeViewColumn Int -treeViewColumnTitle :: ReadWriteAttr TreeViewColumn (Maybe String) String -treeViewColumnClickable :: Attr TreeViewColumn Bool -treeViewColumnWidget :: WidgetClass widget => ReadWriteAttr TreeViewColumn Widget widget -treeViewColumnAlignment :: Attr TreeViewColumn Float -treeViewColumnReorderable :: Attr TreeViewColumn Bool -treeViewColumnSortIndicator :: Attr TreeViewColumn Bool -treeViewColumnSortOrder :: Attr TreeViewColumn SortType -treeViewColumnSortColumnId :: Attr TreeViewColumn Int -onColClicked :: TreeViewColumnClass self => self -> IO () -> IO (ConnectId self) -afterColClicked :: TreeViewColumnClass self => self -> IO () -> IO (ConnectId self) - -module Graphics.UI.Gtk.TreeList.TreeView -data TreeView -instance ContainerClass TreeView -instance GObjectClass TreeView -instance ObjectClass TreeView -instance TreeViewClass TreeView -instance WidgetClass TreeView -class ContainerClass o => TreeViewClass o -instance TreeViewClass TreeView -castToTreeView :: GObjectClass obj => obj -> TreeView -toTreeView :: TreeViewClass o => o -> TreeView -type Point = (Int, Int) -treeViewNew :: IO TreeView -treeViewNewWithModel :: TreeModelClass model => model -> IO TreeView -treeViewGetModel :: TreeViewClass self => self -> IO (Maybe TreeModel) -treeViewSetModel :: (TreeViewClass self, TreeModelClass model) => self -> model -> IO () -treeViewGetSelection :: TreeViewClass self => self -> IO TreeSelection -treeViewGetHAdjustment :: TreeViewClass self => self -> IO (Maybe Adjustment) -treeViewSetHAdjustment :: TreeViewClass self => self -> Maybe Adjustment -> IO () -treeViewGetVAdjustment :: TreeViewClass self => self -> IO (Maybe Adjustment) -treeViewSetVAdjustment :: TreeViewClass self => self -> Maybe Adjustment -> IO () -treeViewGetHeadersVisible :: TreeViewClass self => self -> IO Bool -treeViewSetHeadersVisible :: TreeViewClass self => self -> Bool -> IO () -treeViewColumnsAutosize :: TreeViewClass self => self -> IO () -treeViewSetHeadersClickable :: TreeViewClass self => self -> Bool -> IO () -treeViewGetRulesHint :: TreeViewClass self => self -> IO Bool -treeViewSetRulesHint :: TreeViewClass self => self -> Bool -> IO () -treeViewAppendColumn :: TreeViewClass self => self -> TreeViewColumn -> IO Int -treeViewRemoveColumn :: TreeViewClass self => self -> TreeViewColumn -> IO Int -treeViewInsertColumn :: TreeViewClass self => self -> TreeViewColumn -> Int -> IO Int -treeViewInsertColumnWithAttributes :: (TreeViewClass self, CellRendererClass cr) => self -> Int -> String -> cr -> [(String, Int)] -> IO () -treeViewGetColumn :: TreeViewClass self => self -> Int -> IO (Maybe TreeViewColumn) -treeViewGetColumns :: TreeViewClass self => self -> IO [TreeViewColumn] -treeViewMoveColumnAfter :: TreeViewClass self => self -> TreeViewColumn -> TreeViewColumn -> IO () -treeViewMoveColumnFirst :: TreeViewClass self => self -> TreeViewColumn -> IO () -treeViewSetExpanderColumn :: TreeViewClass self => self -> Maybe TreeViewColumn -> IO () -treeViewGetExpanderColumn :: TreeViewClass self => self -> IO TreeViewColumn -treeViewSetColumnDragFunction :: TreeViewClass self => self -> Maybe (TreeViewColumn -> Maybe TreeViewColumn -> Maybe TreeViewColumn -> IO Bool) -> IO () -treeViewScrollToPoint :: TreeViewClass self => self -> Int -> Int -> IO () -treeViewScrollToCell :: TreeViewClass self => self -> TreePath -> TreeViewColumn -> Maybe (Float, Float) -> IO () -treeViewSetCursor :: TreeViewClass self => self -> TreePath -> Maybe (TreeViewColumn, Bool) -> IO () -treeViewSetCursorOnCell :: (TreeViewClass self, CellRendererClass focusCell) => self -> TreePath -> TreeViewColumn -> focusCell -> Bool -> IO () -treeViewGetCursor :: TreeViewClass self => self -> IO (TreePath, Maybe TreeViewColumn) -treeViewRowActivated :: TreeViewClass self => self -> TreePath -> TreeViewColumn -> IO () -treeViewExpandAll :: TreeViewClass self => self -> IO () -treeViewCollapseAll :: TreeViewClass self => self -> IO () -treeViewExpandToPath :: TreeViewClass self => self -> TreePath -> IO () -treeViewExpandRow :: TreeViewClass self => self -> TreePath -> Bool -> IO Bool -treeViewCollapseRow :: TreeViewClass self => self -> TreePath -> IO Bool -treeViewMapExpandedRows :: TreeViewClass self => self -> (TreePath -> IO ()) -> IO () -treeViewRowExpanded :: TreeViewClass self => self -> TreePath -> IO Bool -treeViewGetReorderable :: TreeViewClass self => self -> IO Bool -treeViewSetReorderable :: TreeViewClass self => self -> Bool -> IO () -treeViewGetPathAtPos :: TreeViewClass self => self -> Point -> IO (Maybe (TreePath, TreeViewColumn, Point)) -treeViewGetCellArea :: TreeViewClass self => self -> Maybe TreePath -> TreeViewColumn -> IO Rectangle -treeViewGetBackgroundArea :: TreeViewClass self => self -> Maybe TreePath -> TreeViewColumn -> IO Rectangle -treeViewGetVisibleRect :: TreeViewClass self => self -> IO Rectangle -treeViewWidgetToTreeCoords :: TreeViewClass self => self -> Point -> IO Point -treeViewTreeToWidgetCoords :: TreeViewClass self => self -> Point -> IO Point -treeViewCreateRowDragIcon :: TreeViewClass self => self -> TreePath -> IO Pixmap -treeViewGetEnableSearch :: TreeViewClass self => self -> IO Bool -treeViewSetEnableSearch :: TreeViewClass self => self -> Bool -> IO () -treeViewGetSearchColumn :: TreeViewClass self => self -> IO Int -treeViewSetSearchColumn :: TreeViewClass self => self -> Int -> IO () -treeViewSetSearchEqualFunc :: TreeViewClass self => self -> (Int -> String -> TreeIter -> IO Bool) -> IO () -treeViewGetFixedHeightMode :: TreeViewClass self => self -> IO Bool -treeViewSetFixedHeightMode :: TreeViewClass self => self -> Bool -> IO () -treeViewGetHoverSelection :: TreeViewClass self => self -> IO Bool -treeViewSetHoverSelection :: TreeViewClass self => self -> Bool -> IO () -treeViewGetHoverExpand :: TreeViewClass self => self -> IO Bool -treeViewSetHoverExpand :: TreeViewClass self => self -> Bool -> IO () -treeViewModel :: (TreeViewClass self, TreeModelClass model) => ReadWriteAttr self (Maybe TreeModel) model -treeViewHAdjustment :: TreeViewClass self => Attr self (Maybe Adjustment) -treeViewVAdjustment :: TreeViewClass self => Attr self (Maybe Adjustment) -treeViewHeadersVisible :: TreeViewClass self => Attr self Bool -treeViewHeadersClickable :: TreeViewClass self => Attr self Bool -treeViewExpanderColumn :: TreeViewClass self => ReadWriteAttr self TreeViewColumn (Maybe TreeViewColumn) -treeViewReorderable :: TreeViewClass self => Attr self Bool -treeViewRulesHint :: TreeViewClass self => Attr self Bool -treeViewEnableSearch :: TreeViewClass self => Attr self Bool -treeViewSearchColumn :: TreeViewClass self => Attr self Int -treeViewFixedHeightMode :: TreeViewClass self => Attr self Bool -treeViewHoverSelection :: TreeViewClass self => Attr self Bool -treeViewHoverExpand :: TreeViewClass self => Attr self Bool -onColumnsChanged :: TreeViewClass self => self -> IO () -> IO (ConnectId self) -afterColumnsChanged :: TreeViewClass self => self -> IO () -> IO (ConnectId self) -onCursorChanged :: TreeViewClass self => self -> IO () -> IO (ConnectId self) -afterCursorChanged :: TreeViewClass self => self -> IO () -> IO (ConnectId self) -onRowActivated :: TreeViewClass self => self -> (TreePath -> TreeViewColumn -> IO ()) -> IO (ConnectId self) -afterRowActivated :: TreeViewClass self => self -> (TreePath -> TreeViewColumn -> IO ()) -> IO (ConnectId self) -onRowCollapsed :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO ()) -> IO (ConnectId self) -afterRowCollapsed :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO ()) -> IO (ConnectId self) -onRowExpanded :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO ()) -> IO (ConnectId self) -afterRowExpanded :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO ()) -> IO (ConnectId self) -onStartInteractiveSearch :: TreeViewClass self => self -> IO () -> IO (ConnectId self) -afterStartInteractiveSearch :: TreeViewClass self => self -> IO () -> IO (ConnectId self) -onTestCollapseRow :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO Bool) -> IO (ConnectId self) -afterTestCollapseRow :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO Bool) -> IO (ConnectId self) -onTestExpandRow :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO Bool) -> IO (ConnectId self) -afterTestExpandRow :: TreeViewClass self => self -> (TreeIter -> TreePath -> IO Bool) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Windows.AboutDialog -data AboutDialog -instance AboutDialogClass AboutDialog -instance BinClass AboutDialog -instance ContainerClass AboutDialog -instance DialogClass AboutDialog -instance GObjectClass AboutDialog -instance ObjectClass AboutDialog -instance WidgetClass AboutDialog -instance WindowClass AboutDialog -class DialogClass o => AboutDialogClass o -instance AboutDialogClass AboutDialog -castToAboutDialog :: GObjectClass obj => obj -> AboutDialog -toAboutDialog :: AboutDialogClass o => o -> AboutDialog -aboutDialogNew :: IO AboutDialog -aboutDialogGetName :: AboutDialogClass self => self -> IO String -aboutDialogSetName :: AboutDialogClass self => self -> String -> IO () -aboutDialogGetVersion :: AboutDialogClass self => self -> IO String -aboutDialogSetVersion :: AboutDialogClass self => self -> String -> IO () -aboutDialogGetCopyright :: AboutDialogClass self => self -> IO String -aboutDialogSetCopyright :: AboutDialogClass self => self -> String -> IO () -aboutDialogGetComments :: AboutDialogClass self => self -> IO String -aboutDialogSetComments :: AboutDialogClass self => self -> String -> IO () -aboutDialogGetLicense :: AboutDialogClass self => self -> IO (Maybe String) -aboutDialogSetLicense :: AboutDialogClass self => self -> Maybe String -> IO () -aboutDialogGetWebsite :: AboutDialogClass self => self -> IO String -aboutDialogSetWebsite :: AboutDialogClass self => self -> String -> IO () -aboutDialogGetWebsiteLabel :: AboutDialogClass self => self -> IO String -aboutDialogSetWebsiteLabel :: AboutDialogClass self => self -> String -> IO () -aboutDialogSetAuthors :: AboutDialogClass self => self -> [String] -> IO () -aboutDialogGetAuthors :: AboutDialogClass self => self -> IO [String] -aboutDialogSetArtists :: AboutDialogClass self => self -> [String] -> IO () -aboutDialogGetArtists :: AboutDialogClass self => self -> IO [String] -aboutDialogSetDocumenters :: AboutDialogClass self => self -> [String] -> IO () -aboutDialogGetDocumenters :: AboutDialogClass self => self -> IO [String] -aboutDialogGetTranslatorCredits :: AboutDialogClass self => self -> IO String -aboutDialogSetTranslatorCredits :: AboutDialogClass self => self -> String -> IO () -aboutDialogGetLogo :: AboutDialogClass self => self -> IO Pixbuf -aboutDialogSetLogo :: AboutDialogClass self => self -> Maybe Pixbuf -> IO () -aboutDialogGetLogoIconName :: AboutDialogClass self => self -> IO String -aboutDialogSetLogoIconName :: AboutDialogClass self => self -> Maybe String -> IO () -aboutDialogSetEmailHook :: (String -> IO ()) -> IO () -aboutDialogSetUrlHook :: (String -> IO ()) -> IO () -aboutDialogGetWrapLicense :: AboutDialogClass self => self -> IO Bool -aboutDialogSetWrapLicense :: AboutDialogClass self => self -> Bool -> IO () -aboutDialogName :: AboutDialogClass self => Attr self String -aboutDialogVersion :: AboutDialogClass self => Attr self String -aboutDialogCopyright :: AboutDialogClass self => Attr self String -aboutDialogComments :: AboutDialogClass self => Attr self String -aboutDialogLicense :: AboutDialogClass self => Attr self (Maybe String) -aboutDialogWebsite :: AboutDialogClass self => Attr self String -aboutDialogWebsiteLabel :: AboutDialogClass self => Attr self String -aboutDialogAuthors :: AboutDialogClass self => Attr self [String] -aboutDialogDocumenters :: AboutDialogClass self => Attr self [String] -aboutDialogArtists :: AboutDialogClass self => Attr self [String] -aboutDialogTranslatorCredits :: AboutDialogClass self => Attr self String -aboutDialogLogo :: AboutDialogClass self => ReadWriteAttr self Pixbuf (Maybe Pixbuf) -aboutDialogLogoIconName :: AboutDialogClass self => ReadWriteAttr self String (Maybe String) -aboutDialogWrapLicense :: AboutDialogClass self => Attr self Bool - -module Graphics.UI.Gtk.Windows.Dialog -data Dialog -instance BinClass Dialog -instance ContainerClass Dialog -instance DialogClass Dialog -instance GObjectClass Dialog -instance ObjectClass Dialog -instance WidgetClass Dialog -instance WindowClass Dialog -class WindowClass o => DialogClass o -instance DialogClass AboutDialog -instance DialogClass ColorSelectionDialog -instance DialogClass Dialog -instance DialogClass FileChooserDialog -instance DialogClass FileSelection -instance DialogClass FontSelectionDialog -instance DialogClass InputDialog -instance DialogClass MessageDialog -castToDialog :: GObjectClass obj => obj -> Dialog -toDialog :: DialogClass o => o -> Dialog -dialogNew :: IO Dialog -dialogGetUpper :: DialogClass dc => dc -> IO VBox -dialogGetActionArea :: DialogClass dc => dc -> IO HBox -dialogRun :: DialogClass self => self -> IO ResponseId -dialogResponse :: DialogClass self => self -> ResponseId -> IO () -data ResponseId -ResponseNone :: ResponseId -ResponseReject :: ResponseId -ResponseAccept :: ResponseId -ResponseDeleteEvent :: ResponseId -ResponseOk :: ResponseId -ResponseCancel :: ResponseId -ResponseClose :: ResponseId -ResponseYes :: ResponseId -ResponseNo :: ResponseId -ResponseApply :: ResponseId -ResponseHelp :: ResponseId -ResponseUser :: Int -> ResponseId -instance Show ResponseId -dialogAddButton :: DialogClass self => self -> String -> ResponseId -> IO Button -dialogAddActionWidget :: (DialogClass self, WidgetClass child) => self -> child -> ResponseId -> IO () -dialogGetHasSeparator :: DialogClass self => self -> IO Bool -dialogSetDefaultResponse :: DialogClass self => self -> ResponseId -> IO () -dialogSetHasSeparator :: DialogClass self => self -> Bool -> IO () -dialogSetResponseSensitive :: DialogClass self => self -> ResponseId -> Bool -> IO () -dialogHasSeparator :: DialogClass self => Attr self Bool -onResponse :: DialogClass self => self -> (ResponseId -> IO ()) -> IO (ConnectId self) -afterResponse :: DialogClass self => self -> (ResponseId -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Windows.Window -data Window -instance BinClass Window -instance ContainerClass Window -instance GObjectClass Window -instance ObjectClass Window -instance WidgetClass Window -instance WindowClass Window -class BinClass o => WindowClass o -instance WindowClass AboutDialog -instance WindowClass ColorSelectionDialog -instance WindowClass Dialog -instance WindowClass FileChooserDialog -instance WindowClass FileSelection -instance WindowClass FontSelectionDialog -instance WindowClass InputDialog -instance WindowClass MessageDialog -instance WindowClass Plug -instance WindowClass Window -castToWindow :: GObjectClass obj => obj -> Window -toWindow :: WindowClass o => o -> Window -data WindowType -WindowToplevel :: WindowType -WindowPopup :: WindowType -instance Enum WindowType -instance Eq WindowType -data WindowEdge -WindowEdgeNorthWest :: WindowEdge -WindowEdgeNorth :: WindowEdge -WindowEdgeNorthEast :: WindowEdge -WindowEdgeWest :: WindowEdge -WindowEdgeEast :: WindowEdge -WindowEdgeSouthWest :: WindowEdge -WindowEdgeSouth :: WindowEdge -WindowEdgeSouthEast :: WindowEdge -instance Enum WindowEdge -data WindowTypeHint -WindowTypeHintNormal :: WindowTypeHint -WindowTypeHintDialog :: WindowTypeHint -WindowTypeHintMenu :: WindowTypeHint -WindowTypeHintToolbar :: WindowTypeHint -WindowTypeHintSplashscreen :: WindowTypeHint -WindowTypeHintUtility :: WindowTypeHint -WindowTypeHintDock :: WindowTypeHint -WindowTypeHintDesktop :: WindowTypeHint -instance Enum WindowTypeHint -data Gravity -GravityNorthWest :: Gravity -GravityNorth :: Gravity -GravityNorthEast :: Gravity -GravityWest :: Gravity -GravityCenter :: Gravity -GravityEast :: Gravity -GravitySouthWest :: Gravity -GravitySouth :: Gravity -GravitySouthEast :: Gravity -GravityStatic :: Gravity -instance Enum Gravity -windowNew :: IO Window -windowSetTitle :: WindowClass self => self -> String -> IO () -windowGetTitle :: WindowClass self => self -> IO String -windowSetResizable :: WindowClass self => self -> Bool -> IO () -windowGetResizable :: WindowClass self => self -> IO Bool -windowActivateFocus :: WindowClass self => self -> IO Bool -windowActivateDefault :: WindowClass self => self -> IO Bool -windowSetModal :: WindowClass self => self -> Bool -> IO () -windowGetModal :: WindowClass self => self -> IO Bool -windowSetDefaultSize :: WindowClass self => self -> Int -> Int -> IO () -windowGetDefaultSize :: WindowClass self => self -> IO (Int, Int) -windowSetPolicy :: WindowClass self => self -> Bool -> Bool -> Bool -> IO () -windowSetPosition :: WindowClass self => self -> WindowPosition -> IO () -data WindowPosition -WinPosNone :: WindowPosition -WinPosCenter :: WindowPosition -WinPosMouse :: WindowPosition -WinPosCenterAlways :: WindowPosition -WinPosCenterOnParent :: WindowPosition -instance Enum WindowPosition -instance Eq WindowPosition -windowSetTransientFor :: (WindowClass self, WindowClass parent) => self -> parent -> IO () -windowGetTransientFor :: WindowClass self => self -> IO (Maybe Window) -windowSetDestroyWithParent :: WindowClass self => self -> Bool -> IO () -windowGetDestroyWithParent :: WindowClass self => self -> IO Bool -windowIsActive :: WindowClass self => self -> IO Bool -windowHasToplevelFocus :: WindowClass self => self -> IO Bool -windowPresent :: WindowClass self => self -> IO () -windowDeiconify :: WindowClass self => self -> IO () -windowIconify :: WindowClass self => self -> IO () -windowMaximize :: WindowClass self => self -> IO () -windowUnmaximize :: WindowClass self => self -> IO () -windowFullscreen :: WindowClass self => self -> IO () -windowUnfullscreen :: WindowClass self => self -> IO () -windowSetKeepAbove :: WindowClass self => self -> Bool -> IO () -windowSetKeepBelow :: WindowClass self => self -> Bool -> IO () -windowSetSkipTaskbarHint :: WindowClass self => self -> Bool -> IO () -windowGetSkipTaskbarHint :: WindowClass self => self -> IO Bool -windowSetSkipPagerHint :: WindowClass self => self -> Bool -> IO () -windowGetSkipPagerHint :: WindowClass self => self -> IO Bool -windowSetAcceptFocus :: WindowClass self => self -> Bool -> IO () -windowGetAcceptFocus :: WindowClass self => self -> IO Bool -windowSetFocusOnMap :: WindowClass self => self -> Bool -> IO () -windowGetFocusOnMap :: WindowClass self => self -> IO Bool -windowSetDecorated :: WindowClass self => self -> Bool -> IO () -windowGetDecorated :: WindowClass self => self -> IO Bool -windowSetFrameDimensions :: WindowClass self => self -> Int -> Int -> Int -> Int -> IO () -windowSetRole :: WindowClass self => self -> String -> IO () -windowGetRole :: WindowClass self => self -> IO (Maybe String) -windowStick :: WindowClass self => self -> IO () -windowUnstick :: WindowClass self => self -> IO () -windowAddAccelGroup :: WindowClass self => self -> AccelGroup -> IO () -windowRemoveAccelGroup :: WindowClass self => self -> AccelGroup -> IO () -windowSetIcon :: WindowClass self => self -> Pixbuf -> IO () -windowSetIconName :: WindowClass self => self -> String -> IO () -windowGetIconName :: WindowClass self => self -> IO String -windowSetDefaultIconName :: String -> IO () -windowSetGravity :: WindowClass self => self -> Gravity -> IO () -windowGetGravity :: WindowClass self => self -> IO Gravity -windowSetScreen :: WindowClass self => self -> Screen -> IO () -windowGetScreen :: WindowClass self => self -> IO Screen -windowBeginResizeDrag :: WindowClass self => self -> WindowEdge -> Int -> Int -> Int -> Word32 -> IO () -windowBeginMoveDrag :: WindowClass self => self -> Int -> Int -> Int -> Word32 -> IO () -windowSetTypeHint :: WindowClass self => self -> WindowTypeHint -> IO () -windowGetTypeHint :: WindowClass self => self -> IO WindowTypeHint -windowGetIcon :: WindowClass self => self -> IO Pixbuf -windowGetPosition :: WindowClass self => self -> IO (Int, Int) -windowGetSize :: WindowClass self => self -> IO (Int, Int) -windowMove :: WindowClass self => self -> Int -> Int -> IO () -windowResize :: WindowClass self => self -> Int -> Int -> IO () -windowSetIconFromFile :: WindowClass self => self -> FilePath -> IO Bool -windowSetAutoStartupNotification :: Bool -> IO () -windowPresentWithTime :: WindowClass self => self -> Word32 -> IO () -windowSetUrgencyHint :: WindowClass self => self -> Bool -> IO () -windowGetUrgencyHint :: WindowClass self => self -> IO Bool -windowTitle :: WindowClass self => Attr self String -windowType :: WindowClass self => Attr self WindowType -windowAllowShrink :: WindowClass self => Attr self Bool -windowAllowGrow :: WindowClass self => Attr self Bool -windowResizable :: WindowClass self => Attr self Bool -windowModal :: WindowClass self => Attr self Bool -windowWindowPosition :: WindowClass self => Attr self WindowPosition -windowDefaultWidth :: WindowClass self => Attr self Int -windowDefaultHeight :: WindowClass self => Attr self Int -windowDestroyWithParent :: WindowClass self => Attr self Bool -windowIcon :: WindowClass self => Attr self Pixbuf -windowScreen :: WindowClass self => Attr self Screen -windowTypeHint :: WindowClass self => Attr self WindowTypeHint -windowSkipTaskbarHint :: WindowClass self => Attr self Bool -windowSkipPagerHint :: WindowClass self => Attr self Bool -windowUrgencyHint :: WindowClass self => Attr self Bool -windowAcceptFocus :: WindowClass self => Attr self Bool -windowFocusOnMap :: WindowClass self => Attr self Bool -windowDecorated :: WindowClass self => Attr self Bool -windowGravity :: WindowClass self => Attr self Gravity -windowTransientFor :: (WindowClass self, WindowClass parent) => ReadWriteAttr self (Maybe Window) parent -onFrameEvent :: WindowClass self => self -> (Event -> IO Bool) -> IO (ConnectId self) -afterFrameEvent :: WindowClass self => self -> (Event -> IO Bool) -> IO (ConnectId self) -onSetFocus :: (WindowClass self, WidgetClass foc) => self -> (foc -> IO ()) -> IO (ConnectId self) -afterSetFocus :: (WindowClass self, WidgetClass foc) => self -> (foc -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Selectors.FileChooserDialog -data FileChooserDialog -instance BinClass FileChooserDialog -instance ContainerClass FileChooserDialog -instance DialogClass FileChooserDialog -instance FileChooserClass FileChooserDialog -instance FileChooserDialogClass FileChooserDialog -instance GObjectClass FileChooserDialog -instance ObjectClass FileChooserDialog -instance WidgetClass FileChooserDialog -instance WindowClass FileChooserDialog -class DialogClass o => FileChooserDialogClass o -instance FileChooserDialogClass FileChooserDialog -castToFileChooserDialog :: GObjectClass obj => obj -> FileChooserDialog -toFileChooserDialog :: FileChooserDialogClass o => o -> FileChooserDialog -fileChooserDialogNew :: Maybe String -> Maybe Window -> FileChooserAction -> [(String, ResponseId)] -> IO FileChooserDialog -fileChooserDialogNewWithBackend :: Maybe String -> Maybe Window -> FileChooserAction -> [(String, ResponseId)] -> String -> IO FileChooserDialog - -module Graphics.UI.Gtk.Abstract.Misc -data Misc -instance GObjectClass Misc -instance MiscClass Misc -instance ObjectClass Misc -instance WidgetClass Misc -class WidgetClass o => MiscClass o -instance MiscClass AccelLabel -instance MiscClass Arrow -instance MiscClass Image -instance MiscClass Label -instance MiscClass Misc -instance MiscClass TipsQuery -castToMisc :: GObjectClass obj => obj -> Misc -toMisc :: MiscClass o => o -> Misc -miscSetAlignment :: MiscClass self => self -> Float -> Float -> IO () -miscGetAlignment :: MiscClass self => self -> IO (Double, Double) -miscSetPadding :: MiscClass self => self -> Int -> Int -> IO () -miscGetPadding :: MiscClass self => self -> IO (Int, Int) -miscXalign :: MiscClass self => Attr self Float -miscYalign :: MiscClass self => Attr self Float -miscXpad :: MiscClass self => Attr self Int -miscYpad :: MiscClass self => Attr self Int - -module Graphics.UI.Gtk.Abstract.Paned -data Paned -instance ContainerClass Paned -instance GObjectClass Paned -instance ObjectClass Paned -instance PanedClass Paned -instance WidgetClass Paned -class ContainerClass o => PanedClass o -instance PanedClass HPaned -instance PanedClass Paned -instance PanedClass VPaned -castToPaned :: GObjectClass obj => obj -> Paned -toPaned :: PanedClass o => o -> Paned -panedAdd1 :: (PanedClass self, WidgetClass child) => self -> child -> IO () -panedAdd2 :: (PanedClass self, WidgetClass child) => self -> child -> IO () -panedPack1 :: (PanedClass self, WidgetClass child) => self -> child -> Bool -> Bool -> IO () -panedPack2 :: (PanedClass self, WidgetClass child) => self -> child -> Bool -> Bool -> IO () -panedSetPosition :: PanedClass self => self -> Int -> IO () -panedGetPosition :: PanedClass self => self -> IO Int -panedGetChild1 :: PanedClass self => self -> IO (Maybe Widget) -panedGetChild2 :: PanedClass self => self -> IO (Maybe Widget) -panedPosition :: PanedClass self => Attr self Int -panedPositionSet :: PanedClass self => Attr self Bool -panedMinPosition :: PanedClass self => ReadAttr self Int -panedMaxPosition :: PanedClass self => ReadAttr self Int -panedChildResize :: (PanedClass self, WidgetClass child) => child -> Attr self Bool -panedChildShrink :: (PanedClass self, WidgetClass child) => child -> Attr self Bool -onCycleChildFocus :: PanedClass self => self -> (Bool -> IO Bool) -> IO (ConnectId self) -afterCycleChildFocus :: PanedClass self => self -> (Bool -> IO Bool) -> IO (ConnectId self) -onToggleHandleFocus :: PanedClass self => self -> IO Bool -> IO (ConnectId self) -afterToggleHandleFocus :: PanedClass self => self -> IO Bool -> IO (ConnectId self) -onMoveHandle :: PanedClass self => self -> (ScrollType -> IO Bool) -> IO (ConnectId self) -afterMoveHandle :: PanedClass self => self -> (ScrollType -> IO Bool) -> IO (ConnectId self) -onCycleHandleFocus :: PanedClass self => self -> (Bool -> IO Bool) -> IO (ConnectId self) -afterCycleHandleFocus :: PanedClass self => self -> (Bool -> IO Bool) -> IO (ConnectId self) -onAcceptPosition :: PanedClass self => self -> IO Bool -> IO (ConnectId self) -afterAcceptPosition :: PanedClass self => self -> IO Bool -> IO (ConnectId self) -onCancelPosition :: PanedClass self => self -> IO Bool -> IO (ConnectId self) -afterCancelPosition :: PanedClass self => self -> IO Bool -> IO (ConnectId self) - -module Graphics.UI.Gtk.Layout.Fixed -data Fixed -instance ContainerClass Fixed -instance FixedClass Fixed -instance GObjectClass Fixed -instance ObjectClass Fixed -instance WidgetClass Fixed -class ContainerClass o => FixedClass o -instance FixedClass Fixed -castToFixed :: GObjectClass obj => obj -> Fixed -toFixed :: FixedClass o => o -> Fixed -fixedNew :: IO Fixed -fixedPut :: (FixedClass self, WidgetClass widget) => self -> widget -> (Int, Int) -> IO () -fixedMove :: (FixedClass self, WidgetClass widget) => self -> widget -> (Int, Int) -> IO () -fixedSetHasWindow :: FixedClass self => self -> Bool -> IO () -fixedGetHasWindow :: FixedClass self => self -> IO Bool -fixedHasWindow :: FixedClass self => Attr self Bool -fixedChildX :: (FixedClass self, WidgetClass child) => child -> Attr self Int -fixedChildY :: (FixedClass self, WidgetClass child) => child -> Attr self Int - -module Graphics.UI.Gtk.Layout.Layout -data Layout -instance ContainerClass Layout -instance GObjectClass Layout -instance LayoutClass Layout -instance ObjectClass Layout -instance WidgetClass Layout -class ContainerClass o => LayoutClass o -instance LayoutClass Layout -castToLayout :: GObjectClass obj => obj -> Layout -toLayout :: LayoutClass o => o -> Layout -layoutNew :: Maybe Adjustment -> Maybe Adjustment -> IO Layout -layoutPut :: (LayoutClass self, WidgetClass childWidget) => self -> childWidget -> Int -> Int -> IO () -layoutMove :: (LayoutClass self, WidgetClass childWidget) => self -> childWidget -> Int -> Int -> IO () -layoutSetSize :: LayoutClass self => self -> Int -> Int -> IO () -layoutGetSize :: LayoutClass self => self -> IO (Int, Int) -layoutGetHAdjustment :: LayoutClass self => self -> IO Adjustment -layoutGetVAdjustment :: LayoutClass self => self -> IO Adjustment -layoutSetHAdjustment :: LayoutClass self => self -> Adjustment -> IO () -layoutSetVAdjustment :: LayoutClass self => self -> Adjustment -> IO () -layoutGetDrawWindow :: Layout -> IO DrawWindow -layoutHAdjustment :: LayoutClass self => Attr self Adjustment -layoutVAdjustment :: LayoutClass self => Attr self Adjustment -layoutWidth :: LayoutClass self => Attr self Int -layoutHeight :: LayoutClass self => Attr self Int -layoutChildX :: (LayoutClass self, WidgetClass child) => child -> Attr self Int -layoutChildY :: (LayoutClass self, WidgetClass child) => child -> Attr self Int -onSetScrollAdjustments :: LayoutClass self => self -> (Adjustment -> Adjustment -> IO ()) -> IO (ConnectId self) -afterSetScrollAdjustments :: LayoutClass self => self -> (Adjustment -> Adjustment -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Layout.Notebook -data Notebook -instance ContainerClass Notebook -instance GObjectClass Notebook -instance NotebookClass Notebook -instance ObjectClass Notebook -instance WidgetClass Notebook -class ContainerClass o => NotebookClass o -instance NotebookClass Notebook -castToNotebook :: GObjectClass obj => obj -> Notebook -toNotebook :: NotebookClass o => o -> Notebook -notebookNew :: IO Notebook -notebookAppendPage :: (NotebookClass self, WidgetClass child) => self -> child -> String -> IO Int -notebookAppendPageMenu :: (NotebookClass self, WidgetClass child, WidgetClass tabLabel, WidgetClass menuLabel) => self -> child -> tabLabel -> menuLabel -> IO Int -notebookPrependPage :: (NotebookClass self, WidgetClass child) => self -> child -> String -> IO Int -notebookPrependPageMenu :: (NotebookClass self, WidgetClass child, WidgetClass tabLabel, WidgetClass menuLabel) => self -> child -> tabLabel -> menuLabel -> IO Int -notebookInsertPage :: (NotebookClass self, WidgetClass child) => self -> child -> String -> Int -> IO Int -notebookInsertPageMenu :: (NotebookClass self, WidgetClass child, WidgetClass tabLabel, WidgetClass menuLabel) => self -> child -> tabLabel -> menuLabel -> Int -> IO Int -notebookRemovePage :: NotebookClass self => self -> Int -> IO () -notebookPageNum :: (NotebookClass self, WidgetClass w) => self -> w -> IO (Maybe Int) -notebookSetCurrentPage :: NotebookClass self => self -> Int -> IO () -notebookNextPage :: NotebookClass self => self -> IO () -notebookPrevPage :: NotebookClass self => self -> IO () -notebookReorderChild :: (NotebookClass self, WidgetClass child) => self -> child -> Int -> IO () -data PositionType -PosLeft :: PositionType -PosRight :: PositionType -PosTop :: PositionType -PosBottom :: PositionType -instance Enum PositionType -instance Eq PositionType -notebookSetTabPos :: NotebookClass self => self -> PositionType -> IO () -notebookGetTabPos :: NotebookClass self => self -> IO PositionType -notebookSetShowTabs :: NotebookClass self => self -> Bool -> IO () -notebookGetShowTabs :: NotebookClass self => self -> IO Bool -notebookSetShowBorder :: NotebookClass self => self -> Bool -> IO () -notebookGetShowBorder :: NotebookClass self => self -> IO Bool -notebookSetScrollable :: NotebookClass self => self -> Bool -> IO () -notebookGetScrollable :: NotebookClass self => self -> IO Bool -notebookSetTabBorder :: NotebookClass self => self -> Int -> IO () -notebookSetTabHBorder :: NotebookClass self => self -> Int -> IO () -notebookSetTabVBorder :: NotebookClass self => self -> Int -> IO () -notebookSetPopup :: NotebookClass self => self -> Bool -> IO () -notebookGetCurrentPage :: NotebookClass self => self -> IO Int -notebookSetMenuLabel :: (NotebookClass self, WidgetClass child, WidgetClass menuLabel) => self -> child -> Maybe menuLabel -> IO () -notebookGetMenuLabel :: (NotebookClass self, WidgetClass child) => self -> child -> IO (Maybe Widget) -notebookSetMenuLabelText :: (NotebookClass self, WidgetClass child) => self -> child -> String -> IO () -notebookGetMenuLabelText :: (NotebookClass self, WidgetClass child) => self -> child -> IO (Maybe String) -notebookGetNthPage :: NotebookClass self => self -> Int -> IO (Maybe Widget) -notebookGetNPages :: NotebookClass self => self -> IO Int -notebookGetTabLabel :: (NotebookClass self, WidgetClass child) => self -> child -> IO (Maybe Widget) -notebookGetTabLabelText :: (NotebookClass self, WidgetClass child) => self -> child -> IO (Maybe String) -data Packing -PackRepel :: Packing -PackGrow :: Packing -PackNatural :: Packing -instance Enum Packing -instance Eq Packing -data PackType -PackStart :: PackType -PackEnd :: PackType -instance Enum PackType -instance Eq PackType -notebookQueryTabLabelPacking :: (NotebookClass self, WidgetClass child) => self -> child -> IO (Packing, PackType) -notebookSetTabLabelPacking :: (NotebookClass self, WidgetClass child) => self -> child -> Packing -> PackType -> IO () -notebookSetHomogeneousTabs :: NotebookClass self => self -> Bool -> IO () -notebookSetTabLabel :: (NotebookClass self, WidgetClass child, WidgetClass tabLabel) => self -> child -> tabLabel -> IO () -notebookSetTabLabelText :: (NotebookClass self, WidgetClass child) => self -> child -> String -> IO () -notebookPage :: NotebookClass self => Attr self Int -notebookTabPos :: NotebookClass self => Attr self PositionType -notebookTabBorder :: NotebookClass self => WriteAttr self Int -notebookTabHborder :: NotebookClass self => Attr self Int -notebookTabVborder :: NotebookClass self => Attr self Int -notebookShowTabs :: NotebookClass self => Attr self Bool -notebookShowBorder :: NotebookClass self => Attr self Bool -notebookScrollable :: NotebookClass self => Attr self Bool -notebookEnablePopup :: NotebookClass self => Attr self Bool -notebookHomogeneous :: NotebookClass self => Attr self Bool -notebookCurrentPage :: NotebookClass self => Attr self Int -notebookChildTabLabel :: (NotebookClass self, WidgetClass child) => child -> Attr self String -notebookChildMenuLabel :: (NotebookClass self, WidgetClass child) => child -> Attr self String -notebookChildPosition :: (NotebookClass self, WidgetClass child) => child -> Attr self Int -notebookChildTabPacking :: (NotebookClass self, WidgetClass child) => child -> Attr self Packing -notebookChildTabPackType :: (NotebookClass self, WidgetClass child) => child -> Attr self PackType -onSwitchPage :: NotebookClass nb => nb -> (Int -> IO ()) -> IO (ConnectId nb) -afterSwitchPage :: NotebookClass nb => nb -> (Int -> IO ()) -> IO (ConnectId nb) - -module Graphics.UI.Gtk.Layout.Table -data Table -instance ContainerClass Table -instance GObjectClass Table -instance ObjectClass Table -instance TableClass Table -instance WidgetClass Table -class ContainerClass o => TableClass o -instance TableClass Table -castToTable :: GObjectClass obj => obj -> Table -toTable :: TableClass o => o -> Table -tableNew :: Int -> Int -> Bool -> IO Table -tableResize :: TableClass self => self -> Int -> Int -> IO () -data AttachOptions -Expand :: AttachOptions -Shrink :: AttachOptions -Fill :: AttachOptions -instance Bounded AttachOptions -instance Enum AttachOptions -instance Eq AttachOptions -instance Flags AttachOptions -tableAttach :: (TableClass self, WidgetClass child) => self -> child -> Int -> Int -> Int -> Int -> [AttachOptions] -> [AttachOptions] -> Int -> Int -> IO () -tableAttachDefaults :: (TableClass self, WidgetClass widget) => self -> widget -> Int -> Int -> Int -> Int -> IO () -tableSetRowSpacing :: TableClass self => self -> Int -> Int -> IO () -tableGetRowSpacing :: TableClass self => self -> Int -> IO Int -tableSetColSpacing :: TableClass self => self -> Int -> Int -> IO () -tableGetColSpacing :: TableClass self => self -> Int -> IO Int -tableSetRowSpacings :: TableClass self => self -> Int -> IO () -tableGetDefaultRowSpacing :: TableClass self => self -> IO Int -tableSetColSpacings :: TableClass self => self -> Int -> IO () -tableGetDefaultColSpacing :: TableClass self => self -> IO Int -tableSetHomogeneous :: TableClass self => self -> Bool -> IO () -tableGetHomogeneous :: TableClass self => self -> IO Bool -tableNRows :: TableClass self => Attr self Int -tableNColumns :: TableClass self => Attr self Int -tableRowSpacing :: TableClass self => Attr self Int -tableColumnSpacing :: TableClass self => Attr self Int -tableHomogeneous :: TableClass self => Attr self Bool -tableChildLeftAttach :: (TableClass self, WidgetClass child) => child -> Attr self Int -tableChildRightAttach :: (TableClass self, WidgetClass child) => child -> Attr self Int -tableChildTopAttach :: (TableClass self, WidgetClass child) => child -> Attr self Int -tableChildBottomAttach :: (TableClass self, WidgetClass child) => child -> Attr self Int -tableChildXOptions :: (TableClass self, WidgetClass child) => child -> Attr self [AttachOptions] -tableChildYOptions :: (TableClass self, WidgetClass child) => child -> Attr self [AttachOptions] -tableChildXPadding :: (TableClass self, WidgetClass child) => child -> Attr self Int -tableChildYPadding :: (TableClass self, WidgetClass child) => child -> Attr self Int - -module Graphics.UI.Gtk.MenuComboToolbar.Menu -data Menu -instance ContainerClass Menu -instance GObjectClass Menu -instance MenuClass Menu -instance MenuShellClass Menu -instance ObjectClass Menu -instance WidgetClass Menu -class MenuShellClass o => MenuClass o -instance MenuClass Menu -castToMenu :: GObjectClass obj => obj -> Menu -toMenu :: MenuClass o => o -> Menu -menuNew :: IO Menu -menuReorderChild :: (MenuClass self, MenuItemClass child) => self -> child -> Int -> IO () -menuPopup :: MenuClass self => self -> Event -> IO () -menuSetAccelGroup :: MenuClass self => self -> AccelGroup -> IO () -menuGetAccelGroup :: MenuClass self => self -> IO AccelGroup -menuSetAccelPath :: MenuClass self => self -> String -> IO () -menuSetTitle :: MenuClass self => self -> String -> IO () -menuGetTitle :: MenuClass self => self -> IO (Maybe String) -menuPopdown :: MenuClass self => self -> IO () -menuReposition :: MenuClass self => self -> IO () -menuGetActive :: MenuClass self => self -> IO MenuItem -menuSetActive :: MenuClass self => self -> Int -> IO () -menuSetTearoffState :: MenuClass self => self -> Bool -> IO () -menuGetTearoffState :: MenuClass self => self -> IO Bool -menuAttachToWidget :: (MenuClass self, WidgetClass attachWidget) => self -> attachWidget -> IO () -menuDetach :: MenuClass self => self -> IO () -menuGetAttachWidget :: MenuClass self => self -> IO (Maybe Widget) -menuSetScreen :: MenuClass self => self -> Maybe Screen -> IO () -menuSetMonitor :: MenuClass self => self -> Int -> IO () -menuAttach :: (MenuClass self, MenuItemClass child) => self -> child -> Int -> Int -> Int -> Int -> IO () -menuGetForAttachWidget :: WidgetClass widget => widget -> IO [Menu] -menuTearoffState :: MenuClass self => Attr self Bool -menuAccelGroup :: MenuClass self => Attr self AccelGroup -menuActive :: MenuClass self => ReadWriteAttr self MenuItem Int -menuTitle :: MenuClass self => ReadWriteAttr self (Maybe String) String -menuChildLeftAttach :: (MenuClass self, WidgetClass child) => child -> Attr self Int -menuChildRightAttach :: (MenuClass self, WidgetClass child) => child -> Attr self Int -menuChildTopAttach :: (MenuClass self, WidgetClass child) => child -> Attr self Int -menuChildBottomAttach :: (MenuClass self, WidgetClass child) => child -> Attr self Int - -module Graphics.UI.Gtk.MenuComboToolbar.Toolbar -data Toolbar -instance ContainerClass Toolbar -instance GObjectClass Toolbar -instance ObjectClass Toolbar -instance ToolbarClass Toolbar -instance WidgetClass Toolbar -class ContainerClass o => ToolbarClass o -instance ToolbarClass Toolbar -castToToolbar :: GObjectClass obj => obj -> Toolbar -toToolbar :: ToolbarClass o => o -> Toolbar -data Orientation -OrientationHorizontal :: Orientation -OrientationVertical :: Orientation -instance Enum Orientation -instance Eq Orientation -data ToolbarStyle -ToolbarIcons :: ToolbarStyle -ToolbarText :: ToolbarStyle -ToolbarBoth :: ToolbarStyle -ToolbarBothHoriz :: ToolbarStyle -instance Enum ToolbarStyle -instance Eq ToolbarStyle -toolbarNew :: IO Toolbar -toolbarInsertNewButton :: ToolbarClass self => self -> Int -> String -> Maybe (String, String) -> IO Button -toolbarAppendNewButton :: ToolbarClass self => self -> String -> Maybe (String, String) -> IO Button -toolbarPrependNewButton :: ToolbarClass self => self -> String -> Maybe (String, String) -> IO Button -toolbarInsertNewToggleButton :: ToolbarClass self => self -> Int -> String -> Maybe (String, String) -> IO ToggleButton -toolbarAppendNewToggleButton :: ToolbarClass self => self -> String -> Maybe (String, String) -> IO ToggleButton -toolbarPrependNewToggleButton :: ToolbarClass self => self -> String -> Maybe (String, String) -> IO ToggleButton -toolbarInsertNewRadioButton :: (ToolbarClass self, RadioButtonClass rb) => self -> Int -> String -> Maybe (String, String) -> Maybe rb -> IO RadioButton -toolbarAppendNewRadioButton :: (ToolbarClass self, RadioButtonClass rb) => self -> String -> Maybe (String, String) -> Maybe rb -> IO RadioButton -toolbarPrependNewRadioButton :: (ToolbarClass self, RadioButtonClass rb) => self -> String -> Maybe (String, String) -> Maybe rb -> IO RadioButton -toolbarInsertNewWidget :: (ToolbarClass self, WidgetClass w) => self -> Int -> w -> Maybe (String, String) -> IO () -toolbarAppendNewWidget :: (ToolbarClass self, WidgetClass w) => self -> w -> Maybe (String, String) -> IO () -toolbarPrependNewWidget :: (ToolbarClass self, WidgetClass w) => self -> w -> Maybe (String, String) -> IO () -toolbarSetOrientation :: ToolbarClass self => self -> Orientation -> IO () -toolbarGetOrientation :: ToolbarClass self => self -> IO Orientation -toolbarSetStyle :: ToolbarClass self => self -> ToolbarStyle -> IO () -toolbarGetStyle :: ToolbarClass self => self -> IO ToolbarStyle -toolbarUnsetStyle :: ToolbarClass self => self -> IO () -toolbarSetTooltips :: ToolbarClass self => self -> Bool -> IO () -toolbarGetTooltips :: ToolbarClass self => self -> IO Bool -type IconSize = Int -iconSizeInvalid :: IconSize -iconSizeSmallToolbar :: IconSize -iconSizeLargeToolbar :: IconSize -toolbarSetIconSize :: ToolbarClass self => self -> IconSize -> IO () -toolbarGetIconSize :: ToolbarClass self => self -> IO IconSize -toolbarInsert :: (ToolbarClass self, ToolItemClass item) => self -> item -> Int -> IO () -toolbarGetItemIndex :: (ToolbarClass self, ToolItemClass item) => self -> item -> IO Int -toolbarGetNItems :: ToolbarClass self => self -> IO Int -toolbarGetNthItem :: ToolbarClass self => self -> Int -> IO (Maybe ToolItem) -toolbarGetDropIndex :: ToolbarClass self => self -> (Int, Int) -> IO Int -toolbarSetDropHighlightItem :: (ToolbarClass self, ToolItemClass toolItem) => self -> Maybe toolItem -> Int -> IO () -toolbarSetShowArrow :: ToolbarClass self => self -> Bool -> IO () -toolbarGetShowArrow :: ToolbarClass self => self -> IO Bool -data ReliefStyle -ReliefNormal :: ReliefStyle -ReliefHalf :: ReliefStyle -ReliefNone :: ReliefStyle -instance Enum ReliefStyle -instance Eq ReliefStyle -toolbarGetReliefStyle :: ToolbarClass self => self -> IO ReliefStyle -toolbarOrientation :: ToolbarClass self => Attr self Orientation -toolbarShowArrow :: ToolbarClass self => Attr self Bool -toolbarTooltips :: ToolbarClass self => Attr self Bool -toolbarStyle :: ToolbarClass self => Attr self ToolbarStyle -toolbarChildExpand :: (ToolbarClass self, WidgetClass child) => child -> Attr self Bool -toolbarChildHomogeneous :: (ToolbarClass self, WidgetClass child) => child -> Attr self Bool -onOrientationChanged :: ToolbarClass self => self -> (Orientation -> IO ()) -> IO (ConnectId self) -afterOrientationChanged :: ToolbarClass self => self -> (Orientation -> IO ()) -> IO (ConnectId self) -onStyleChanged :: ToolbarClass self => self -> (ToolbarStyle -> IO ()) -> IO (ConnectId self) -afterStyleChanged :: ToolbarClass self => self -> (ToolbarStyle -> IO ()) -> IO (ConnectId self) -onPopupContextMenu :: ToolbarClass self => self -> (Int -> Int -> Int -> IO Bool) -> IO (ConnectId self) -afterPopupContextMenu :: ToolbarClass self => self -> (Int -> Int -> Int -> IO Bool) -> IO (ConnectId self) - -module Graphics.UI.Gtk.Abstract.Container -data Container -instance ContainerClass Container -instance GObjectClass Container -instance ObjectClass Container -instance WidgetClass Container -class WidgetClass o => ContainerClass o -instance ContainerClass AboutDialog -instance ContainerClass Alignment -instance ContainerClass AspectFrame -instance ContainerClass Bin -instance ContainerClass Box -instance ContainerClass Button -instance ContainerClass ButtonBox -instance ContainerClass CList -instance ContainerClass CTree -instance ContainerClass CheckButton -instance ContainerClass CheckMenuItem -instance ContainerClass ColorButton -instance ContainerClass ColorSelection -instance ContainerClass ColorSelectionDialog -instance ContainerClass Combo -instance ContainerClass ComboBox -instance ContainerClass ComboBoxEntry -instance ContainerClass Container -instance ContainerClass Dialog -instance ContainerClass EventBox -instance ContainerClass Expander -instance ContainerClass FileChooserButton -instance ContainerClass FileChooserDialog -instance ContainerClass FileChooserWidget -instance ContainerClass FileSelection -instance ContainerClass Fixed -instance ContainerClass FontButton -instance ContainerClass FontSelection -instance ContainerClass FontSelectionDialog -instance ContainerClass Frame -instance ContainerClass GammaCurve -instance ContainerClass HBox -instance ContainerClass HButtonBox -instance ContainerClass HPaned -instance ContainerClass HandleBox -instance ContainerClass IconView -instance ContainerClass ImageMenuItem -instance ContainerClass InputDialog -instance ContainerClass Item -instance ContainerClass Layout -instance ContainerClass List -instance ContainerClass ListItem -instance ContainerClass Menu -instance ContainerClass MenuBar -instance ContainerClass MenuItem -instance ContainerClass MenuShell -instance ContainerClass MenuToolButton -instance ContainerClass MessageDialog -instance ContainerClass MozEmbed -instance ContainerClass Notebook -instance ContainerClass OptionMenu -instance ContainerClass Paned -instance ContainerClass Plug -instance ContainerClass RadioButton -instance ContainerClass RadioMenuItem -instance ContainerClass RadioToolButton -instance ContainerClass ScrolledWindow -instance ContainerClass SeparatorMenuItem -instance ContainerClass SeparatorToolItem -instance ContainerClass Socket -instance ContainerClass SourceView -instance ContainerClass Statusbar -instance ContainerClass Table -instance ContainerClass TearoffMenuItem -instance ContainerClass TextView -instance ContainerClass ToggleButton -instance ContainerClass ToggleToolButton -instance ContainerClass ToolButton -instance ContainerClass ToolItem -instance ContainerClass Toolbar -instance ContainerClass TreeView -instance ContainerClass VBox -instance ContainerClass VButtonBox -instance ContainerClass VPaned -instance ContainerClass Viewport -instance ContainerClass Window -castToContainer :: GObjectClass obj => obj -> Container -toContainer :: ContainerClass o => o -> Container -type ContainerForeachCB = Widget -> IO () -data ResizeMode -ResizeParent :: ResizeMode -ResizeQueue :: ResizeMode -ResizeImmediate :: ResizeMode -instance Enum ResizeMode -instance Eq ResizeMode -containerAdd :: (ContainerClass self, WidgetClass widget) => self -> widget -> IO () -containerRemove :: (ContainerClass self, WidgetClass widget) => self -> widget -> IO () -containerForeach :: ContainerClass self => self -> ContainerForeachCB -> IO () -containerForall :: ContainerClass self => self -> ContainerForeachCB -> IO () -containerGetChildren :: ContainerClass self => self -> IO [Widget] -data DirectionType -DirTabForward :: DirectionType -DirTabBackward :: DirectionType -DirUp :: DirectionType -DirDown :: DirectionType -DirLeft :: DirectionType -DirRight :: DirectionType -instance Enum DirectionType -instance Eq DirectionType -containerSetFocusChild :: (ContainerClass self, WidgetClass child) => self -> child -> IO () -containerSetFocusChain :: ContainerClass self => self -> [Widget] -> IO () -containerGetFocusChain :: ContainerClass self => self -> IO (Maybe [Widget]) -containerUnsetFocusChain :: ContainerClass self => self -> IO () -containerSetFocusVAdjustment :: ContainerClass self => self -> Adjustment -> IO () -containerGetFocusVAdjustment :: ContainerClass self => self -> IO (Maybe Adjustment) -containerSetFocusHAdjustment :: ContainerClass self => self -> Adjustment -> IO () -containerGetFocusHAdjustment :: ContainerClass self => self -> IO (Maybe Adjustment) -containerResizeChildren :: ContainerClass self => self -> IO () -containerSetBorderWidth :: ContainerClass self => self -> Int -> IO () -containerGetBorderWidth :: ContainerClass self => self -> IO Int -containerGetResizeMode :: ContainerClass self => self -> IO ResizeMode -containerSetResizeMode :: ContainerClass self => self -> ResizeMode -> IO () -containerResizeMode :: ContainerClass self => Attr self ResizeMode -containerBorderWidth :: ContainerClass self => Attr self Int -containerChild :: (ContainerClass self, WidgetClass widget) => WriteAttr self widget -containerFocusHAdjustment :: ContainerClass self => ReadWriteAttr self (Maybe Adjustment) Adjustment -containerFocusVAdjustment :: ContainerClass self => ReadWriteAttr self (Maybe Adjustment) Adjustment -onAdd :: ContainerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) -afterAdd :: ContainerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) -onCheckResize :: ContainerClass self => self -> IO () -> IO (ConnectId self) -afterCheckResize :: ContainerClass self => self -> IO () -> IO (ConnectId self) -onFocus :: ContainerClass con => con -> (DirectionType -> IO DirectionType) -> IO (ConnectId con) -afterFocus :: ContainerClass con => con -> (DirectionType -> IO DirectionType) -> IO (ConnectId con) -onRemove :: ContainerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) -afterRemove :: ContainerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) -onSetFocusChild :: ContainerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) -afterSetFocusChild :: ContainerClass self => self -> (Widget -> IO ()) -> IO (ConnectId self) - -module Graphics.UI.Gtk.MenuComboToolbar.Combo -data Combo -instance BoxClass Combo -instance ComboClass Combo -instance ContainerClass Combo -instance GObjectClass Combo -instance HBoxClass Combo -instance ObjectClass Combo -instance WidgetClass Combo -class HBoxClass o => ComboClass o -instance ComboClass Combo -castToCombo :: GObjectClass obj => obj -> Combo -toCombo :: ComboClass o => o -> Combo -comboNew :: IO Combo -comboSetPopdownStrings :: ComboClass self => self -> [String] -> IO () -comboSetValueInList :: ComboClass self => self -> Bool -> Bool -> IO () -comboSetUseArrows :: ComboClass self => self -> Bool -> IO () -comboSetUseArrowsAlways :: ComboClass self => self -> Bool -> IO () -comboSetCaseSensitive :: ComboClass self => self -> Bool -> IO () -comboDisableActivate :: ComboClass self => self -> IO () -comboEnableArrowKeys :: ComboClass self => Attr self Bool -comboEnableArrowsAlways :: ComboClass self => Attr self Bool -comboCaseSensitive :: ComboClass self => Attr self Bool -comboAllowEmpty :: ComboClass self => Attr self Bool -comboValueInList :: ComboClass self => Attr self Bool - -module Graphics.UI.Gtk.Abstract.ButtonBox -data ButtonBox -instance BoxClass ButtonBox -instance ButtonBoxClass ButtonBox -instance ContainerClass ButtonBox -instance GObjectClass ButtonBox -instance ObjectClass ButtonBox -instance WidgetClass ButtonBox -class BoxClass o => ButtonBoxClass o -instance ButtonBoxClass ButtonBox -instance ButtonBoxClass HButtonBox -instance ButtonBoxClass VButtonBox -castToButtonBox :: GObjectClass obj => obj -> ButtonBox -toButtonBox :: ButtonBoxClass o => o -> ButtonBox -data ButtonBoxStyle -ButtonboxDefaultStyle :: ButtonBoxStyle -ButtonboxSpread :: ButtonBoxStyle -ButtonboxEdge :: ButtonBoxStyle -ButtonboxStart :: ButtonBoxStyle -ButtonboxEnd :: ButtonBoxStyle -instance Enum ButtonBoxStyle -instance Eq ButtonBoxStyle -buttonBoxGetLayout :: ButtonBoxClass self => self -> IO ButtonBoxStyle -buttonBoxSetLayout :: ButtonBoxClass self => self -> ButtonBoxStyle -> IO () -buttonBoxSetChildSecondary :: (ButtonBoxClass self, WidgetClass child) => self -> child -> Bool -> IO () -buttonBoxGetChildSecondary :: (ButtonBoxClass self, WidgetClass child) => self -> child -> IO Bool -buttonBoxLayoutStyle :: ButtonBoxClass self => Attr self ButtonBoxStyle -buttonBoxChildSecondary :: (ButtonBoxClass self, WidgetClass child) => child -> Attr self Bool - -module Graphics.UI.Gtk.Abstract.Box -data Box -instance BoxClass Box -instance ContainerClass Box -instance GObjectClass Box -instance ObjectClass Box -instance WidgetClass Box -class ContainerClass o => BoxClass o -instance BoxClass Box -instance BoxClass ButtonBox -instance BoxClass ColorSelection -instance BoxClass Combo -instance BoxClass FileChooserButton -instance BoxClass FileChooserWidget -instance BoxClass FontSelection -instance BoxClass GammaCurve -instance BoxClass HBox -instance BoxClass HButtonBox -instance BoxClass Statusbar -instance BoxClass VBox -instance BoxClass VButtonBox -castToBox :: GObjectClass obj => obj -> Box -toBox :: BoxClass o => o -> Box -data Packing -PackRepel :: Packing -PackGrow :: Packing -PackNatural :: Packing -instance Enum Packing -instance Eq Packing -boxPackStart :: (BoxClass self, WidgetClass child) => self -> child -> Packing -> Int -> IO () -boxPackEnd :: (BoxClass self, WidgetClass child) => self -> child -> Packing -> Int -> IO () -boxPackStartDefaults :: (BoxClass self, WidgetClass widget) => self -> widget -> IO () -boxPackEndDefaults :: (BoxClass self, WidgetClass widget) => self -> widget -> IO () -boxGetHomogeneous :: BoxClass self => self -> IO Bool -boxSetHomogeneous :: BoxClass self => self -> Bool -> IO () -boxGetSpacing :: BoxClass self => self -> IO Int -boxSetSpacing :: BoxClass self => self -> Int -> IO () -boxReorderChild :: (BoxClass self, WidgetClass child) => self -> child -> Int -> IO () -boxQueryChildPacking :: (BoxClass self, WidgetClass child) => self -> child -> IO (Packing, Int, PackType) -boxSetChildPacking :: (BoxClass self, WidgetClass child) => self -> child -> Packing -> Int -> PackType -> IO () -boxSpacing :: BoxClass self => Attr self Int -boxHomogeneous :: BoxClass self => Attr self Bool -boxChildPacking :: (BoxClass self, WidgetClass child) => child -> Attr self Packing -boxChildPadding :: (BoxClass self, WidgetClass child) => child -> Attr self Int -boxChildPackType :: (BoxClass self, WidgetClass child) => child -> Attr self PackType -boxChildPosition :: (BoxClass self, WidgetClass child) => child -> Attr self Int - -module Graphics.UI.Gtk.Abstract.Bin -data Bin -instance BinClass Bin -instance ContainerClass Bin -instance GObjectClass Bin -instance ObjectClass Bin -instance WidgetClass Bin -class ContainerClass o => BinClass o -instance BinClass AboutDialog -instance BinClass Alignment -instance BinClass AspectFrame -instance BinClass Bin -instance BinClass Button -instance BinClass CheckButton -instance BinClass CheckMenuItem -instance BinClass ColorButton -instance BinClass ColorSelectionDialog -instance BinClass ComboBox -instance BinClass ComboBoxEntry -instance BinClass Dialog -instance BinClass EventBox -instance BinClass Expander -instance BinClass FileChooserDialog -instance BinClass FileSelection -instance BinClass FontButton -instance BinClass FontSelectionDialog -instance BinClass Frame -instance BinClass HandleBox -instance BinClass ImageMenuItem -instance BinClass InputDialog -instance BinClass Item -instance BinClass ListItem -instance BinClass MenuItem -instance BinClass MenuToolButton -instance BinClass MessageDialog -instance BinClass MozEmbed -instance BinClass OptionMenu -instance BinClass Plug -instance BinClass RadioButton -instance BinClass RadioMenuItem -instance BinClass RadioToolButton -instance BinClass ScrolledWindow -instance BinClass SeparatorMenuItem -instance BinClass SeparatorToolItem -instance BinClass TearoffMenuItem -instance BinClass ToggleButton -instance BinClass ToggleToolButton -instance BinClass ToolButton -instance BinClass ToolItem -instance BinClass Viewport -instance BinClass Window -castToBin :: GObjectClass obj => obj -> Bin -toBin :: BinClass o => o -> Bin -binGetChild :: BinClass self => self -> IO (Maybe Widget) - -module Graphics.Rendering.Cairo.Matrix -data Matrix -Matrix :: Double -> Double -> Double -> Double -> Double -> Double -> Matrix -instance Eq Matrix -instance Num Matrix -instance Show Matrix -instance Storable Matrix -type MatrixPtr = Ptr Matrix -identity :: Matrix -translate :: Double -> Double -> Matrix -> Matrix -scale :: Double -> Double -> Matrix -> Matrix -rotate :: Double -> Matrix -> Matrix -transformDistance :: Matrix -> (Double, Double) -> (Double, Double) -transformPoint :: Matrix -> (Double, Double) -> (Double, Double) -scalarMultiply :: Double -> Matrix -> Matrix -adjoint :: Matrix -> Matrix -invert :: Matrix -> Matrix - -module Graphics.Rendering.Cairo -renderWith :: MonadIO m => Surface -> Render a -> m a -save :: Render () -restore :: Render () -status :: Render Status -withTargetSurface :: (Surface -> Render a) -> Render a -setSourceRGB :: Double -> Double -> Double -> Render () -setSourceRGBA :: Double -> Double -> Double -> Double -> Render () -setSource :: Pattern -> Render () -setSourceSurface :: Surface -> Double -> Double -> Render () -getSource :: Render Pattern -setAntialias :: Antialias -> Render () -setDash :: [Double] -> Double -> Render () -setFillRule :: FillRule -> Render () -getFillRule :: Render FillRule -setLineCap :: LineCap -> Render () -getLineCap :: Render LineCap -setLineJoin :: LineJoin -> Render () -getLineJoin :: Render LineJoin -setLineWidth :: Double -> Render () -getLineWidth :: Render Double -setMiterLimit :: Double -> Render () -getMiterLimit :: Render Double -setOperator :: Operator -> Render () -getOperator :: Render Operator -setTolerance :: Double -> Render () -getTolerance :: Render Double -clip :: Render () -clipPreserve :: Render () -resetClip :: Render () -fill :: Render () -fillPreserve :: Render () -fillExtents :: Render (Double, Double, Double, Double) -inFill :: Double -> Double -> Render Bool -mask :: Pattern -> Render () -maskSurface :: Surface -> Double -> Double -> Render () -paint :: Render () -paintWithAlpha :: Double -> Render () -stroke :: Render () -strokePreserve :: Render () -strokeExtents :: Render (Double, Double, Double, Double) -inStroke :: Double -> Double -> Render Bool -copyPage :: Render () -showPage :: Render () -getCurrentPoint :: Render (Double, Double) -newPath :: Render () -closePath :: Render () -arc :: Double -> Double -> Double -> Double -> Double -> Render () -arcNegative :: Double -> Double -> Double -> Double -> Double -> Render () -curveTo :: Double -> Double -> Double -> Double -> Double -> Double -> Render () -lineTo :: Double -> Double -> Render () -moveTo :: Double -> Double -> Render () -rectangle :: Double -> Double -> Double -> Double -> Render () -textPath :: String -> Render () -relCurveTo :: Double -> Double -> Double -> Double -> Double -> Double -> Render () -relLineTo :: Double -> Double -> Render () -relMoveTo :: Double -> Double -> Render () -withRGBPattern :: Double -> Double -> Double -> (Pattern -> Render a) -> Render a -withRGBAPattern :: Double -> Double -> Double -> Double -> (Pattern -> Render a) -> Render a -withPatternForSurface :: Surface -> (Pattern -> Render a) -> Render a -withLinearPattern :: Double -> Double -> Double -> Double -> (Pattern -> Render a) -> Render a -withRadialPattern :: Double -> Double -> Double -> Double -> Double -> Double -> (Pattern -> Render a) -> Render a -patternAddColorStopRGB :: Pattern -> Double -> Double -> Double -> Double -> Render () -patternAddColorStopRGBA :: Pattern -> Double -> Double -> Double -> Double -> Double -> Render () -patternSetMatrix :: Pattern -> Matrix -> Render () -patternGetMatrix :: Pattern -> Render Matrix -patternSetExtend :: Pattern -> Extend -> Render () -patternGetExtend :: Pattern -> Render Extend -patternSetFilter :: Pattern -> Filter -> Render () -patternGetFilter :: Pattern -> Render Filter -translate :: Double -> Double -> Render () -scale :: Double -> Double -> Render () -rotate :: Double -> Render () -transform :: Matrix -> Render () -setMatrix :: Matrix -> Render () -getMatrix :: Render Matrix -identityMatrix :: Render () -userToDevice :: Double -> Double -> Render (Double, Double) -userToDeviceDistance :: Double -> Double -> Render (Double, Double) -deviceToUser :: Double -> Double -> Render (Double, Double) -deviceToUserDistance :: Double -> Double -> Render (Double, Double) -selectFontFace :: String -> FontSlant -> FontWeight -> Render () -setFontSize :: Double -> Render () -setFontMatrix :: Matrix -> Render () -getFontMatrix :: Render Matrix -showText :: String -> Render () -fontExtents :: Render FontExtents -textExtents :: String -> Render TextExtents -fontOptionsCreate :: Render FontOptions -fontOptionsCopy :: FontOptions -> Render FontOptions -fontOptionsMerge :: FontOptions -> FontOptions -> Render () -fontOptionsHash :: FontOptions -> Render Int -fontOptionsEqual :: FontOptions -> FontOptions -> Render Bool -fontOptionsSetAntialias :: FontOptions -> Antialias -> Render () -fontOptionsGetAntialias :: FontOptions -> Render Antialias -fontOptionsSetSubpixelOrder :: FontOptions -> SubpixelOrder -> Render () -fontOptionsGetSubpixelOrder :: FontOptions -> Render SubpixelOrder -fontOptionsSetHintStyle :: FontOptions -> HintStyle -> Render () -fontOptionsGetHintStyle :: FontOptions -> Render HintStyle -fontOptionsSetHintMetrics :: FontOptions -> HintMetrics -> Render () -fontOptionsGetHintMetrics :: FontOptions -> Render HintMetrics -withSimilarSurface :: Surface -> Content -> Int -> Int -> (Surface -> IO a) -> IO a -renderWithSimilarSurface :: Content -> Int -> Int -> (Surface -> Render a) -> Render a -surfaceGetFontOptions :: Surface -> Render FontOptions -surfaceMarkDirty :: Surface -> Render () -surfaceMarkDirtyRectangle :: Surface -> Int -> Int -> Int -> Int -> Render () -surfaceSetDeviceOffset :: Surface -> Double -> Double -> Render () -withImageSurface :: Format -> Int -> Int -> (Surface -> IO a) -> IO a -imageSurfaceGetWidth :: Surface -> Render Int -imageSurfaceGetHeight :: Surface -> Render Int -withImageSurfaceFromPNG :: FilePath -> (Surface -> IO a) -> IO a -surfaceWriteToPNG :: Surface -> FilePath -> IO () -version :: Int -versionString :: String -data Matrix -instance Eq Matrix -instance Num Matrix -instance Show Matrix -instance Storable Matrix -data Surface -data Pattern -data Status -StatusSuccess :: Status -StatusNoMemory :: Status -StatusInvalidRestore :: Status -StatusInvalidPopGroup :: Status -StatusNoCurrentPoint :: Status -StatusInvalidMatrix :: Status -StatusInvalidStatus :: Status -StatusNullPointer :: Status -StatusInvalidString :: Status -StatusInvalidPathData :: Status -StatusReadError :: Status -StatusWriteError :: Status -StatusSurfaceFinished :: Status -StatusSurfaceTypeMismatch :: Status -StatusPatternTypeMismatch :: Status -StatusInvalidContent :: Status -StatusInvalidFormat :: Status -StatusInvalidVisual :: Status -StatusFileNotFound :: Status -StatusInvalidDash :: Status -instance Enum Status -instance Eq Status -data Operator -OperatorClear :: Operator -OperatorSource :: Operator -OperatorOver :: Operator -OperatorIn :: Operator -OperatorOut :: Operator -OperatorAtop :: Operator -OperatorDest :: Operator -OperatorDestOver :: Operator -OperatorDestIn :: Operator -OperatorDestOut :: Operator -OperatorDestAtop :: Operator -OperatorXor :: Operator -OperatorAdd :: Operator -OperatorSaturate :: Operator -instance Enum Operator -data Antialias -AntialiasDefault :: Antialias -AntialiasNone :: Antialias -AntialiasGray :: Antialias -AntialiasSubpixel :: Antialias -instance Enum Antialias -data FillRule -FillRuleWinding :: FillRule -FillRuleEvenOdd :: FillRule -instance Enum FillRule -data LineCap -LineCapButt :: LineCap -LineCapRound :: LineCap -LineCapSquare :: LineCap -instance Enum LineCap -data LineJoin -LineJoinMiter :: LineJoin -LineJoinRound :: LineJoin -LineJoinBevel :: LineJoin -instance Enum LineJoin -data ScaledFont -data FontFace -data Glyph -data TextExtents -TextExtents :: Double -> Double -> Double -> Double -> Double -> Double -> TextExtents -textExtentsXbearing :: TextExtents -> Double -textExtentsYbearing :: TextExtents -> Double -textExtentsWidth :: TextExtents -> Double -textExtentsHeight :: TextExtents -> Double -textExtentsXadvance :: TextExtents -> Double -textExtentsYadvance :: TextExtents -> Double -instance Storable TextExtents -data FontExtents -FontExtents :: Double -> Double -> Double -> Double -> Double -> FontExtents -fontExtentsAscent :: FontExtents -> Double -fontExtentsDescent :: FontExtents -> Double -fontExtentsHeight :: FontExtents -> Double -fontExtentsMaxXadvance :: FontExtents -> Double -fontExtentsMaxYadvance :: FontExtents -> Double -instance Storable FontExtents -data FontSlant -FontSlantNormal :: FontSlant -FontSlantItalic :: FontSlant -FontSlantOblique :: FontSlant -instance Enum FontSlant -data FontWeight -FontWeightNormal :: FontWeight -FontWeightBold :: FontWeight -instance Enum FontWeight -data SubpixelOrder -SubpixelOrderDefault :: SubpixelOrder -SubpixelOrderRgb :: SubpixelOrder -SubpixelOrderBgr :: SubpixelOrder -SubpixelOrderVrgb :: SubpixelOrder -SubpixelOrderVbgr :: SubpixelOrder -instance Enum SubpixelOrder -data HintStyle -HintStyleDefault :: HintStyle -HintStyleNone :: HintStyle -HintStyleSlight :: HintStyle -HintStyleMedium :: HintStyle -HintStyleFull :: HintStyle -instance Enum HintStyle -data HintMetrics -HintMetricsDefault :: HintMetrics -HintMetricsOff :: HintMetrics -HintMetricsOn :: HintMetrics -instance Enum HintMetrics -data FontOptions -data Path -data Content -ContentColor :: Content -ContentAlpha :: Content -ContentColorAlpha :: Content -instance Enum Content -data Format -FormatARGB32 :: Format -FormatRGB24 :: Format -FormatA8 :: Format -FormatA1 :: Format -instance Enum Format -data Extend -ExtendNone :: Extend -ExtendRepeat :: Extend -ExtendReflect :: Extend -instance Enum Extend -data Filter -FilterFast :: Filter -FilterGood :: Filter -FilterBest :: Filter -FilterNearest :: Filter -FilterBilinear :: Filter -FilterGaussian :: Filter -instance Enum Filter - -module Graphics.UI.Gtk.Cairo -cairoFontMapNew :: IO FontMap -cairoFontMapSetResolution :: Double -> FontMap -> IO () -cairoFontMapGetResolution :: FontMap -> IO Double -cairoCreateContext :: Maybe FontMap -> IO PangoContext -cairoContextSetResolution :: PangoContext -> Double -> IO () -cairoContextGetResolution :: PangoContext -> IO Double -cairoContextSetFontOptions :: PangoContext -> FontOptions -> IO () -cairoContextGetFontOptions :: PangoContext -> IO FontOptions -renderWithDrawable :: DrawableClass drawable => drawable -> Render a -> IO a -setSourceColor :: Color -> Render () -setSourcePixbuf :: Pixbuf -> Double -> Double -> Render () -region :: Region -> Render () -updateContext :: PangoContext -> Render () -createLayout :: String -> Render PangoLayout -updateLayout :: PangoLayout -> Render () -showGlyphString :: GlyphItem -> Render () -showLayoutLine :: LayoutLine -> Render () -showLayout :: PangoLayout -> Render () -glyphStringPath :: GlyphItem -> Render () -layoutLinePath :: LayoutLine -> Render () -layoutPath :: PangoLayout -> Render () - -module Graphics.UI.Gtk - -module Graphics.UI.Gtk.Mogul.NewWidget -newTextBuffer :: Maybe TextTagTable -> IO TextBuffer -newLabel :: Maybe String -> IO Label -newNamedLabel :: WidgetName -> Maybe String -> IO Label -newAccelLabel :: String -> IO AccelLabel -newNamedAccelLabel :: WidgetName -> String -> IO AccelLabel -newArrow :: ArrowType -> ShadowType -> IO Arrow -newNamedArrow :: WidgetName -> ArrowType -> ShadowType -> IO Arrow -newImageFromFile :: FilePath -> IO Image -newNamedImageFromFile :: WidgetName -> FilePath -> IO Image -newAlignment :: Float -> Float -> Float -> Float -> IO Alignment -newNamedAlignment :: WidgetName -> Float -> Float -> Float -> Float -> IO Alignment -newFrame :: IO Frame -newNamedFrame :: WidgetName -> IO Frame -newAspectFrame :: Float -> Float -> Maybe Float -> IO AspectFrame -newNamedAspectFrame :: WidgetName -> Float -> Float -> Maybe Float -> IO AspectFrame -newButton :: IO Button -newNamedButton :: WidgetName -> IO Button -newButtonWithLabel :: String -> IO Button -newNamedButtonWithLabel :: WidgetName -> String -> IO Button -newButtonWithMnemonic :: String -> IO Button -newNamedButtonWithMnemonic :: WidgetName -> String -> IO Button -newButtonFromStock :: String -> IO Button -newNamedButtonFromStock :: WidgetName -> String -> IO Button -newToggleButton :: IO ToggleButton -newNamedToggleButton :: WidgetName -> IO ToggleButton -newToggleButtonWithLabel :: String -> IO ToggleButton -newNamedToggleButtonWithLabel :: WidgetName -> String -> IO ToggleButton -newCheckButton :: IO CheckButton -newNamedCheckButton :: WidgetName -> IO CheckButton -newCheckButtonWithLabel :: String -> IO CheckButton -newNamedCheckButtonWithLabel :: WidgetName -> String -> IO CheckButton -newCheckButtonWithMnemonic :: String -> IO CheckButton -newNamedCheckButtonWithMnemonic :: WidgetName -> String -> IO CheckButton -newRadioButton :: IO RadioButton -newNamedRadioButton :: WidgetName -> IO RadioButton -newRadioButtonWithLabel :: String -> IO RadioButton -newNamedRadioButtonWithLabel :: WidgetName -> String -> IO RadioButton -newRadioButtonJoinGroup :: RadioButton -> IO RadioButton -newNamedRadioButtonJoinGroup :: WidgetName -> RadioButton -> IO RadioButton -newRadioButtonJoinGroupWithLabel :: RadioButton -> String -> IO RadioButton -newNamedRadioButtonJoinGroupWithLabel :: WidgetName -> RadioButton -> String -> IO RadioButton -newOptionMenu :: IO OptionMenu -newNamedOptionMenu :: WidgetName -> IO OptionMenu -newMenuItem :: IO MenuItem -newNamedMenuItem :: WidgetName -> IO MenuItem -newMenuItemWithLabel :: String -> IO MenuItem -newNamedMenuItemWithLabel :: WidgetName -> String -> IO MenuItem -newCheckMenuItem :: IO CheckMenuItem -newNamedCheckMenuItem :: WidgetName -> IO CheckMenuItem -newCheckMenuItemWithLabel :: String -> IO CheckMenuItem -newNamedCheckMenuItemWithLabel :: WidgetName -> String -> IO CheckMenuItem -newRadioMenuItem :: IO RadioMenuItem -newNamedRadioMenuItem :: WidgetName -> IO RadioMenuItem -newRadioMenuItemWithLabel :: String -> IO RadioMenuItem -newNamedRadioMenuItemWithLabel :: WidgetName -> String -> IO RadioMenuItem -newRadioMenuItemJoinGroup :: RadioMenuItem -> IO RadioMenuItem -newNamedRadioMenuItemJoinGroup :: WidgetName -> RadioMenuItem -> IO RadioMenuItem -newRadioMenuItemJoinGroupWithLabel :: RadioMenuItem -> String -> IO RadioMenuItem -newNamedRadioMenuItemJoinGroupWithLabel :: WidgetName -> RadioMenuItem -> String -> IO RadioMenuItem -newTearoffMenuItem :: IO TearoffMenuItem -newNamedTearoffMenuItem :: WidgetName -> IO TearoffMenuItem -newWindow :: IO Window -newNamedWindow :: WidgetName -> IO Window -newDialog :: IO Dialog -newNamedDialog :: WidgetName -> IO Dialog -newEventBox :: IO EventBox -newNamedEventBox :: WidgetName -> IO EventBox -newHandleBox :: IO HandleBox -newNamedHandleBox :: WidgetName -> IO HandleBox -newScrolledWindow :: Maybe Adjustment -> Maybe Adjustment -> IO ScrolledWindow -newNamedScrolledWindow :: WidgetName -> Maybe Adjustment -> Maybe Adjustment -> IO ScrolledWindow -newViewport :: Adjustment -> Adjustment -> IO Viewport -newNamedViewport :: WidgetName -> Adjustment -> Adjustment -> IO Viewport -newVBox :: Bool -> Int -> IO VBox -newNamedVBox :: WidgetName -> Bool -> Int -> IO VBox -newHBox :: Bool -> Int -> IO HBox -newNamedHBox :: WidgetName -> Bool -> Int -> IO HBox -newCombo :: IO Combo -newNamedCombo :: WidgetName -> IO Combo -newStatusbar :: IO Statusbar -newNamedStatusbar :: WidgetName -> IO Statusbar -newHPaned :: IO HPaned -newNamedHPaned :: WidgetName -> IO HPaned -newVPaned :: IO VPaned -newNamedVPaned :: WidgetName -> IO VPaned -newLayout :: Maybe Adjustment -> Maybe Adjustment -> IO Layout -newNamedLayout :: WidgetName -> Maybe Adjustment -> Maybe Adjustment -> IO Layout -newMenu :: IO Menu -newNamedMenu :: WidgetName -> IO Menu -newMenuBar :: IO MenuBar -newNamedMenuBar :: WidgetName -> IO MenuBar -newNotebook :: IO Notebook -newNamedNotebook :: WidgetName -> IO Notebook -newTable :: Int -> Int -> Bool -> IO Table -newNamedTable :: WidgetName -> Int -> Int -> Bool -> IO Table -newTextView :: IO TextView -newNamedTextView :: WidgetName -> IO TextView -newToolbar :: IO Toolbar -newNamedToolbar :: WidgetName -> IO Toolbar -newCalendar :: IO Calendar -newNamedCalendar :: WidgetName -> IO Calendar -newEntry :: IO Entry -newNamedEntry :: WidgetName -> IO Entry -newSpinButton :: Adjustment -> Double -> Int -> IO SpinButton -newNamedSpinButton :: String -> Adjustment -> Double -> Int -> IO SpinButton -newSpinButtonWithRange :: Double -> Double -> Double -> IO SpinButton -newNamedSpinButtonWithRange :: WidgetName -> Double -> Double -> Double -> IO SpinButton -newHScale :: Adjustment -> IO HScale -newNamedHScale :: WidgetName -> Adjustment -> IO HScale -newVScale :: Adjustment -> IO VScale -newNamedVScale :: WidgetName -> Adjustment -> IO VScale -newHScrollbar :: Adjustment -> IO HScrollbar -newNamedHScrollbar :: WidgetName -> Adjustment -> IO HScrollbar -newVScrollbar :: Adjustment -> IO VScrollbar -newNamedVScrollbar :: WidgetName -> Adjustment -> IO VScrollbar -newHSeparator :: IO HSeparator -newNamedHSeparator :: WidgetName -> IO HSeparator -newVSeparator :: IO VSeparator -newNamedVSeparator :: WidgetName -> IO VSeparator -newProgressBar :: IO ProgressBar -newNamedProgressBar :: WidgetName -> IO ProgressBar -newAdjustment :: Double -> Double -> Double -> Double -> Double -> Double -> IO Adjustment -newTooltips :: IO Tooltips -newTreeView :: TreeModelClass tm => tm -> IO TreeView -newNamedTreeView :: TreeModelClass tm => WidgetName -> tm -> IO TreeView -newTreeViewWithModel :: TreeModelClass tm => tm -> IO TreeView -newNamedTreeViewWithModel :: TreeModelClass tm => WidgetName -> tm -> IO TreeView -newTreeViewColumn :: IO TreeViewColumn -newIconFactory :: IO IconFactory - -module Graphics.UI.Gtk.Mogul.MDialog -assureDialog :: String -> (Dialog -> IO ()) -> (Dialog -> IO ()) -> IO () - -module Graphics.UI.Gtk.Mogul.TreeList -data ListSkel -emptyListSkel :: IO ListSkel -listSkelAddAttribute :: CellRendererClass cr => ListSkel -> Attribute cr argTy -> IO (Association cr, TreeIter -> IO argTy, TreeIter -> argTy -> IO ()) -newListStore :: ListSkel -> IO ListStore -data TreeSkel -emptyTreeSkel :: IO TreeSkel -treeSkelAddAttribute :: CellRendererClass r => TreeSkel -> Attribute r argTy -> IO (Association r, TreeIter -> IO argTy, TreeIter -> argTy -> IO ()) -newTreeStore :: TreeSkel -> IO TreeStore -data Association cr -data Renderer cr -treeViewColumnNewText :: TreeViewColumn -> Bool -> Bool -> IO (Renderer CellRendererText) -treeViewColumnNewPixbuf :: TreeViewColumn -> Bool -> Bool -> IO (Renderer CellRendererPixbuf) -treeViewColumnNewToggle :: TreeViewColumn -> Bool -> Bool -> IO (Renderer CellRendererToggle) -treeViewColumnAssociate :: CellRendererClass r => Renderer r -> [Association r] -> IO () -cellRendererSetAttribute :: CellRendererClass cr => Renderer cr -> Attribute cr val -> val -> IO () -cellRendererGetAttribute :: CellRendererClass cr => Renderer cr -> Attribute cr val -> IO val -onEdited :: TreeModelClass tm => Renderer CellRendererText -> tm -> (TreeIter -> String -> IO ()) -> IO (ConnectId CellRendererText) -afterEdited :: TreeModelClass tm => Renderer CellRendererText -> tm -> (TreeIter -> String -> IO ()) -> IO (ConnectId CellRendererText) - -module Graphics.UI.Gtk.Mogul - rmfile ./scripts/hoogle/src/Web/res/gtk.txt hunk ./scripts/hoogle/src/Web/res/noresults.inc 1 -
- Your search returned no results: -
    -
  • Make sure you are using the search engine properly, it only searches for Haskell functions
  • -
  • Try a smaller substring, for example, if you searched for mapConcat, try searching for either map or concat individually.
  • -
-
rmfile ./scripts/hoogle/src/Web/res/noresults.inc hunk ./scripts/hoogle/src/Web/res/prefix.inc 1 - - - - - $ - Hoogle - - - - - - - - - - - - - - -
-
- - -
-
- rmfile ./scripts/hoogle/src/Web/res/prefix.inc hunk ./scripts/hoogle/src/Web/res/prefix_gtk.inc 1 - - - - - $ - Hoogle - - - - - - - - - - - - - - -
-
- - - -
-
- rmfile ./scripts/hoogle/src/Web/res/prefix_gtk.inc hunk ./scripts/hoogle/src/Web/res/suffix.inc 1 - - - - rmfile ./scripts/hoogle/src/Web/res/suffix.inc rmdir ./scripts/hoogle/src/Web/res hunk ./scripts/hoogle/src/Web.hs 1 -import Web.Main rmfile ./scripts/hoogle/src/Web.hs hunk ./scripts/hoogle/src/Web/CGI.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{- | - Parse the CGI arguments --} - - -module Web.CGI(cgiArgs, escape, asCgi) where - -import Hoogle.TextUtil -import System.Environment -import Data.Maybe -import Data.Char -import Numeric -import Data.List - - -cgiVariable :: IO String -cgiVariable = catch (getEnv "QUERY_STRING") - (\ _ -> do x <- getArgs - return $ concat $ intersperse " " x) - - -cgiArgs :: IO [(String, String)] -cgiArgs = do x <- cgiVariable - let args = if '=' `elem` x then x else "q=" ++ x - return $ parseArgs args - -asCgi :: [(String, String)] -> String -asCgi x = concat $ intersperse "&" $ map f x - where - f (a,b) = a ++ "=" ++ escape b - - -parseArgs :: String -> [(String, String)] -parseArgs xs = mapMaybe (parseArg . splitPair "=") $ splitList "&" xs - -parseArg Nothing = Nothing -parseArg (Just (a,b)) = Just (unescape a, unescape b) - - --- | Take an escape encoded string, and return the original -unescape :: String -> String -unescape ('+':xs) = ' ' : unescape xs -unescape ('%':a:b:xs) = unescapeChar a b : unescape xs -unescape (x:xs) = x : unescape xs -unescape [] = [] - - --- | Takes two hex digits and returns the char -unescapeChar :: Char -> Char -> Char -unescapeChar a b = chr $ (f a * 16) + f b - where - f x | isDigit x = ord x - ord '0' - | otherwise = ord (toLower x) - ord 'a' + 10 - - -escape :: String -> String -escape (x:xs) | isAlphaNum x = x : escape xs - | otherwise = '%' : escapeChar x ++ escape xs -escape [] = [] - - -escapeChar :: Char -> String -escapeChar x = case showHex (ord x) "" of - [x] -> ['0',x] - x -> x rmfile ./scripts/hoogle/src/Web/CGI.hs hunk ./scripts/hoogle/src/Web/Lambdabot.hs 1 - -module Web.Lambdabot(query) where - -import Data.List -import Data.Char - -query :: String -> IO (Maybe String) -query x = do d <- readDatabase - return $ case filter ((==) (prepSearch x) . fst) d of - (x:xs) -> Just $ formatRes (snd x) - [] -> Nothing - - -prepSearch = map toLower . reverse . dropWhile isSpace . reverse . dropWhile isSpace - -formatRes = unwords . map linky . words - -linky x | "http://" `isPrefixOf` x = "" ++ x ++ "" - | otherwise = x - - -readDatabase :: IO [(String, String)] -readDatabase = do x <- readFile "res/lambdabot.txt" - return $ f (lines x) - where - f (key:val:xs) = (key,val) : f xs - f _ = [] - rmfile ./scripts/hoogle/src/Web/Lambdabot.hs hunk ./scripts/hoogle/src/Web/Main.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{- | - The Web interface, expects to be run as a CGI script. - This does not require Haskell CGI etc, it just dumps HTML to the console --} - -module Web.Main where - -import Hoogle.Hoogle -import Hoogle.TextUtil - -import Web.CGI -import Web.Lambdabot - -import Data.Char -import System.Environment -import Data.List -import Data.Maybe -import System.Directory - - --- | Should the output be sent to the console and a file. --- If true then both, the file is 'debugFile'. --- Useful mainly for debugging. -debugOut = False - -fakeArgs :: IO [(String, String)] -fakeArgs = return $ [("q","map"), ("format","sherlock")] - - --- | The main function -main :: IO () -main = do args <- if debugOut then fakeArgs else cgiArgs - putStr "Content-type: text/html\n\n" - appendFile "log.txt" (show args ++ "\n") - let input = lookupDef "" "q" args - if null input then hoogleBlank args - else do let p = hoogleParse input - case hoogleParseError p of - Just x -> showError input x - Nothing -> showResults p args - - -lookupDef :: Eq key => val -> key -> [(key, val)] -> val -lookupDef def key list = case lookup key list of - Nothing -> def - Just x -> x - -lookupDefInt :: Eq key => Int -> key -> [(key, String)] -> Int -lookupDefInt def key list = case lookup key list of - Nothing -> def - Just x -> case reads x of - [(x,"")] -> x - _ -> def - - --- | Show the search box -hoogleBlank :: [(String,String)] -> IO () -hoogleBlank args = do - debugInit - outputFile (if ("package","gtk") `elem` args then "front_gtk" else "front") - - --- | Replace all occurances of $ with the parameter -outputFileParam :: FilePath -> String -> IO () -outputFileParam x param = do src <- readFile ("res/" ++ x ++ ".inc") - putLine (f src) - where - f ('$':xs) = param ++ f xs - f (x:xs) = x : f xs - f [] = [] - -outputFile :: FilePath -> IO () -outputFile x = do src <- readFile ("res/" ++ x ++ ".inc") - putLine src - - -showError :: String -> String -> IO () -showError input err = - do - debugInit - outputFileParam "prefix" input - outputFileParam "error" err - outputFileParam "suffix" input - - - --- | Perform a search, dump the results using 'putLine' -showResults :: Search -> [(String, String)] -> IO () -showResults input args = - do - let useGtk = ("package","gtk") `elem` args - res <- hoogleResults (if useGtk then "res/gtk.txt" else "res/hoogle.txt") input - let lres = length res - search = hoogleSearch input - tSearch = showText search - useres = take num $ drop start res - - debugInit - outputFileParam (if useGtk then "prefix_gtk" else "prefix") tSearch - - putLine $ - "
" ++ - "Searched for " ++ showTags search ++ - "" ++ - (if lres == 0 then "No results found" else f lres) ++ - "
" - - case hoogleSuggest True input of - Nothing -> return () - Just x -> putLine $ "

Hoogle says: " ++ - showTags x ++ "

" - - lam <- Web.Lambdabot.query (lookupDef "" "q" args) - case lam of - Nothing -> return () - Just x -> putLine $ "

" ++ - "Lambdabot says: " - ++ x ++ "

" - - if null res then outputFileParam "noresults" tSearch - else putLine $ "" ++ concatMap showResult useres ++ "
" - - putLine $ g lres - - putLine $ if format == "sherlock" then sherlock useres else "" - - outputFileParam "suffix" tSearch - where - start = lookupDefInt 0 "start" args - num = lookupDefInt 25 "num" args - format = lookupDef "" "format" args - nostart = filter ((/=) "start" . fst) args - - showPrev len pos = if start <= 0 then "" else - " " - - showNext len pos = if start+num >= len then "" else - " " - - - f len = - showPrev len "top" ++ - "Results " ++ show (start+1) ++ " - " ++ show (min (start+num) len) ++ " of " ++ show len ++ "" ++ - showNext len "top" - - g len = if start == 0 && len <= num then "" else - "
" ++ - showPrev len "bot" ++ - concat (zipWith h [1..10] [0,num..len]) ++ - showNext len "bot" ++ - "
" - - h num start2 = " " ++ show num ++ " " - - - -sherlock :: [Result] -> String -sherlock xs = "\n\n" - where - f res@(Result modu name typ _ _ _ _) = - "" ++ hoodoc res True ++ - "" ++ - showTags name ++ " " ++ - "(" ++ showText modu ++ ")" ++ - "\n" - - - -showTags :: TagStr -> String -showTags (Str x) = x -showTags (Tag "b" x) = "" ++ showTags x ++ "" -showTags (Tag "u" x) = "" ++ showTags x ++ "" -showTags (Tag "a" x) = "" ++ showTags x ++ "" - where - url = if "http://" `isPrefixOf` txt then txt else "?q=" ++ escape txt - txt = showText x - -showTags (Tag [n] x) | n >= '1' && n <= '6' = - "" ++ showTags x ++ "" -showTags (Tag n x) = showTags x -showTags (Tags xs) = concatMap showTags xs - - -showTagsLimit :: Int -> TagStr -> String -showTagsLimit n x = if length s > n then take (n-2) s ++ ".." else s - where - s = showText x - - -showResult :: Result -> String -showResult res@(Result modu name typ _ _ _ _) = - "" ++ - "" ++ - hoodoc res False ++ showTagsLimit 20 modu ++ "" ++ - (if null (showTags modu) then "" else ".") ++ - "" - ++ openA ++ showTags name ++ "" ++ - "" - ++ openA ++ ":: " ++ showTags typ ++ "" ++ - "" ++ - "\n" - where - openA = hoodoc res True - - -hoodoc :: Result -> Bool -> String -hoodoc res full = f $ - if not full - then modu ++ "&mode=module" - else if resultMode res == "module" - then modu ++ (if null modu then "" else ".") ++ showText (resultName res) ++ "&mode=module" - else showText (resultModule res) ++ - "&name=" ++ escape (showText (resultName res)) ++ - "&mode=" ++ resultMode res - where - modu = showText (resultModule res) - f x = "" - - --- | The file to output to if 'debugOut' is True -debugFile = "temp.htm" - - --- | Clear the debugging file -debugInit = if debugOut then writeFile debugFile "" else return () - --- | Write out a line, to console and optional to a debugging file -putLine :: String -> IO () -putLine x = do putStrLn x - if debugOut then appendFile debugFile x else return () - - --- | Read the hit count, increment it, return the new value. --- Hit count is stored in hits.txt -hitCount :: IO Integer -hitCount = do x <- readHitCount - -- HUGS SCREWS THIS UP WITHOUT `seq` - -- this should not be needed, but it is - -- (we think) - x `seq` writeHitCount (x+1) - return (x+1) - where - hitFile = "hits.txt" - - readHitCount :: IO Integer - readHitCount = - do exists <- doesFileExist hitFile - if exists - then do src <- readFile hitFile - return (parseHitCount src) - else return 0 - - writeHitCount :: Integer -> IO () - writeHitCount x = writeFile hitFile (show x) - - parseHitCount = read . head . lines - - --- | Take a piece of text and escape all the HTML special bits -escapeHTML :: String -> String -escapeHTML = concatMap f - where - f :: Char -> String - f '<' = "<" - f '>' = ">" - f '&' = "&" - f x = x:[] - rmfile ./scripts/hoogle/src/Web/Main.hs rmdir ./scripts/hoogle/src/Web hunk ./scripts/hoogle/src/Test/Test.hs 1 - -module Test where - -import Debug.QuickCheck -import Data.List -import Data.Char - -import Hoogle.Parser - - -data LineStr = LineStr String - deriving Show - - -instance Arbitrary Char where - arbitrary = oneof $ map return (spaces ++ validChars) - where - spaces = replicate 10 ' ' - validChars = ['a'..'z'] ++ ['A'..'Z'] ++ ['0'..'9'] ++ "[](),->=:!" - anyChars = map chr [0x20..0x70] - - -instance Arbitrary LineStr where - arbitrary = do x <- vector 25 - return $ LineStr x - - -prop_NoParseErrors :: LineStr -> Bool -prop_NoParseErrors (LineStr x) = - case parser x of - Left _ -> True - Right _ -> True - - - - -test1 = quickCheck prop_NoParseErrors rmfile ./scripts/hoogle/src/Test/Test.hs rmdir ./scripts/hoogle/src/Test hunk ./scripts/hoogle/src/Score.hs 1 -import Score.Main rmfile ./scripts/hoogle/src/Score.hs hunk ./scripts/hoogle/src/Score/Main.hs 1 - - - -module Score.Main where - - -import Hoogle.Database -import Hoogle.MatchType -import Hoogle.Parser -import Hoogle.MatchClass -import Hoogle.Result -import Hoogle.TypeSig -import Hoogle.General - -import System.Environment -import Data.Maybe -import Data.List -import Data.Char - - -type Phrase = [[Char]] - -type Tag = (Int, Int) - -type Knowledge = [(Phrase, Phrase, Tag)] -type Know = [(String, String, Tag)] - - -reasons :: [MatchAmount] -reasons = [minBound..maxBound] - -codes = length reasons * 2 - -reasonToCode :: Reason -> Char -reasonToCode (ReasonLeft x) = fromJust $ lookup x $ zip reasons ['a'..] -reasonToCode (ReasonRight x) = chr $ length reasons + ord (reasonToCode (ReasonLeft x)) - - -codeToReason :: Char -> Reason -codeToReason x = fromJust $ lookup x $ zip ['a'..] $ map ReasonLeft reasons ++ map ReasonRight reasons - - -main = do x <- return ["examples.txt"] -- getArgs - db <- loadDatabase "classes.txt" - y <- mapM (loadExample (classes db)) x - let knowledge = simpAll $ concatMap simpKnow $ concat y - res = "test" - writeFile "score.ecl" (eclipse knowledge) - putStr $ showKnowledge knowledge - - -simpAll xs = map fst $ filter f $ pickOne $ nub xs - where - f (x, xs) = not $ any (less x) xs - - -- is the first one completely subsumed by the second - -- i.e. the first can be deleted - -- only if there is more on the lefts, and less on the right - less (a1,a2,a3) (b1,b2,b3) = null (a1 \\ b1) && null (b2 \\ a2) - - - -simpKnow (a,b,c) = if null aa then [] else [(aa,bb,c)] - where - (aa, bb) = simpPair (sa, sb) - ([sa], [sb]) = (simp a, simp b) - - - -pickOne :: [a] -> [(a, [a])] -pickOne xs = init $ zipWith f (inits xs) (tails xs) - where f a (b:bs) = (b, a ++ bs) - - -simp x = map fst $ filter f $ pickOne $ nub $ map sort x - where - f (x, xs) = not $ any (less x) xs - less a b = let (_, res) = simpPair (a,b) in null res - - - -simpPair :: (String, String) -> (String, String) -simpPair (a,b) = f (sort a) (sort b) - where - f (x:xs) (y:ys) | x == y = f xs ys - | x < y = let (a,b) = f xs (y:ys) in (x:a,b) - | x > y = let (a,b) = f (x:xs) ys in (a,y:b) - f xs ys = (xs, ys) - - -showKnowledge :: Know -> String -showKnowledge xs = unlines $ map f xs - where - f (a,b,(a1,b1)) = g a ++ " < " ++ g b ++ " [" ++ show a1 ++ "<" ++ show b1 ++ "]" - g xs = xs -- show $ map codeToReason xs - - -loadExample :: ClassTable -> String -> IO Knowledge -loadExample ct file = do x <- readFile file - return $ concatMap (trans . order) $ bundle - $ filter (validLine . snd) $ zip [1..] $ lines x - where - bundle [] = [] - bundle (x:xs) = ((fst x, tail (snd x)):a) : bundle b - where (a, b) = break (\x -> head (snd x) == '@') xs - - order ((n,x):xs) = map (\(a,b) -> (,) a $ map (map reasonToCode) $ compareTypes ct (f b) (f x)) xs - - f = fromLeft . parseConType - - trans [] = [] - trans ((n,x):xs) = map (\(a,b) -> (x,b,(n,a))) xs ++ trans xs - - - --- Make Alan Frish happy -eclipse :: Know -> String -eclipse xs = unlines $ header ++ map f xs ++ footer - where - f (a,b,(a1,b1)) = " " ++ g a ++ " #< " ++ g b ++ "," - g xs = intersperse '+' (map toUpper xs) - - header = [ - "% Generated by Hoogle Score", - ":- lib(fd).", - "same(X,X).", - "range([]).", - "range([X|Xs]) :-", - " X :: [1..100],", - " range(Xs).", - "solver(Xs) :-", - " same(Xs, [" ++ intersperse ',' (take codes ['A'..'Z']) ++ "]),", - " range(Xs),"] - - footer = [ - " labeling(Xs)."] - - - rmfile ./scripts/hoogle/src/Score/Main.hs rmfile ./scripts/hoogle/src/Score/classes.txt hunk ./scripts/hoogle/src/Score/examples.txt 1 --- a list of examples --- used to generate a scoring system - -@ Ord a => [a] -> [a] -Ord a => a -> [a] -> [a] -[a] -> [a] -a -> [a] -> [a] -[a] -> [a] -> [a] - -@ Ord a => [a] -> [a] -[a] -> [a] -Int -> [a] -> [a] - -@ Ord a => [a] -> [a] -[a] -> [a] -a -> [a] - -@ [a] -> [b] -(a -> b) -> [a] -> [b] -[a] -> [a] -Eq a => [a] -> [a] - - -@ Int -> Bool -a -> Int -> Bool -a -> Bool -Bool - -@ a -> b -a -> b -a -> b -> a -a -> a -Int -> a -a - -@ a -> [(a,b)] -> b - -a -> [(a, b)] -> Maybe b -[(k, a)] -> a -a -> a -> a - -@ [a] -> a -[a] -> Int -> a -Ord a => [a] -> a -[a] -> Bool -Foo a => [a] -> a - -@ a -> b -> c -a -> b -> c -> d -Int -> b -> c -a -> a -> a -Ord a => a -> a -> a -a -> a -Bool -> a -> a - -@ (a, b) -> a -(a, b) -> b -a -> a -a - -@ (a -> b) -> [a] -> [b] -(a -> [b]) -> [a] -> [b] -(a -> a -> Bool) -> a -> [a] -> [a] - - -@ Ix a => i -> Array a b -a -> a -Ix a => (a, a) -> [b] -> Array a b - rmfile ./scripts/hoogle/src/Score/examples.txt rmdir ./scripts/hoogle/src/Score hunk ./scripts/hoogle/src/Hoogle/Database.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -module Hoogle.Database( - Database(..), - loadDatabase - ) where - -import Data.Maybe -import Data.List - -import Hoogle.TypeSig -import Hoogle.Parser -import Hoogle.Lexer -import Hoogle.General - -import Hoogle.MatchName -import Hoogle.MatchType -import Hoogle.TypeAlias -import Hoogle.MatchClass - - --- | An abstract data type -data Database = Database - { - aliases :: AliasTable, - names :: NameTable, - types :: TypeTable, - classes :: ClassTable - } - deriving Show - - --- | load a text file into a 'Database' -loadTextfile :: String -> Database -loadTextfile x = Database { - aliases = buildAlias $ filter isTypeAlias items, - names = buildName $ map ((,) []) modules ++ modnamed, - types = buildType $ filter (isFunc . snd) modnamed, - classes = buildClass $ filter isInstance items - } - where - -- all the items in the file - items = catLefts $ map parser $ filter validLine $ lines x - - (instances, namedItems) = partition isInstance items - (modules, modnamed) = modulify namedItems - - --- take a list of items, and return those which are modules --- and tag every other item with its module -modulify :: [Item] -> ([Item], [(ModuleName, Item)]) -modulify xs = f [] xs - where - f _ (Module x:xs) = (Module x:a, b) - where (a,b) = f x xs - - f m (x:xs) = (a, (m,x):b) - where (a,b) = f m xs - - f _ [] = ([], []) - - --- | Load a database from a file --- perform all cache'ing requried -loadDatabase :: String -> IO Database -loadDatabase file = do x <- readFile file - return $ loadTextfile x rmfile ./scripts/hoogle/src/Hoogle/Database.hs hunk ./scripts/hoogle/src/Hoogle/General.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{-| - General utilities --} -module Hoogle.General where - -import Data.List - --- | If anyone of them returns Nothing, the whole thing does -mapMaybeAll :: (a -> Maybe b) -> [a] -> Maybe [b] -mapMaybeAll f xs = g [] xs - where - g acc [] = Just (reverse acc) - g acc (x:xs) = case f x of - Just a -> g (a:acc) xs - Nothing -> Nothing - - -concatMapMaybeAll :: (a -> Maybe [b]) -> [a] -> Maybe [b] -concatMapMaybeAll f xs = case mapMaybeAll f xs of - Just a -> Just $ concat a - Nothing -> Nothing - - -idMaybeAll = mapMaybeAll id -concatIdMaybeAll = concatMapMaybeAll id - - - --- | pick all subsets (maintaining order) with a length of n --- n must be greater or equal to the length of the list passed in -selection :: Int -> [a] -> [[a]] -selection n xs = remove (len-n) len [] xs - where - len = length xs - - remove lrem lxs done todo = - if lrem == lxs then [reverse done] - else if null todo then [] - else remove lrem (lxs-1) (t:done) odo ++ remove (lrem-1) (lxs-1) done odo - where (t:odo) = todo - - - --- | all permutations of a list -permute :: [a] -> [[a]] -permute [] = [[]] -permute (x:xs) = concat $ map (\a -> zipWith f (inits a) (tails a)) (permute xs) - where - f a b = a ++ [x] ++ b - - - -catLefts :: [Either a b] -> [a] -catLefts (Left x:xs) = x : catLefts xs -catLefts (_:xs) = catLefts xs -catLefts [] = [] - - -fromLeft (Left x) = x rmfile ./scripts/hoogle/src/Hoogle/General.hs hunk ./scripts/hoogle/src/Hoogle/Hoogle.hs 1 - -module Hoogle.Hoogle( - hoogleParse, hoogleParseError, hoogleSearch, hoogleSuggest, hoogleResults, hoogleRange, - Search, module Hoogle.Result - ) where - -import Hoogle.Search -import Hoogle.Result -import Hoogle.Match -import Hoogle.TypeSig - -import Data.List -import Data.Char - - -hoogleParse :: String -> Search -hoogleParse = parseSearch - - -hoogleParseError :: Search -> Maybe String -hoogleParseError (Search _ (SearchError x)) = Just x -hoogleParseError _ = Nothing - - -hoogleSearch :: Search -> TagStr -hoogleSearch (Search _ (SearchType x)) = showTypeTags x [1..] -hoogleSearch (Search _ (SearchName x)) = Tag "b" $ Str x -hoogleSearch (Search x _) = Str x - - - -hoogleSuggest :: Bool -> Search -> Maybe TagStr - -hoogleSuggest _ (Search _ (SearchType (c,t))) | - any dubiousVar (allTVar t) = Just $ Tags - [Str "Did you mean: ", Tag "a" (Tags $ f $ showConType (c, mapUnbound safeVar t))] - where - dubiousVar x = length x > 1 - safeVar x | dubiousVar x = TLit $ '{' : toUpper (head x) : tail x ++ "}" - | otherwise = TVar x - - f xs = Str a : (if null b then [] else Tag "b" (Str c) : f (safeTail d)) - where - (a,b) = break (== '{') xs - (c,d) = break (== '}') (tail b) - - safeTail [] = [] - safeTail (x:xs) = xs - -{- -hoogleSuggest True (SearchName xs@(_:_:_)) = Just $ Tags - ["Tip: To search for a type, do " - ,Tag "a" (Str $ ":: " ++ concat (intersperse " " xs))] --} - -hoogleSuggest _ (Search _ (SearchName (x:xs))) | isDigit x = - Just $ Str "Remember, I have no notion of numbers" - -hoogleSuggest _ (Search _ (SearchName x)) | '\"' `elem` x = - Just $ Str "Remember, I have no notion of quotes" - -hoogleSuggest True (Search _ (SearchName xs)) | xs == "google" = - Just $ Tags [Tag "a" (Str "http://www.google.com/"), Str " rocks!"] - -hoogleSuggest True (Search _ (SearchName (x:xs))) | xs == "oogle" = - Just $ Str "Can't think of anything more interesting to search for?" - -hoogleSuggest _ _ = Nothing - - - - -hoogleResults :: FilePath -> Search -> IO [Result] -hoogleResults p (Search _ x) = matchOrdered p x - -hoogleRange :: FilePath -> Search -> Int -> Int -> IO [Result] -hoogleRange p (Search _ x) = matchRange p x rmfile ./scripts/hoogle/src/Hoogle/Hoogle.hs hunk ./scripts/hoogle/src/Hoogle/Lexer.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{- | - A very basic lexer, splits things up into various 'Lexeme' pieces. - Uses the underlying Haskell lex function. --} - -module Hoogle.Lexer ( - Lexeme(..), - lexer - ) where - -import Prelude -import Data.Char - --- | The data structure for a lexeme -data Lexeme = OpenSquare -- ^ \[ - | ShutSquare -- ^ \] - | OpenRound -- ^ \( - | ShutRound -- ^ \) - | Comma -- ^ \, - | LineArrow -- ^ \-> - | EqArrow -- ^ \=> - | EqSymbol -- ^ \= - | TypeColon -- ^ \:: - | ExSymbol -- ^ \! - | TypeName String -- ^ Ctor - | VarName String -- ^ func - deriving (Eq) - - -instance Show Lexeme where - show OpenSquare = "[" - show ShutSquare = "]" - show OpenRound = "(" - show ShutRound = ")" - show Comma = "," - show LineArrow = "->" - show EqArrow = "=>" - show EqSymbol = "=" - show TypeColon = "::" - show ExSymbol = "!" - show (TypeName x) = x - show (VarName x) = x - - --- | The main lexer -lexer :: String -> Either [Lexeme] String -lexer ('(':xs) | all isSymbolChar a = - if null bs then Right "Parse Error: Missing closing bracket ')'" - else case lexRest [] (tail bs) of - Left x -> Left $ VarName ('(':a++")") : x - Right x -> Right x - where (a,bs) = break (== ')') xs - -lexer x = lexRest [] x - - -isSymbolChar x = not (isSpace x) && - not (x == ',') && - not (isAlphaNum x) && - not (x == '_') - - -lexRest :: [Lexeme] -> String -> Either [Lexeme] String -lexRest acc (' ':xs) = lexRest acc xs -lexRest acc ('(':')':xs) = lexRest (TypeName "()":acc) xs -lexRest acc ('-':'>':xs) = lexRest (LineArrow :acc) xs -lexRest acc ('=':'>':xs) = lexRest (EqArrow :acc) xs -lexRest acc (':':':':xs) = lexRest (TypeColon :acc) xs -lexRest acc ('=':xs) = lexRest (EqSymbol :acc) xs -lexRest acc ('!':xs) = lexRest (ExSymbol :acc) xs -lexRest acc ('[':xs) = lexRest (OpenSquare :acc) xs -lexRest acc (']':xs) = lexRest (ShutSquare :acc) xs -lexRest acc ('(':xs) = lexRest (OpenRound :acc) xs -lexRest acc (')':xs) = lexRest (ShutRound :acc) xs -lexRest acc (',':xs) = lexRest (Comma :acc) xs -lexRest acc (x:xs) | x == '_' || (x >= 'a' && x <= 'z') = lexRest (VarName a:acc) b - | x `elem` "#?" || (x >= 'A' && x <= 'Z') = lexRest (TypeName a:acc) b - where (a, b) = lexWord [x] xs -lexRest acc (x:xs) = Right $ "Parse Error: Unexpected character '" ++ take 10 (x:xs) ++ "'" -lexRest acc [] = Left $ reverse acc - - -lexWord :: String -> String -> (String, String) -lexWord acc [] = (reverse acc, "") -lexWord acc (x:xs) | isDigit x || isAlpha x || x `elem` "_.'#?" = lexWord (x:acc) xs - | otherwise = (reverse acc, x:xs) - - rmfile ./scripts/hoogle/src/Hoogle/Lexer.hs hunk ./scripts/hoogle/src/Hoogle/Match.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{- | - The main driver module, all the associated interfaces call into this --} - -module Hoogle.Match(matchUnordered, matchOrdered, matchRange) where - -import Hoogle.Result -import Hoogle.Database -import Hoogle.Search - -import Hoogle.MatchName -import Hoogle.MatchType - -import Data.List - - ---------------------------------------------------------------------- --- DRIVER - - - --- | The main drivers for hoogle -matchUnordered - :: FilePath -- ^ The full path to the hoogle file, if null then a default is used - -> SearchMode -- ^ The string to search for, unparsed - -> IO [Result] -- ^ A list of Results, from best to worst -matchUnordered path find = - do - let file = if null path then "hoogle.txt" else path - database <- loadDatabase file - return $ case find of - SearchName x -> lookupName (names database) x - SearchType x -> lookupType (classes database) (types database) x - - --- | -matchOrdered :: FilePath -> SearchMode -> IO [Result] -matchOrdered path find = - do res <- matchUnordered path find - return $ sort res - - - -matchRange :: FilePath -> SearchMode -> Int -> Int -> IO [Result] -matchRange path find 0 count = - do res <- matchOrdered path find - return $ take count res - - -matchRange path find from count = - do res <- matchRange path find 0 (from+count) - return $ drop from res rmfile ./scripts/hoogle/src/Hoogle/Match.hs hunk ./scripts/hoogle/src/Hoogle/MatchClass.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -module Hoogle.MatchClass( - ClassTable, - buildClass, - lookupClass - ) where - -import Hoogle.Result -import Hoogle.TypeSig -import Hoogle.General - -import Data.Maybe -import qualified Data.Map as Map - - -data ClassTable = ClassTable (Map.Map String [TypeMatch]) - deriving Show - - -data TypeMatch = TypeMatch [Type] Constraint - deriving Show - - --- item should only be instances -buildClass :: [Item] -> ClassTable -buildClass xs = ClassTable $ foldr add Map.empty (map f xs) - where - f (Instance (con, TList (TLit name:typs))) = (name, TypeMatch (f typs) (f con)) - where - free = zip (allTVar (TList typs)) [0..] - f = map (mapUnbound g) - g x = TNum $ fromJust $ lookup x free - - add (name, value) mp = case Map.lookup name mp of - Just x -> Map.insert name (value:x) mp - Nothing -> Map.insert name [value] mp - - - --- return ClassMinor if something is minorly wrong, i.e. no Show for a --- return ClassMajor for bigger errors, no FooBar for a -lookupClass :: ClassTable -> Constraint -> String -> [Type] -> Maybe [MatchAmount] -lookupClass ct given check xs | all isTVar xs = - if any (== TList (TLit check : xs)) given then Just [] - else if check `elem` ["Eq","Show","Ord"] then Just [ClassMinor] - else Just [ClassMajor] - --- either reduce or perish! -lookupClass c@(ClassTable ct) given check typ = - case mapMaybe f res of - [] -> Just [ClassMajor] - (x:xs) -> Just x - where - ltyp = length typ - res = Map.findWithDefault [] check ct - - f (TypeMatch typ2 con) - | length typ2 == ltyp && isJust unifs && isJust res - = Just $ fromJust res - where - unifs = concatIdMaybeAll $ zipWith g typ2 typ - cons2 = map (mapNumber (\x -> fromJust $ lookup x (fromJust unifs))) con - res = concatMapMaybeAll ren cons2 - - ren (TList (TLit x:xs)) = lookupClass c given x xs - - - f _ = Nothing - - -- type on the left must have the numbers in - g :: Type -> Type -> Maybe [(Int, Type)] - g (TNum x) y = Just [(x, y)] - g (TLit x) (TLit y) | x == y = Just [] - g (TList x) (TList y) | length x == length y = concatIdMaybeAll $ zipWith g x y - g _ _ = Nothing - - + rmfile ./scripts/hoogle/src/Hoogle/MatchClass.hs hunk ./scripts/hoogle/src/Hoogle/MatchName.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -module Hoogle.MatchName( - NameTable, - buildName, -- build a name table - lookupName -- lookup a name - ) where - - -import Hoogle.Result -import Hoogle.TypeSig - -import Data.Char -import Data.List -import Data.Maybe - - --- | The abstract data type -data NameTable = NameTable [(String, String, Result, Bool)] - deriving Show - --- | build a 'NameTable' -buildName :: [(ModuleName, Item)] -> NameTable -buildName xs = NameTable $ map f xs - where - lcase = map toLower - - f (_, Module x) = (lcase name, name, - Result (Str $ showModuleName (init x)) (Str $ last x) - (Tag "u" $ Str "module") "module" [] 0 0, - False) - where name = last x - - - f (modu, x) = (lcase name, name, - Result (Str $ showModuleName modu) (Str $ getName x) - (getType x) (getMode x) [] 0 (0 - length modu), - head (asString x) == '(') - where name = getName x - - - getName x = noBracket $ asString x - - getType (Func _ x) = Str $ showConType x - getType (Keyword x) = Tag "u" $ Str "keyword" - getType (Class x) = - Tags [Tag "u" $ Str "class", Str $ " " ++ showConType x] - getType (TypeAlias name args _) = - Tags [Tag "u" $ Str "type", Str $ concatMap (' ':) (name:args)] - getType (Data b x) = - Tags [Tag "u" $ Str (if b then "newtype" else "data"), Str $ " " ++ showConType x] - - getMode (Func{}) = "func" - getMode (Keyword{}) = "keyword" - getMode (Class{}) = "class" - getMode (TypeAlias{}) = "type" - getMode (Data b x) = if b then "newtype" else "data" - - - -noBracket ('(':xs) = init xs -noBracket x = x - - --- | lookup an entry in a 'NameTable' -lookupName :: NameTable -> String -> [Result] -lookupName (NameTable xs) find = catMaybes $ map f xs - where - findc = noBracket find - find2 = map toLower findc - - f (fnd, orig, res, b) = - do (reason, pos) <- getMatch fnd orig - return $ res{ - resultName = brack b $ h pos (length find) (fromStr (resultName res)), - resultInfo = [ReasonText reason], - resultScore = score [ReasonText reason] - } - - fromStr (Str x) = x - - getMatch :: String -> String -> Maybe (TextAmount, Int) - getMatch fnd orig - | findc == orig = Just (TextFullCase, 0) - | find2 == fnd = Just (TextFull, 0) - | findc `isPrefixOf` orig = Just (TextPrefixCase, 0) - | find2 `isPrefixOf` fnd = Just (TextPrefix, 0) - | find2 `isSuffixOf` fnd = Just (TextSuffix, length fnd - length find2) - | otherwise = g fnd 0 - - - g [] n = Nothing - g xs n | find2 `isPrefixOf` xs = Just (TextSome, n) - | otherwise = g (tail xs) (n+1) - - - h pos len xs = Tags $ [ - Str $ take pos2 xs, - Tag "b" $ Str $ take len $ drop pos2 xs, - Str $ drop (len+pos2) xs] - where pos2 = pos + (if head xs == '(' then 1 else 0) - - - brack True x = Tags [Str "(", x, Str ")"] - brack _ x = x + rmfile ./scripts/hoogle/src/Hoogle/MatchName.hs hunk ./scripts/hoogle/src/Hoogle/MatchType.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - - -module Hoogle.MatchType( - TypeTable, - buildType, - lookupType, - compareTypes - ) where - - -import Hoogle.TypeSig -import Hoogle.Result -import Hoogle.Parser -import Hoogle.Lexer -import Hoogle.MatchClass -import Hoogle.General - -import Data.Maybe -import Data.List - - -data TypeTable = TypeTable [(ModuleName, Item, TypeCode)] - deriving Show - - -data TypeCode = TypeCode Int [Rule] - deriving Show - - -data Rule = FreeSet [Var] - | DataBind String Var - | ClassBind String [Var] - - -data Var = Var Int [Int] - - -instance Show Var where - show (Var n xs) = "@" ++ show n ++ concatMap (\x -> '.':show x) xs - - -instance Show Rule where - show (FreeSet x) = "{" ++ (concat $ intersperse " " $ map show x) ++ "}" - show (DataBind x y) = x ++ "=" ++ show y - show (ClassBind x y) = x ++ "=>" ++ show y - - - -buildType :: [(ModuleName, Item)] -> TypeTable -buildType x = TypeTable $ map f x - where f (a, b) = (a, b, buildTypeCode $ typ b) - - -unpackSpine :: ConType -> (Constraint, [Type]) -unpackSpine (c, TList (TLit "->":xs)) = (c, xs) -unpackSpine (c, x) = (c, [x]) - - -buildTypeCode :: ConType -> TypeCode -buildTypeCode (con,typ) = TypeCode (length args) $ map asBound bound ++ concatMap asFree frees - where - frees = groupBy eqVar $ sortBy cmpVar free - (free, bound) = partition (isTVar . snd) binds - binds = concat $ zipWith f (map (\x -> Var x []) [0..]) (last args : init args) - - asBound (var, TLit x) = DataBind x var - - -- TODO: Multiparameter type classes - asFree x = FreeSet items : [ClassBind c [i] | i <- items, c <- classes] - where - items = map fst x - ((_,TVar var):_) = x - classes = [r | TList [TLit r,TVar v] <- con, v == var] - - f :: Var -> Type -> [(Var, Type)] - f var@(Var v vs) (TList (x:xs)) = (var, x) : (concat $ zipWith g [1..] xs) - where g n x = f (Var v (vs ++ [n])) x - - f var x = [(var, x)] - - args = snd $ unpackSpine (con,typ) - - eqVar (_, TVar a) (_, TVar b) = a == b - cmpVar (_, TVar a) (_, TVar b) = compare a b - - -compareTypes :: ClassTable -> ConType -> ConType -> [[Reason]] -compareTypes classes left right = [a ++ b | a <- as, b <- bs] - where - as = map (map ReasonLeft . thd3) $ checkType classes cleft right - bs = map (map ReasonRight . thd3) $ checkType classes cright left - thd3 (_,_,x) = x - - cleft = buildTypeCode left - cright = buildTypeCode right - - -lookupType :: ClassTable -> TypeTable -> ConType -> [Result] -lookupType classes (TypeTable types) find = mapMaybe f types - where - findCode = buildTypeCode find - - f (modu, item, code) = do (order, a) <- checkTypeOne classes code find - (_, b) <- checkTypeOne classes findCode (typ item) - let reasons = map ReasonLeft a ++ map ReasonRight b - return $ Result - (Str $ showModuleName modu) - (Str $ name item) - (showTypeTags (typ item) order) - "func" - reasons - (score reasons) - (0 - length modu) - - -checkTypeOne :: ClassTable -> TypeCode -> ConType -> Maybe ([Int], [MatchAmount]) -checkTypeOne ct tc typ = if null res then Nothing else Just (b, c) - where - (a,b,c) = maximumBy f res - res = checkType ct tc typ - - f (a,_,_) (b,_,_) = compare a b - - -checkType :: ClassTable -> TypeCode -> ConType -> [(Score, [Int], [MatchAmount])] -checkType classes code@(TypeCode n xs) typ = if abs posExtraArgs > 2 then [] else res - where - extraArgs = n - length types - posExtraArgs = abs extraArgs - badArgs = replicate extraArgs ArgExtra - - f (x:xs) = xs ++ [x] - - res = [(score reasons, f $ map fst arg, badArgs ++ reasons) | arg <- args, - Just reasons <- [applyType classes code cons (map snd arg)]] - - (cons, types) = unpackSpine typ - types2 = zip [1..] types - lastType = last types2 - initType = init types2 - addTypes = initType ++ replicate extraArgs (0, TVar "_") - - args = map (lastType:) $ concatMap permute $ selection (n-1) addTypes - - - -applyType :: ClassTable -> TypeCode -> Constraint -> [Type] -> Maybe [MatchAmount] -applyType classes (TypeCode n xs) cons types = if any isNothing res then Nothing - else Just (concatMap fromJust res) - where - res = map f xs - - f :: Rule -> Maybe [MatchAmount] - f (ClassBind x y) = do items <- mapMaybeAll getElement y - lookupClass classes cons x items - - f (DataBind x y) = case rootCtor y of - Nothing -> Nothing - Just "" -> Just [DataTooFree] - Just z -> if x == z then Just [] else Nothing - - f (FreeSet x) = if Nothing `elem` roots || length roots > 2 - then Nothing - else Just $ concat [tooSpecific, tooDifferent] - where - tooSpecific = if length roots == 2 then [DataTooSpecific] else [] - tooDifferent = replicate (length items - 1) FreeDifferent - - roots = nub $ Just "" : map rootCtor x - items = nub $ mapMaybe f x - - f x = case fromJust (getElement x) of - TVar "_" -> Nothing - TVar x -> Just x - _ -> Nothing - - - -- empty string means a free variable, i.e no explicit root - -- Nothing means impossible - rootCtor :: Var -> Maybe String - rootCtor var = case getElement var of - Nothing -> Nothing - Just (TLit x) -> Just x - Just (TList (TLit x:xs)) -> Just x - x -> Just "" - - - getElement :: Var -> Maybe Type - getElement (Var n xs) = f xs (types !! n) - where - f [] x = Just x - f (n:ns) (TList xs) | n < length xs = f ns (xs !! n) - f (n:ns) (TVar x) = Just $ TVar "_" - f _ _ = Nothing - - rmfile ./scripts/hoogle/src/Hoogle/MatchType.hs hunk ./scripts/hoogle/src/Hoogle/Parser.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -module Hoogle.Parser ( - parser, - parseConType, - validLine - ) where - -import Hoogle.Lexer -import Hoogle.TypeSig - - - --- | Is this line a content based line -validLine :: String -> Bool -validLine "" = False -validLine ('-':'-':_) = False -validLine _ = True - - --- | Parse one line of Lexemes at a time and convert it to an item, or raise a parse error -parser :: String -> Either Item String -parser x = case lexer x of - Left x -> parse x - Right x -> Right x - -parse :: [Lexeme] -> Either Item String -parse (VarName "module":TypeName x:[]) = Left $ Module (splitOn '.' x) - -parse (VarName "class":x) = Left $ Class (readConType x) - -parse (VarName "instance":x) = Left $ Instance (readConType x) - -parse (VarName "keyword":xs) = Left $ Keyword $ concatMap show xs - -parse (VarName "newtype":x) = Left $ Data True (readConType x) -parse (VarName "data" :x) = Left $ Data False (readConType x) - -parse (VarName "type":x) = Left $ TypeAlias name (map (\(VarName a) -> a) args) (readConType b) - where (TypeName name:args,_:b) = break (== EqSymbol) x - -parse (TypeName x:TypeColon:typ) = Left $ Func x (readConType typ) -parse (VarName x:TypeColon:typ) = Left $ Func x (readConType typ) - --- a data value produced by Haddock being foolish -parse [VarName x] = Right "" -parse [TypeName x] = Right "" - - -parse [] = Right "Parse error: unexpected empty line" -parse (x:xs) = Right $ "Parse error: doesn't start with a keyword, or have a type annotation, " ++ show x - - -parseConType :: String -> Either ConType String -parseConType xs = case lexer xs of - Left x -> Left (readConType x) - Right x -> Right x - - -splitOn :: Eq a => a -> [a] -> [[a]] -splitOn e xs = if null b then [a] else a : splitOn e (tail b) - where (a,b) = break (== e) xs - - -readConType :: [Lexeme] -> (Constraint, Type) -readConType xs = (con, readType res) - where (con, res) = readConstraint xs - - -readConstraint :: [Lexeme] -> (Constraint, [Lexeme]) -readConstraint x = if not (EqArrow `elem` x) then ([],x) - else (f (readType a) ++ con, lexe) - where - (a,b) = break (== EqArrow) x - (con,lexe) = readConstraint (tail b) - - f (TList (TLit ",":xs)) = xs - f x = [x] - - - -readType :: [Lexeme] -> Type -readType x = f $ bracket $ filter (/= ExSymbol) x - where - f :: [Bracket Lexeme] -> Type - f xs = if not (singleton tups) then TList (TLit ",":map f tups) - else if not (singleton func) then TList (TLit "->":map f func) - else if singleton xs then g (head xs) - else if null xs then TVar "_" - else TList (map g xs) - where - tups = splitOn (BItem Comma ) xs - func = splitOn (BItem LineArrow) xs - - g (Bracket OpenRound x) = f x - g (Bracket OpenSquare []) = TLit "[]" - g (Bracket OpenSquare x) = TList [TLit "[]", f x] - g (BItem (TypeName x)) = TLit x - g (BItem (VarName x)) = TVar x - g y = error $ "Hoogle.Parser.readType: " ++ show (x,y) - - -singleton [x] = True -singleton _ = False - - -data Bracket x = Bracket x [Bracket x] - | BItem x - deriving (Eq, Show) - - -isOpen x = x `elem` [OpenRound, OpenSquare] -isShut x = x `elem` [ShutRound, ShutSquare] - -bracket :: [Lexeme] -> [Bracket Lexeme] -bracket xs = let (a,[]) = g xs in a - where - f :: [Lexeme] -> (Bracket Lexeme, [Lexeme]) - f (x:xs) | isOpen x = let (a,b) = g xs in (Bracket x a, b) - f (x:xs) = (BItem x, xs) - - - g :: [Lexeme] -> ([Bracket Lexeme], [Lexeme]) - g (x:xs) | isShut x = ([], xs) - g [] = ([], []) - g xs = let (a,b) = f xs ; (c,d) = g b in (a:c,d) rmfile ./scripts/hoogle/src/Hoogle/Parser.hs hunk ./scripts/hoogle/src/Hoogle/Result.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -module Hoogle.Result where - -import Hoogle.TypeSig -import Data.List - - -type Score = Int - -data Result = Result { - resultModule :: TagStr, - resultName :: TagStr, - resultType :: TagStr, - resultMode :: String, - resultInfo :: [Reason], - resultScore :: Score, - resultPriority :: Int - } - deriving Show - - -instance Eq Result where - a == b = resultScore a == resultScore b && resultPriority a == resultPriority b - -instance Ord Result where - compare a b = compare (resultScore b, resultPriority b) (resultScore a, resultPriority a) - - --- some typical tags --- a, hyperlink --- b, bold --- u, underline --- 1-6, color 1-6 - - -data TagStr = Str String - | Tag String TagStr - | Tags [TagStr] - deriving Show - - -data Reason = ReasonText TextAmount - | ReasonLeft MatchAmount - | ReasonRight MatchAmount - - - - -instance Show Reason where - show (ReasonText x) = show x - show (ReasonLeft x) = 'L' : show x - show (ReasonRight x) = 'R' : show x - - showList [ReasonText x] = showString $ show x - showList xs = showString $ f 'L' left ++ g left right ++ f 'R' right - where - (left, right) = partition isLeft xs - - f pre [] = "" - f pre xs = pre : concatMap (tail . show) xs - - g (_:_) (_:_) = "." - g _ _ = "" - - isLeft (ReasonLeft _) = True - isLeft _ = False - - -data TextAmount = TextFullCase - | TextFull - | TextPrefixCase - | TextPrefix - | TextSuffix - | TextSome - deriving Show - -data MatchAmount = DataTooFree - | DataTooSpecific - | FreeDifferent - | ClassMinor - | ClassMajor - | ArgExtra - deriving (Bounded, Eq, Enum) - -instance Show MatchAmount where - show DataTooFree = "?" - show DataTooSpecific = "!" - show FreeDifferent = "*" - show ArgExtra = "#" - show ClassMinor = "c" - show ClassMajor = "C" - - -showText :: TagStr -> String -showText (Str x) = x -showText (Tag n x) = showText x -showText (Tags xs) = concatMap showText xs - - - - -class Scoreable a where - score :: a -> Score - -instance Scoreable a => Scoreable [a] where - score xs = sum (map score xs) - -instance Scoreable Reason where - score (ReasonText x) = score x - score x = 0 - scoreGenerated x - --score (ReasonLeft x) = score x - --score (ReasonRight x) = score x - -instance Scoreable TextAmount where - score TextFullCase = 6 - score TextFull = 5 - score TextPrefixCase = 4 - score TextPrefix = 3 - score TextSuffix = 2 - score TextSome = 1 - -instance Scoreable MatchAmount where - score FreeDifferent = -1 - score ArgExtra = -2 - score ClassMinor = -1 - score ClassMajor = -10 - score _ = -5 - - --- this function is based on data generated by Score -scoreGenerated :: Reason -> Score -scoreGenerated (ReasonLeft DataTooFree ) = 1 -scoreGenerated (ReasonLeft DataTooSpecific) = 5 -scoreGenerated (ReasonLeft FreeDifferent ) = 9 -scoreGenerated (ReasonLeft ClassMinor ) = 2 -scoreGenerated (ReasonLeft ClassMajor ) = 9 -scoreGenerated (ReasonLeft ArgExtra ) = 2 -scoreGenerated (ReasonRight DataTooFree ) = 6 -scoreGenerated (ReasonRight DataTooSpecific) = 16 -scoreGenerated (ReasonRight FreeDifferent ) = 1 -scoreGenerated (ReasonRight ClassMinor ) = 3 -scoreGenerated (ReasonRight ClassMajor ) = 1 -scoreGenerated (ReasonRight ArgExtra ) = 16 - - -showTypeTags :: ConType -> [Int] -> TagStr -showTypeTags (con, typ) tags = Tags $ Str (showCon con) : f typ - where - f (TList (TLit "->":xs)) = intersperse (Str " -> ") $ zipWith g tags xs - f x = [Str $ showType typ] - - g 0 typ = Str $ showTypePrec 1 typ - g n typ = Tag (show n) (g 0 typ) - - - rmfile ./scripts/hoogle/src/Hoogle/Result.hs hunk ./scripts/hoogle/src/Hoogle/Search.hs 1 - -module Hoogle.Search(Search(..), SearchMode(..), parseSearch) where - - -import Hoogle.TypeSig -import Hoogle.TextUtil -import Hoogle.Parser -import Data.Char - - -data Search = Search String SearchMode - deriving Show - - -data SearchMode = SearchName String - | SearchType ConType - | SearchError String - deriving Show - - -parseSearch :: String -> Search -parseSearch x = Search x $ - if isHaskellName x2 - then SearchName x2 - else case parseConType x2 of - Right x -> SearchError x - Left x -> SearchType x - where - x2 = trim x - - -isHaskellName :: String -> Bool -isHaskellName (x:xs) | isAlpha x && all (\a -> isAlphaNum a || a `elem` "_'") xs = True -isHaskellName xs = all (`elem` "!#$%&*+./<>=?@/^|-~") xs -isHaskellName _ = False rmfile ./scripts/hoogle/src/Hoogle/Search.hs hunk ./scripts/hoogle/src/Hoogle/TextUtil.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{-| - General text utility functions --} - -module Hoogle.TextUtil where - -import Prelude -import Data.Maybe -import Data.Char -import Data.List - - -trim :: String -> String -trim = trimLeft . trimRight -trimLeft = dropWhile isSpace -trimRight = reverse . trimLeft . reverse - - -isSubstrOf :: Eq a => [a] -> [a] -> Bool -isSubstrOf find list = any (isPrefixOf find) (tails list) - - -splitList :: Eq a => [a] -> [a] -> [[a]] -splitList find str = if isJust q then a : splitList find b else [str] - where - q = splitPair find str - Just (a, b) = q - - -splitPair :: Eq a => [a] -> [a] -> Maybe ([a], [a]) -splitPair find str = f str - where - f [] = Nothing - f x | isPrefixOf find x = Just ([], drop (length find) x) - | otherwise = if isJust q then Just (head x:a, b) else Nothing - where - q = f (tail x) - Just (a, b) = q - - -indexOf find str = length $ takeWhile (not . isPrefixOf (lcase find)) (tails (lcase str)) - - -lcase = map toLower -ucase = map toUpper - - -replace find with [] = [] -replace find with str | find `isPrefixOf` str = with ++ replace find with (drop (length find) str) - | otherwise = head str : replace find with (tail str) - - - - --- 0 based return -findNext :: Eq a => [[a]] -> [a] -> Maybe Int -findNext finds str = if null maxs then Nothing else Just (fst (head (sortBy compSnd maxs))) - where - maxs = mapMaybe f (zip [0..] finds) - - f (id, find) = if isJust q then Just (id, length (fst (fromJust q))) else Nothing - where q = splitPair find str - - compSnd (_, a) (_, b) = compare a b - - --- bracketing... - -data Bracket = Bracket (Char, Char) [Bracket] - | UnBracket String - deriving (Show) - -data PartBracket = PBracket [PartBracket] - | PUnBracket Char - deriving (Show) - - -bracketWith :: Char -> Char -> Bracket -> Bracket -bracketWith strt stop (Bracket x y) = Bracket x (map (bracketWith strt stop) y) -bracketWith strt stop (UnBracket x) = bracketString strt stop x - - -bracketString :: Char -> Char -> String -> Bracket -bracketString strt stop y = Bracket (strt, stop) (g "" res) - where - (a, b) = bracketPartial strt stop y - res = a ++ (map PUnBracket b) - - g c (PBracket x:xs ) = deal c ++ Bracket (strt, stop) (g "" x) : g "" xs - g c (PUnBracket x:xs) = g (x:c) xs - g c [] = deal c - - deal [] = [] - deal x = [UnBracket (reverse x)] - - - -bracketPartial :: Char -> Char -> String -> ([PartBracket], String) -bracketPartial strt stop y = f y - where - - f [] = ([], "") - - f (x:xs) | x == strt = (PBracket a : c, d) - where - (a, b) = bracketPartial strt stop xs - (c, d) = f b - - f (x:xs) | x == stop = ([], xs) - - f (x:xs) | otherwise = (PUnBracket x : a, b) - where (a, b) = f xs rmfile ./scripts/hoogle/src/Hoogle/TextUtil.hs hunk ./scripts/hoogle/src/Hoogle/TypeAlias.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{-| - Deal with type aliases, i.e. type String = [Char] --} - -module Hoogle.TypeAlias( - AliasTable, - buildAlias, - lookupAlias, - showAliasTable - ) where - -import Hoogle.TypeSig - -import qualified Data.Map as Map -import Data.Maybe - - --- | Alias is a string, being the name of the constructor --- the number of arguments it takes, and the resulting type --- TNum is used for replacement positions -data AliasTable = AliasTable (Map.Map String (Int, Type)) - deriving Show - - --- | Given a list of aliases, build an alias table --- All members of Item must be TypeAlias -buildAlias :: [Item] -> AliasTable -buildAlias xs = {- AliasTable $ Map.fromList $ -} fixpAlias $ map f xs - where - f (TypeAlias name args ([], typ)) = - (name, (length args, mapUnbound (g (zip args [0..])) typ)) - - g lst name = case lookup name lst of - Just n -> TNum n - Nothing -> TVar name - - --- yay for circular programming --- boo for possible non-termination -fixpAlias :: [(String, (Int, Type))] -> AliasTable -fixpAlias x = map2 - where - map2 = AliasTable $ Map.map (\(a,b) -> (a, lookupAlias map2 b)) map1 - map1 = Map.fromList x - - --- | Given a type, follow all aliases to find the ultimate one -lookupAlias :: AliasTable -> Type -> Type -lookupAlias (AliasTable table) (TLit x) = typ - where (0, typ) = Map.findWithDefault (0, TLit x) x table - -lookupAlias a@(AliasTable table) (TList (TLit x:xs)) = if isJust res then some else none - where - res = Map.lookup x table - none = TList (TLit x : map (lookupAlias a) xs) - Just (n, typ) = res - some = if n == length xs - then mapNumber (xs !!) typ - else error "lookupAlias: mismatch" - -lookupAlias _ x = x - -showAliasTable :: AliasTable -> String -showAliasTable (AliasTable x) = unlines $ map showAlias (Map.toList x) - -showAlias (name, (args, typ)) = "type " ++ name ++ "[" ++ show args ++ "] = " ++ show typ rmfile ./scripts/hoogle/src/Hoogle/TypeAlias.hs hunk ./scripts/hoogle/src/Hoogle/TypeSig.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{-| - Data structures for each of the type signatures --} - -module Hoogle.TypeSig where - -import Data.List - - - -type ModuleName = [String] - -data Item = Module ModuleName - | Class {typ :: ConType} - | Func {name :: String, typ :: ConType} - | TypeAlias {name :: String, args :: [String], typ :: ConType} - | Data {new :: Bool, typ :: ConType} - | Instance {typ :: ConType} - | Keyword {name :: String} - - -instance Show Item where - show (Module x) = "module " ++ concat (intersperse "." x) - show (Class typ) = "class " ++ showConType typ - show (Func name typ) = name ++ " :: " ++ showConType typ - show (TypeAlias name args typ) = name ++ concatMap (' ':) args ++ " = " ++ showConType typ - show (Data new typ) = (if new then "newtype" else "data") ++ " " ++ showConType typ - show (Instance typ) = "instance " ++ showConType typ - - - -isTypeAlias (TypeAlias{}) = True; isTypeAlias _ = False -isInstance (Instance {}) = True; isInstance _ = False -isFunc (Func {}) = True; isFunc _ = False - - -asString :: Item -> String -asString (Module x) = concat $ intersperse "." x -asString (Func {name=x}) = x -asString (TypeAlias {name=x}) = x -asString (Data {typ=(_,x)}) = typeName x -asString (Class {typ=(_,x)}) = typeName x -asString (Keyword {name=x}) = x - - -asType :: Item -> String -asType (Module x) = "module" -asType x = showConType $ typ x - - -typeName :: Type -> String -typeName (TList (x:xs)) = typeName x -typeName (TLit x) = x - - -type ConType = (Constraint, Type) - - -type Constraint = [Type] - - -data Type = TList [Type] -- a list of types, first one being the constructor - | TLit String -- bound variables, Maybe, ":", "," (tuple), "->" (function) - | TVar String -- unbound variables, "a" - | TNum Int -- a point to a number - deriving (Show, Eq) - - -isTVar (TVar _) = True -isTVar _ = False - - -allTVar :: Type -> [String] -allTVar x = nub $ f x - where - f (TList xs) = concatMap f xs - f (TVar xs) = [xs] - f _ = [] - - -mapUnbound :: (String -> Type) -> Type -> Type -mapUnbound f (TList xs) = TList (map (mapUnbound f) xs) -mapUnbound f (TVar x ) = f x -mapUnbound f x = x - -mapNumber :: (Int -> Type) -> Type -> Type -mapNumber f (TList xs) = TList (map (mapNumber f) xs) -mapNumber f (TNum x ) = f x -mapNumber f x = x - - -showCon :: Constraint -> String -showCon [] = "" -showCon [c] = showType c ++ " => " -showCon cs = "(" ++ concat (intersperse ", " (map showType cs)) ++ ") => " - - -showConType :: ConType -> String -showConType (c, x) = showCon c ++ showType x - - -showModuleName :: ModuleName -> String -showModuleName x = concat $ intersperse "." x - - -showType :: Type -> String -showType = showTypePrec 0 - -showTypePrec :: Int -> Type -> String -showTypePrec _ (TLit x) = x -showTypePrec _ (TVar x) = x -showTypePrec _ (TNum x) = show x -showTypePrec p (TList (x:xs)) = case x of - TLit "[]" -> "[" ++ showTypePrec 0 (head xs) ++ "]" - TLit "," -> showTypeList True ", " 0 xs - TLit "->" -> showTypeList (p>0) " -> " 1 xs - _ -> showTypeList (p>1) " " 2 (x:xs) - where - showTypeList p mid nxt xs = parens p $ concat $ intersperse mid $ map (showTypePrec nxt) xs - parens True x = "(" ++ x ++ ")" - parens False x = x - rmfile ./scripts/hoogle/src/Hoogle/TypeSig.hs rmdir ./scripts/hoogle/src/Hoogle hunk ./scripts/hoogle/src/Doc/res/documentation.txt 1 -Control.Arrow base -Control.Concurrent base -Control.Concurrent.Chan base -Control.Concurrent.MVar base -Control.Concurrent.QSem base -Control.Concurrent.QSemN base -Control.Concurrent.STM stm -Control.Concurrent.STM.TChan stm -Control.Concurrent.STM.TMVar stm -Control.Concurrent.STM.TVar stm -Control.Concurrent.SampleVar base -Control.Exception base -Control.Monad base -Control.Monad.Cont mtl -Control.Monad.Error mtl -Control.Monad.Fix base -Control.Monad.Identity mtl -Control.Monad.List mtl -Control.Monad.RWS mtl -Control.Monad.Reader mtl -Control.Monad.ST base -Control.Monad.ST.Lazy base -Control.Monad.ST.Strict base -Control.Monad.State mtl -Control.Monad.Trans mtl -Control.Monad.Writer mtl -Control.Parallel base -Control.Parallel.Strategies base -Data.Array base -Data.Array.Diff base -Data.Array.IArray base -Data.Array.IO base -Data.Array.MArray base -Data.Array.ST base -Data.Array.Storable base -Data.Array.Unboxed base -Data.Bits base -Data.Bool base -Data.Char base -Data.Complex base -Data.Dynamic base -Data.Either base -Data.FiniteMap base -Data.FunctorM base -Data.Generics base -Data.Generics.Aliases base -Data.Generics.Basics base -Data.Generics.Instances base -Data.Generics.Schemes base -Data.Generics.Text base -Data.Generics.Twins base -Data.Graph base -Data.Graph.Inductive fgl -Data.Graph.Inductive.Basic fgl -Data.Graph.Inductive.Example fgl -Data.Graph.Inductive.Graph fgl -Data.Graph.Inductive.Graphviz fgl -Data.Graph.Inductive.Internal.FiniteMap fgl -Data.Graph.Inductive.Internal.Heap fgl -Data.Graph.Inductive.Internal.Queue fgl -Data.Graph.Inductive.Internal.RootPath fgl -Data.Graph.Inductive.Internal.Thread fgl -Data.Graph.Inductive.Monad fgl -Data.Graph.Inductive.Monad.IOArray fgl -Data.Graph.Inductive.NodeMap fgl -Data.Graph.Inductive.Query fgl -Data.Graph.Inductive.Query.ArtPoint fgl -Data.Graph.Inductive.Query.BCC fgl -Data.Graph.Inductive.Query.BFS fgl -Data.Graph.Inductive.Query.DFS fgl -Data.Graph.Inductive.Query.Dominators fgl -Data.Graph.Inductive.Query.GVD fgl -Data.Graph.Inductive.Query.Indep fgl -Data.Graph.Inductive.Query.MST fgl -Data.Graph.Inductive.Query.MaxFlow fgl -Data.Graph.Inductive.Query.MaxFlow2 fgl -Data.Graph.Inductive.Query.Monad fgl -Data.Graph.Inductive.Query.SP fgl -Data.Graph.Inductive.Query.TransClos fgl -Data.Graph.Inductive.Tree fgl -Data.HashTable base -Data.IORef base -Data.Int base -Data.IntMap base -Data.IntSet base -Data.Ix base -Data.List base -Data.Map base -Data.Maybe base -Data.Monoid base -Data.PackedString base -Data.Queue base -Data.Ratio base -Data.STRef base -Data.STRef.Lazy base -Data.STRef.Strict base -Data.Set base -Data.Tree base -Data.Tuple base -Data.Typeable base -Data.Unique base -Data.Version base -Data.Word base -Debug.QuickCheck QuickCheck -Debug.QuickCheck.Batch QuickCheck -Debug.QuickCheck.Poly QuickCheck -Debug.QuickCheck.Utils QuickCheck -Debug.Trace base -Distribution.Compat.Directory Cabal -Distribution.Compat.Exception Cabal -Distribution.Compat.FilePath Cabal -Distribution.Compat.RawSystem Cabal -Distribution.Compat.ReadP Cabal -Distribution.Extension Cabal -Distribution.GetOpt Cabal -Distribution.InstalledPackageInfo Cabal -Distribution.License Cabal -Distribution.Make Cabal -Distribution.Package Cabal -Distribution.PackageDescription Cabal -Distribution.PreProcess Cabal -Distribution.PreProcess.Unlit Cabal -Distribution.Setup Cabal -Distribution.Simple Cabal -Distribution.Simple.Build Cabal -Distribution.Simple.Configure Cabal -Distribution.Simple.GHCPackageConfig Cabal -Distribution.Simple.Install Cabal -Distribution.Simple.LocalBuildInfo Cabal -Distribution.Simple.Register Cabal -Distribution.Simple.SrcDist Cabal -Distribution.Simple.Utils Cabal -Distribution.Version Cabal -Foreign base -Foreign.C base -Foreign.C.Error base -Foreign.C.String base -Foreign.C.Types base -Foreign.Concurrent base -Foreign.ForeignPtr base -Foreign.Marshal base -Foreign.Marshal.Alloc base -Foreign.Marshal.Array base -Foreign.Marshal.Error base -Foreign.Marshal.Pool base -Foreign.Marshal.Utils base -Foreign.Ptr base -Foreign.StablePtr base -Foreign.Storable base -GHC.Conc base -GHC.ConsoleHandler base -GHC.Dotnet base -GHC.Exts base -GHC.Unicode base -Graphics.HGL HGL -Graphics.HGL.Core HGL -Graphics.HGL.Draw HGL -Graphics.HGL.Draw.Brush HGL -Graphics.HGL.Draw.Font HGL -Graphics.HGL.Draw.Monad HGL -Graphics.HGL.Draw.Pen HGL -Graphics.HGL.Draw.Picture HGL -Graphics.HGL.Draw.Region HGL -Graphics.HGL.Draw.Text HGL -Graphics.HGL.Key HGL -Graphics.HGL.Run HGL -Graphics.HGL.Units HGL -Graphics.HGL.Utils HGL -Graphics.HGL.Window HGL -Graphics.Rendering.OpenGL OpenGL -Graphics.Rendering.OpenGL.GL OpenGL -Graphics.Rendering.OpenGL.GL.Antialiasing OpenGL -Graphics.Rendering.OpenGL.GL.BasicTypes OpenGL -Graphics.Rendering.OpenGL.GL.BeginEnd OpenGL -Graphics.Rendering.OpenGL.GL.Bitmaps OpenGL -Graphics.Rendering.OpenGL.GL.BufferObjects OpenGL -Graphics.Rendering.OpenGL.GL.Clipping OpenGL -Graphics.Rendering.OpenGL.GL.ColorSum OpenGL -Graphics.Rendering.OpenGL.GL.Colors OpenGL -Graphics.Rendering.OpenGL.GL.CoordTrans OpenGL -Graphics.Rendering.OpenGL.GL.DisplayLists OpenGL -Graphics.Rendering.OpenGL.GL.Evaluators OpenGL -Graphics.Rendering.OpenGL.GL.Feedback OpenGL -Graphics.Rendering.OpenGL.GL.FlushFinish OpenGL -Graphics.Rendering.OpenGL.GL.Fog OpenGL -Graphics.Rendering.OpenGL.GL.Framebuffer OpenGL -Graphics.Rendering.OpenGL.GL.Hints OpenGL -Graphics.Rendering.OpenGL.GL.LineSegments OpenGL -Graphics.Rendering.OpenGL.GL.PerFragment OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.ColorTable OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.Convolution OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.Histogram OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.Minmax OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.PixelMap OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.PixelStorage OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.PixelTransfer OpenGL -Graphics.Rendering.OpenGL.GL.PixelRectangles.Rasterization OpenGL -Graphics.Rendering.OpenGL.GL.Points OpenGL -Graphics.Rendering.OpenGL.GL.Polygons OpenGL -Graphics.Rendering.OpenGL.GL.RasterPos OpenGL -Graphics.Rendering.OpenGL.GL.ReadCopyPixels OpenGL -Graphics.Rendering.OpenGL.GL.Rectangles OpenGL -Graphics.Rendering.OpenGL.GL.SavingState OpenGL -Graphics.Rendering.OpenGL.GL.Selection OpenGL -Graphics.Rendering.OpenGL.GL.StateVar OpenGL -Graphics.Rendering.OpenGL.GL.StringQueries OpenGL -Graphics.Rendering.OpenGL.GL.Texturing OpenGL -Graphics.Rendering.OpenGL.GL.Texturing.Application OpenGL -Graphics.Rendering.OpenGL.GL.Texturing.Environments OpenGL -Graphics.Rendering.OpenGL.GL.Texturing.Objects OpenGL -Graphics.Rendering.OpenGL.GL.Texturing.Parameters OpenGL -Graphics.Rendering.OpenGL.GL.Texturing.Queries OpenGL -Graphics.Rendering.OpenGL.GL.Texturing.Specification OpenGL -Graphics.Rendering.OpenGL.GL.VertexArrays OpenGL -Graphics.Rendering.OpenGL.GL.VertexSpec OpenGL -Graphics.Rendering.OpenGL.GLU OpenGL -Graphics.Rendering.OpenGL.GLU.Errors OpenGL -Graphics.Rendering.OpenGL.GLU.Initialization OpenGL -Graphics.Rendering.OpenGL.GLU.Matrix OpenGL -Graphics.Rendering.OpenGL.GLU.Mipmapping OpenGL -Graphics.Rendering.OpenGL.GLU.NURBS OpenGL -Graphics.Rendering.OpenGL.GLU.Quadrics OpenGL -Graphics.Rendering.OpenGL.GLU.Tessellation OpenGL -Graphics.SOE HGL -Graphics.UI.GLUT GLUT -Graphics.UI.GLUT.Begin GLUT -Graphics.UI.GLUT.Callbacks GLUT -Graphics.UI.GLUT.Callbacks.Global GLUT -Graphics.UI.GLUT.Callbacks.Window GLUT -Graphics.UI.GLUT.Colormap GLUT -Graphics.UI.GLUT.Debugging GLUT -Graphics.UI.GLUT.DeviceControl GLUT -Graphics.UI.GLUT.Fonts GLUT -Graphics.UI.GLUT.GameMode GLUT -Graphics.UI.GLUT.Initialization GLUT -Graphics.UI.GLUT.Menu GLUT -Graphics.UI.GLUT.Objects GLUT -Graphics.UI.GLUT.Overlay GLUT -Graphics.UI.GLUT.State GLUT -Graphics.UI.GLUT.Window GLUT -Graphics.X11.Types X11 -Graphics.X11.Xlib X11 -Graphics.X11.Xlib.Atom X11 -Graphics.X11.Xlib.Color X11 -Graphics.X11.Xlib.Context X11 -Graphics.X11.Xlib.Display X11 -Graphics.X11.Xlib.Event X11 -Graphics.X11.Xlib.Font X11 -Graphics.X11.Xlib.Misc X11 -Graphics.X11.Xlib.Region X11 -Graphics.X11.Xlib.Screen X11 -Graphics.X11.Xlib.Types X11 -Graphics.X11.Xlib.Window X11 -Language.Haskell.Parser haskell-src -Language.Haskell.Pretty haskell-src -Language.Haskell.Syntax haskell-src -Language.Haskell.TH template-haskell -Language.Haskell.TH.Lib template-haskell -Language.Haskell.TH.Ppr template-haskell -Language.Haskell.TH.PprLib template-haskell -Language.Haskell.TH.Syntax template-haskell -Network network -Network.BSD network -Network.CGI network -Network.Socket network -Network.URI network -Numeric base -Prelude base -System.CPUTime base -System.Cmd base -System.Console.GetOpt base -System.Console.Readline readline -System.Console.SimpleLineEditor readline -System.Directory base -System.Environment base -System.Exit base -System.IO base -System.IO.Error base -System.IO.Unsafe base -System.Info base -System.Locale base -System.Mem base -System.Mem.StableName base -System.Mem.Weak base -System.Posix unix -System.Posix.Directory unix -System.Posix.DynamicLinker unix -System.Posix.DynamicLinker.Module unix -System.Posix.DynamicLinker.Prim unix -System.Posix.Env unix -System.Posix.Error unix -System.Posix.Files unix -System.Posix.IO unix -System.Posix.Process unix -System.Posix.Resource unix -System.Posix.Signals base -System.Posix.Signals.Exts unix -System.Posix.Temp unix -System.Posix.Terminal unix -System.Posix.Time unix -System.Posix.Types base -System.Posix.Unistd unix -System.Posix.User unix -System.Process base -System.Random base -System.Time base -Test.HUnit HUnit -Test.HUnit.Base HUnit -Test.HUnit.Lang HUnit -Test.HUnit.Terminal HUnit -Test.HUnit.Text HUnit -Test.QuickCheck QuickCheck -Test.QuickCheck.Batch QuickCheck -Test.QuickCheck.Poly QuickCheck -Test.QuickCheck.Utils QuickCheck -Text.Html base -Text.Html.BlockTable base -Text.ParserCombinators.Parsec parsec -Text.ParserCombinators.Parsec.Char parsec -Text.ParserCombinators.Parsec.Combinator parsec -Text.ParserCombinators.Parsec.Error parsec -Text.ParserCombinators.Parsec.Expr parsec -Text.ParserCombinators.Parsec.Language parsec -Text.ParserCombinators.Parsec.Perm parsec -Text.ParserCombinators.Parsec.Pos parsec -Text.ParserCombinators.Parsec.Prim parsec -Text.ParserCombinators.Parsec.Token parsec -Text.ParserCombinators.ReadP base -Text.ParserCombinators.ReadPrec base -Text.PrettyPrint base -Text.PrettyPrint.HughesPJ base -Text.Printf base -Text.Read base -Text.Read.Lex base -Text.Regex base -Text.Regex.Posix base -Text.Show base -Text.Show.Functions base -Ix wiki -List haskell98 -Numeric haskell98 -IO haskell98 -System haskell98 -CPUTime wiki -Random haskell98 -Array haskell98 -Time haskell98 -Locale haskell98 -Complex haskell98 -Monad haskell98 -Directory haskell98 -Char haskell98 -Ratio haskell98 -Maybe haskell98 -Graphics.Rendering.Cairo gtk -Graphics.Rendering.Cairo.Matrix gtk -Graphics.UI.Gtk gtk -Graphics.UI.Gtk.Abstract.Bin gtk -Graphics.UI.Gtk.Abstract.Box gtk -Graphics.UI.Gtk.Abstract.ButtonBox gtk -Graphics.UI.Gtk.Abstract.Container gtk -Graphics.UI.Gtk.Abstract.Misc gtk -Graphics.UI.Gtk.Abstract.Object gtk -Graphics.UI.Gtk.Abstract.Paned gtk -Graphics.UI.Gtk.Abstract.Range gtk -Graphics.UI.Gtk.Abstract.Scale gtk -Graphics.UI.Gtk.Abstract.Scrollbar gtk -Graphics.UI.Gtk.Abstract.Separator gtk -Graphics.UI.Gtk.Abstract.Widget gtk -Graphics.UI.Gtk.ActionMenuToolbar.Action gtk -Graphics.UI.Gtk.ActionMenuToolbar.ActionGroup gtk -Graphics.UI.Gtk.ActionMenuToolbar.RadioAction gtk -Graphics.UI.Gtk.ActionMenuToolbar.ToggleAction gtk -Graphics.UI.Gtk.ActionMenuToolbar.UIManager gtk -Graphics.UI.Gtk.Buttons.Button gtk -Graphics.UI.Gtk.Buttons.CheckButton gtk -Graphics.UI.Gtk.Buttons.RadioButton gtk -Graphics.UI.Gtk.Buttons.ToggleButton gtk -Graphics.UI.Gtk.Cairo gtk -Graphics.UI.Gtk.Display.AccelLabel gtk -Graphics.UI.Gtk.Display.Image gtk -Graphics.UI.Gtk.Display.Label gtk -Graphics.UI.Gtk.Display.ProgressBar gtk -Graphics.UI.Gtk.Display.Statusbar gtk -Graphics.UI.Gtk.Embedding.Embedding gtk -Graphics.UI.Gtk.Embedding.Plug gtk -Graphics.UI.Gtk.Embedding.Socket gtk -Graphics.UI.Gtk.Entry.Editable gtk -Graphics.UI.Gtk.Entry.Entry gtk -Graphics.UI.Gtk.Entry.EntryCompletion gtk -Graphics.UI.Gtk.Entry.HScale gtk -Graphics.UI.Gtk.Entry.SpinButton gtk -Graphics.UI.Gtk.Entry.VScale gtk -Graphics.UI.Gtk.Gdk.DrawWindow gtk -Graphics.UI.Gtk.Gdk.Drawable gtk -Graphics.UI.Gtk.Gdk.Enums gtk -Graphics.UI.Gtk.Gdk.Events gtk -Graphics.UI.Gtk.Gdk.GC gtk -Graphics.UI.Gtk.Gdk.Gdk gtk -Graphics.UI.Gtk.Gdk.Keys gtk -Graphics.UI.Gtk.Gdk.Pixbuf gtk -Graphics.UI.Gtk.Gdk.Pixmap gtk -Graphics.UI.Gtk.Gdk.Region gtk -Graphics.UI.Gtk.General.Enums gtk -Graphics.UI.Gtk.General.General gtk -Graphics.UI.Gtk.General.IconFactory gtk -Graphics.UI.Gtk.General.StockItems gtk -Graphics.UI.Gtk.General.Structs gtk -Graphics.UI.Gtk.General.Style gtk -Graphics.UI.Gtk.Glade gtk -Graphics.UI.Gtk.Layout.Alignment gtk -Graphics.UI.Gtk.Layout.AspectFrame gtk -Graphics.UI.Gtk.Layout.Expander gtk -Graphics.UI.Gtk.Layout.Fixed gtk -Graphics.UI.Gtk.Layout.HBox gtk -Graphics.UI.Gtk.Layout.HButtonBox gtk -Graphics.UI.Gtk.Layout.HPaned gtk -Graphics.UI.Gtk.Layout.Layout gtk -Graphics.UI.Gtk.Layout.Notebook gtk -Graphics.UI.Gtk.Layout.Table gtk -Graphics.UI.Gtk.Layout.VBox gtk -Graphics.UI.Gtk.Layout.VButtonBox gtk -Graphics.UI.Gtk.Layout.VPaned gtk -Graphics.UI.Gtk.MenuComboToolbar.CheckMenuItem gtk -Graphics.UI.Gtk.MenuComboToolbar.Combo gtk -Graphics.UI.Gtk.MenuComboToolbar.ComboBox gtk -Graphics.UI.Gtk.MenuComboToolbar.ComboBoxEntry gtk -Graphics.UI.Gtk.MenuComboToolbar.ImageMenuItem gtk -Graphics.UI.Gtk.MenuComboToolbar.Menu gtk -Graphics.UI.Gtk.MenuComboToolbar.MenuBar gtk -Graphics.UI.Gtk.MenuComboToolbar.MenuItem gtk -Graphics.UI.Gtk.MenuComboToolbar.MenuShell gtk -Graphics.UI.Gtk.MenuComboToolbar.MenuToolButton gtk -Graphics.UI.Gtk.MenuComboToolbar.OptionMenu gtk -Graphics.UI.Gtk.MenuComboToolbar.RadioMenuItem gtk -Graphics.UI.Gtk.MenuComboToolbar.RadioToolButton gtk -Graphics.UI.Gtk.MenuComboToolbar.SeparatorMenuItem gtk -Graphics.UI.Gtk.MenuComboToolbar.SeparatorToolItem gtk -Graphics.UI.Gtk.MenuComboToolbar.TearoffMenuItem gtk -Graphics.UI.Gtk.MenuComboToolbar.ToggleToolButton gtk -Graphics.UI.Gtk.MenuComboToolbar.ToolButton gtk -Graphics.UI.Gtk.MenuComboToolbar.ToolItem gtk -Graphics.UI.Gtk.MenuComboToolbar.Toolbar gtk -Graphics.UI.Gtk.Misc.Adjustment gtk -Graphics.UI.Gtk.Misc.Arrow gtk -Graphics.UI.Gtk.Misc.Calendar gtk -Graphics.UI.Gtk.Misc.DrawingArea gtk -Graphics.UI.Gtk.Misc.EventBox gtk -Graphics.UI.Gtk.Misc.HandleBox gtk -Graphics.UI.Gtk.Misc.SizeGroup gtk -Graphics.UI.Gtk.Misc.Tooltips gtk -Graphics.UI.Gtk.Misc.Viewport gtk -Graphics.UI.Gtk.Mogul gtk -Graphics.UI.Gtk.Mogul.GetWidget gtk -Graphics.UI.Gtk.Mogul.MDialog gtk -Graphics.UI.Gtk.Mogul.NewWidget gtk -Graphics.UI.Gtk.Mogul.TreeList gtk -Graphics.UI.Gtk.Mogul.WidgetTable gtk -Graphics.UI.Gtk.MozEmbed gtk -Graphics.UI.Gtk.Multiline.TextBuffer gtk -Graphics.UI.Gtk.Multiline.TextIter gtk -Graphics.UI.Gtk.Multiline.TextMark gtk -Graphics.UI.Gtk.Multiline.TextTag gtk -Graphics.UI.Gtk.Multiline.TextTagTable gtk -Graphics.UI.Gtk.Multiline.TextView gtk -Graphics.UI.Gtk.Ornaments.Frame gtk -Graphics.UI.Gtk.Ornaments.HSeparator gtk -Graphics.UI.Gtk.Ornaments.VSeparator gtk -Graphics.UI.Gtk.Pango.Context gtk -Graphics.UI.Gtk.Pango.Enums gtk -Graphics.UI.Gtk.Pango.Font gtk -Graphics.UI.Gtk.Pango.Layout gtk -Graphics.UI.Gtk.Pango.Markup gtk -Graphics.UI.Gtk.Pango.Rendering gtk -Graphics.UI.Gtk.Scrolling.HScrollbar gtk -Graphics.UI.Gtk.Scrolling.ScrolledWindow gtk -Graphics.UI.Gtk.Scrolling.VScrollbar gtk -Graphics.UI.Gtk.Selectors.ColorButton gtk -Graphics.UI.Gtk.Selectors.ColorSelection gtk -Graphics.UI.Gtk.Selectors.ColorSelectionDialog gtk -Graphics.UI.Gtk.Selectors.FileChooser gtk -Graphics.UI.Gtk.Selectors.FileChooserButton gtk -Graphics.UI.Gtk.Selectors.FileChooserDialog gtk -Graphics.UI.Gtk.Selectors.FileChooserWidget gtk -Graphics.UI.Gtk.Selectors.FileFilter gtk -Graphics.UI.Gtk.Selectors.FileSelection gtk -Graphics.UI.Gtk.Selectors.FontButton gtk -Graphics.UI.Gtk.Selectors.FontSelection gtk -Graphics.UI.Gtk.Selectors.FontSelectionDialog gtk -Graphics.UI.Gtk.SourceView gtk -Graphics.UI.Gtk.SourceView.SourceBuffer gtk -Graphics.UI.Gtk.SourceView.SourceIter gtk -Graphics.UI.Gtk.SourceView.SourceLanguage gtk -Graphics.UI.Gtk.SourceView.SourceLanguagesManager gtk -Graphics.UI.Gtk.SourceView.SourceMarker gtk -Graphics.UI.Gtk.SourceView.SourceStyleScheme gtk -Graphics.UI.Gtk.SourceView.SourceTag gtk -Graphics.UI.Gtk.SourceView.SourceTagStyle gtk -Graphics.UI.Gtk.SourceView.SourceTagTable gtk -Graphics.UI.Gtk.SourceView.SourceView gtk -Graphics.UI.Gtk.TreeList.CellRenderer gtk -Graphics.UI.Gtk.TreeList.CellRendererPixbuf gtk -Graphics.UI.Gtk.TreeList.CellRendererText gtk -Graphics.UI.Gtk.TreeList.CellRendererToggle gtk -Graphics.UI.Gtk.TreeList.CellView gtk -Graphics.UI.Gtk.TreeList.IconView gtk -Graphics.UI.Gtk.TreeList.ListStore gtk -Graphics.UI.Gtk.TreeList.TreeIter gtk -Graphics.UI.Gtk.TreeList.TreeModel gtk -Graphics.UI.Gtk.TreeList.TreeModelSort gtk -Graphics.UI.Gtk.TreeList.TreeSelection gtk -Graphics.UI.Gtk.TreeList.TreeStore gtk -Graphics.UI.Gtk.TreeList.TreeView gtk -Graphics.UI.Gtk.TreeList.TreeViewColumn gtk -Graphics.UI.Gtk.Windows.AboutDialog gtk -Graphics.UI.Gtk.Windows.Dialog gtk -Graphics.UI.Gtk.Windows.Window gtk -Graphics.UI.Gtk.Windows.WindowGroup gtk -System.Glib gtk -System.Glib.Attributes gtk -System.Glib.FFI gtk -System.Glib.Flags gtk -System.Glib.GError gtk -System.Glib.GList gtk -System.Glib.GObject gtk -System.Glib.GParameter gtk -System.Glib.GType gtk -System.Glib.GTypeConstants gtk -System.Glib.GValue gtk -System.Glib.GValueTypes gtk -System.Glib.MainLoop gtk -System.Glib.Properties gtk -System.Glib.Signals gtk -System.Glib.StoreValue gtk -System.Glib.Types gtk -System.Glib.UTFString gtk -System.Gnome.GConf gtk -System.Gnome.GConf.GConfClient gtk -System.Gnome.GConf.GConfValue gtk rmfile ./scripts/hoogle/src/Doc/res/documentation.txt rmdir ./scripts/hoogle/src/Doc/res hunk ./scripts/hoogle/src/Doc/Main.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{- | - The Web interface, expects to be run as a CGI script. - This does not require Haskell CGI etc, it just dumps HTML to the console --} - -module Doc.Main where - -import Web.CGI -import Data.Maybe -import Data.Char -import Data.List - - -main = do x <- cgiArgs - let modu = lookup "module" x - mode = lookup "mode" x - - name = case lookup "name" x of - Nothing -> "" - Just ('(':xs) -> init xs - Just x -> x - - page <- hoodoc mode modu name - putStr $ "Location: " ++ page ++ "\n\n" - - -hoodoc :: Maybe String -> Maybe String -> String -> IO String - --- keywords are special -hoodoc (Just "keyword") _ name = return $ "http://www.haskell.org/hawiki/Keywords#" ++ escape name - --- if you have no name, just direct them straight at the module page -hoodoc _ (Just modu) "" = calcPage modu "" - --- haddock assigns different prefixes for each type -hoodoc (Just "func") (Just modu) name = calcPage modu ("#v%3A" ++ escape name) -hoodoc (Just _ ) (Just modu) name = calcPage modu ("#t%3A" ++ escape name) - -hoodoc _ _ _ = return failPage - - -failPage = "nodocs.htm" -haddockPrefix = "http://haskell.org/ghc/docs/latest/html/libraries/" -wikiPrefix = "http://www.haskell.org/hawiki/LibraryDocumentation/" - - -calcPage :: String -> String -> IO String -calcPage modu suffix = - do x <- readFile "res/documentation.txt" - let xs = mapMaybe f $ lines x - return $ case lookup modu xs of - Just "wiki" -> wikiPrefix ++ modu ++ suffix - Just a -> haddockLoc a ++ map g modu ++ ".html" ++ suffix - Nothing -> failPage - where - f ys = case break (== '\t') ys of - (a, [] ) -> Nothing - (a, b) -> Just (a, dropWhile isSpace b) - - haddockLoc "gtk" = "http://haskell.org/gtk2hs/docs/gtk2hs-docs-0.9.10/" - haddockLoc a = haddockPrefix ++ a ++ "/" - - g '.' = '-' - g x = x rmfile ./scripts/hoogle/src/Doc/Main.hs rmdir ./scripts/hoogle/src/Doc hunk ./scripts/hoogle/src/CmdLine/Main.hs 1 -{- - This file is part of Hoogle, (c) Neil Mitchell 2004-2005 - http://www.cs.york.ac.uk/~ndm/hoogle/ - - This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. - To view a copy of this license, visit http://creativecommons.org/licenses/by-nc-sa/2.0/ - or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. --} - -{- | - Provides the 'main' function for the Console version. - Handles command line arguments. --} - -module CmdLine.Main where - -import Hoogle.Hoogle -import System.Environment -import Data.List -import Data.Maybe -import Data.Char -import System.Console.GetOpt -import System.Directory - - --- | The main function -main :: IO () -main = do - args <- getArgs - let newargs = map safeArrow args - (flags,query) = parseArgs newargs - - path = fromPath $ fromMaybe (Path "hoogle.txt") (find isPath flags) - verbose = Verbose `elem` flags - help = HelpMsg `elem` flags - color = Color `elem` flags - count = fromCount $ fromMaybe (Count 0) (find isCount flags) - - query2 = concat $ intersperse " " query - query3 = if help then "" else query2 - - if null query3 - then putStr helpMsg - else do - path2 <- checkPath path - if null path2 - then putStrLn $ "Could not find hoogle database, looked for: " ++ path - else hoogle path2 verbose count color query3 - where - safeArrow "-#" = " ->" - safeArrow "->" = " ->" - safeArrow xs = map (\x -> if x == '#' then '>' else x) xs - - -test x = hoogle "" True 10 x - - --- | Invoke hoogle. --- The first argument is the file to use as a data file. --- The second is a verbose flag. --- The third is the thing to search for -hoogle :: FilePath -> Bool -> Int -> Bool -> String -> IO () -hoogle _ _ _ _ "" = putStr helpMsg -hoogle p verbose count color x = - case hoogleParseError search of - Just x -> putStrLn $ "Hoogle Error: " ++ x - Nothing -> - do - case hoogleSuggest False search of - Just a -> putStrLn $ (if color then showTag else showText) a - Nothing -> return () - if color - then putStrLn $ "Searching for: " ++ showTag (hoogleSearch search) - else return () - - res <- if count == 0 then hoogleResults p search else hoogleRange p search 0 count - case res of - [] -> putStrLn "No matches found" - xs -> putStr $ unlines $ map f xs - where - search = hoogleParse x - - f res = showResult color res ++ - if verbose - then " @ " ++ show (resultScore res) ++ " " ++ show (resultInfo res) - else "" - - -showResult :: Bool -> Result -> String -showResult color (Result modu name typ _ _ _ _) = - (if null fmodu then "" else fmodu ++ ".") ++ f name ++ " :: " ++ f typ - where - fmodu = f modu - f x = if color then showTag x else showText x - - -showTag :: TagStr -> String -showTag x = f [] x - where - f a (Str x) = x - f a (Tags xs) = concatMap (f a) xs - f a (Tag code x) = case getCode code of - Nothing -> f a x - Just val -> tag (val:a) ++ f (val:a) x ++ tag a - - getCode "b" = Just "1" - getCode "a" = Just "4" - getCode "u" = Just "4" - getCode [x] | x <= '6' && x >= '1' = Just ['3', x] - getCode _ = Nothing - - tag stack = chr 27 : '[' : (concat $ intersperse ";" $ ("0":reverse stack)) ++ "m" - - --- | A help message to give the user, roughly what you get from hoogle --help -helpMsg :: String -helpMsg - = unlines $ [ - "HOOGLE - Haskell API Search", - "(C) Neil Mitchell 2004-2006, York University, UK", - "", - usageInfo ("Usage: hoogle [OPTION...] search") opts, - - "examples:", - " hoogle map", - " hoogle (a -> b) -> [a] -> [b]", - " hoogle [Char] -> [Bool]", - "", - "To aid when using certain consoles, -# is a synonym for ->", - "Suggestions/comments/bugs to ndm -AT- cs.york.ac.uk", - "A web version is available at www.cs.york.ac.uk/~ndm/hoogle/" - ] - - -isPath (Path _) = True; isPath _ = False -isCount (Count _) = True; isCount _ = False - - --- | Data structure representing the falgs -data Flag = Verbose -- ^ Should verbose info be given, mainly percentage match - | Path {fromPath :: FilePath} -- ^ Where to find the data file - | HelpMsg -- ^ Show the help message - | Count {fromCount :: Int} - | Color - deriving Eq - --- | The options available -opts :: [OptDescr Flag] -opts = [ Option ['v'] ["verbose"] (NoArg Verbose) "verbose results" - , Option ['n'] ["count"] ((ReqArg (\n -> Count (read n))) "30") "number of results" - , Option ['l'] [] ((ReqArg (\p -> Path p)) "path/hoogle.txt") "path to hoogle.txt" - , Option ['h'] ["help"] (NoArg HelpMsg) "help message" - , Option ['c'] ["color"] (NoArg Color) "show with color" - ] - --- | Parse the arguments, give out appropriate messages -parseArgs :: [String] -> ([Flag], [String]) -parseArgs argv = case getOpt Permute opts argv of - (flags,query,[]) -> (flags,query) - (_,_,err) -> error $ concat err ++ helpMsg - - - --- | If a path is given check that it exists --- If not then try relative to yourself -checkPath :: FilePath -> IO FilePath -checkPath file = do - b <- doesFileExist file - if b then return file else do - prog <- getProgName - path <- findExecutable prog - case path of - Nothing -> return "" - Just path -> do - file <- return $ setFileName path file - b <- doesFileExist file - if b then return file else return "" - - -setFileName :: FilePath -> String -> FilePath -setFileName path file = (reverse $ dropWhile (not . (`elem` "\\/")) $ reverse path) ++ file rmfile ./scripts/hoogle/src/CmdLine/Main.hs rmdir ./scripts/hoogle/src/CmdLine hunk ./scripts/hoogle/src/CmdLine.hs 1 -import CmdLine.Main rmfile ./scripts/hoogle/src/CmdLine.hs hunk ./scripts/hoogle/src/Doc.hs 1 -import Doc.Main rmfile ./scripts/hoogle/src/Doc.hs hunk ./scripts/hoogle/src/hoogle.txt 1 --- Generated by Hoogle, from Haddock HTML --- (C) Neil Mitchell 2005 - - -module Array -(!) :: Ix a => Array a b -> a -> b -(//) :: Ix a => Array a b -> [(a,b)] -> Array a b -accum :: Ix a => (b -> c -> b) -> Array a b -> [(a,c)] -> Array a b -accumArray :: Ix a => (b -> c -> b) -> b -> (a,a) -> [(a,c)] -> Array a b -array :: Ix a => (a,a) -> [(a,b)] -> Array a b -assocs :: Ix a => Array a b -> [(a,b)] -bounds :: Ix a => Array a b -> (a,a) -elems :: Ix a => Array a b -> [b] -indices :: Ix a => Array a b -> [a] -ixmap :: (Ix a, Ix b) => (a,a) -> (a -> b) -> Array b c -> Array a c -listArray :: Ix a => (a,a) -> [b] -> Array a b - -module CPUTime -cpuTimePrecision :: Integer -getCPUTime :: IO Integer - -module Char -chr :: Int -> Char -digitToInt :: Char -> Int -intToDigit :: Int -> Char -isAlpha :: Char -> Bool -isAlphaNum :: Char -> Bool -isAscii :: Char -> Bool -isControl :: Char -> Bool -isDigit :: Char -> Bool -isHexDigit :: Char -> Bool -isLatin1 :: a -> Bool -isLower :: Char -> Bool -isOctDigit :: Char -> Bool -isPrint :: Char -> Bool -isSpace :: Char -> Bool -isUpper :: Char -> Bool -lexLitChar :: ReadS String -ord :: Char -> Int -readLitChar :: ReadS Char -showLitChar :: Char -> ShowS -toLower :: Char -> Char -toUpper :: Char -> Char - -module Complex -(:+) :: RealFloat a => a -> a -> Complex a -cis :: RealFloat a => a -> Complex a -conjugate :: RealFloat a => Complex a -> Complex a -imagPart :: RealFloat a => Complex a -> a -magnitude :: RealFloat a => Complex a -> a -mkPolar :: RealFloat a => a -> a -> Complex a -phase :: RealFloat a => Complex a -> a -polar :: RealFloat a => Complex a -> (a,a) -realPart :: RealFloat a => Complex a -> a - -module Control.Arrow -(&&&) :: Arrow a => a b c -> a b c' -> a b (c,c') -(***) :: Arrow a => a b c -> a b' c' -> a (b,b') (c,c') -(+++) :: ArrowChoice a => a b c -> a b' c' -> a (Either b b') (Either c c') -(<+>) :: ArrowPlus a => a b c -> a b c -> a b c -(<<<) :: Arrow a => a c d -> a b c -> a b d -(<<^) :: Arrow a => a c d -> (b -> c) -> a b d -(>>>) :: Arrow a => a b c -> a c d -> a b d -(>>^) :: Arrow a => a b c -> (c -> d) -> a b d -(^<<) :: Arrow a => (c -> d) -> a b c -> a b d -(^>>) :: Arrow a => (b -> c) -> a c d -> a b d -(|||) :: ArrowChoice a => a b d -> a c d -> a (Either b c) d -ArrowMonad :: (a () b) -> ArrowMonad a b -Kleisli :: a -> m b -> Kleisli m a b -app :: ArrowApply a => a (a b c,b) c -arr :: Arrow a => (b -> c) -> a b c -class Arrow a -class Arrow a => ArrowApply a -class Arrow a => ArrowChoice a -class Arrow a => ArrowLoop a -class Arrow a => ArrowZero a -class ArrowZero a => ArrowPlus a -first :: Arrow a => a b c -> a (b,d) (c,d) -instance ArrowApply a => Monad (ArrowMonad a) -instance Monad m => Arrow (Kleisli m) -instance Monad m => ArrowApply (Kleisli m) -instance Monad m => ArrowChoice (Kleisli m) -instance MonadFix m => ArrowLoop (Kleisli m) -instance MonadPlus m => ArrowPlus (Kleisli m) -instance MonadPlus m => ArrowZero (Kleisli m) -left :: ArrowChoice a => a b c -> a (Either b d) (Either c d) -leftApp :: ArrowApply a => a b c -> a (Either b d) (Either c d) -loop :: ArrowLoop a => a (b,d) (c,d) -> a b c -newtype ArrowMonad a b -newtype Kleisli m a b -pure :: Arrow a => (b -> c) -> a b c -returnA :: Arrow a => a b b -right :: ArrowChoice a => a b c -> a (Either d b) (Either d c) -runKleisli :: Kleisli m a b -> a -> m b -second :: Arrow a => a b c -> a (d,b) (d,c) -zeroArrow :: ArrowZero a => a b c - -module Control.Concurrent -data ThreadId -forkIO :: IO () -> IO ThreadId -forkOS :: IO () -> IO ThreadId -instance Data ThreadId -instance Eq ThreadId -instance Ord ThreadId -instance Show ThreadId -instance Typeable ThreadId -isCurrentThreadBound :: IO Bool -killThread :: ThreadId -> IO () -mergeIO :: [a] -> [a] -> IO [a] -myThreadId :: IO ThreadId -nmergeIO :: [[a]] -> IO [a] -rtsSupportsBoundThreads :: Bool -runInBoundThread :: IO a -> IO a -runInUnboundThread :: IO a -> IO a -threadDelay :: Int -> IO () -threadWaitRead :: Fd -> IO () -threadWaitWrite :: Fd -> IO () -throwTo :: ThreadId -> Exception -> IO () -yield :: IO () - -module Control.Concurrent.Chan -data Chan a -dupChan :: Chan a -> IO (Chan a) -getChanContents :: Chan a -> IO [a] -instance Typeable1 Chan -isEmptyChan :: Chan a -> IO Bool -newChan :: IO (Chan a) -readChan :: Chan a -> IO a -unGetChan :: Chan a -> a -> IO () -writeChan :: Chan a -> a -> IO () -writeList2Chan :: Chan a -> [a] -> IO () - -module Control.Concurrent.MVar -modifyMVar :: MVar a -> (a -> IO (a, b)) -> IO b -modifyMVar_ :: MVar a -> (a -> IO a) -> IO () -readMVar :: MVar a -> IO a -swapMVar :: MVar a -> a -> IO a -withMVar :: MVar a -> (a -> IO b) -> IO b - -module Control.Concurrent.QSem -data QSem -instance Typeable QSem -newQSem :: Int -> IO QSem -signalQSem :: QSem -> IO () -waitQSem :: QSem -> IO () - -module Control.Concurrent.QSemN -data QSemN -instance Typeable QSemN -newQSemN :: Int -> IO QSemN -signalQSemN :: QSemN -> Int -> IO () -waitQSemN :: QSemN -> Int -> IO () - -module Control.Concurrent.STM -STM -atomically -catchSTM -check :: Bool -> STM a -orElse -retry - -module Control.Concurrent.STM.TChan -data TChan a -dupTChan :: TChan a -> STM (TChan a) -isEmptyTChan :: TChan a -> STM Bool -newTChan :: STM (TChan a) -readTChan :: TChan a -> STM a -unGetTChan :: TChan a -> a -> STM () -writeTChan :: TChan a -> a -> STM () - -module Control.Concurrent.STM.TMVar -data TMVar a -isEmptyTMVar :: TMVar a -> STM Bool -newEmptyTMVar :: STM (TMVar a) -newTMVar :: a -> STM (TMVar a) -putTMVar :: TMVar a -> a -> STM () -readTMVar :: TMVar a -> STM a -swapTMVar :: TMVar a -> a -> STM a -takeTMVar :: TMVar a -> STM a -tryPutTMVar :: TMVar a -> a -> STM Bool -tryTakeTMVar :: TMVar a -> STM (Maybe a) - -module Control.Concurrent.STM.TVar -TVar -newTVar -readTVar -writeTVar - -module Control.Concurrent.SampleVar -emptySampleVar :: SampleVar a -> IO () -isEmptySampleVar :: SampleVar a -> IO Bool -newEmptySampleVar :: IO (SampleVar a) -newSampleVar :: a -> IO (SampleVar a) -readSampleVar :: SampleVar a -> IO a -type SampleVar a = MVar (Int, MVar a) -writeSampleVar :: SampleVar a -> a -> IO () - -module Control.Exception -ArithException :: ArithException -> Exception -ArrayException :: ArrayException -> Exception -AssertionFailed :: String -> Exception -AsyncException :: AsyncException -> Exception -BlockedIndefinitely :: Exception -BlockedOnDeadMVar :: Exception -Deadlock :: Exception -Denormal :: ArithException -DivideByZero :: ArithException -DynException :: Dynamic -> Exception -ErrorCall :: String -> Exception -ExitException :: ExitCode -> Exception -HeapOverflow :: AsyncException -IOException :: IOException -> Exception -IndexOutOfBounds :: String -> ArrayException -LossOfPrecision :: ArithException -NoMethodError :: String -> Exception -NonTermination :: Exception -Overflow :: ArithException -PatternMatchFail :: String -> Exception -RecConError :: String -> Exception -RecSelError :: String -> Exception -RecUpdError :: String -> Exception -StackOverflow :: AsyncException -ThreadKilled :: AsyncException -UndefinedElement :: String -> ArrayException -Underflow :: ArithException -arithExceptions :: Exception -> Maybe ArithException -assert :: Bool -> a -> a -assertions :: Exception -> Maybe String -asyncExceptions :: Exception -> Maybe AsyncException -block :: IO a -> IO a -bracket_ :: IO a -> IO b -> IO c -> IO c -catch :: IO a -> (Exception -> IO a) -> IO a -catchDyn :: Typeable exception => IO a -> (exception -> IO a) -> IO a -catchJust :: (Exception -> Maybe b) -> IO a -> (b -> IO a) -> IO a -data ArithException -data ArrayException -data AsyncException -data Exception -data IOException -dynExceptions :: Exception -> Maybe Dynamic -errorCalls :: Exception -> Maybe String -evaluate :: a -> IO a -finally :: IO a -> IO b -> IO a -getUncaughtExceptionHandler :: IO (Exception -> IO ()) -handle :: (Exception -> IO a) -> IO a -> IO a -handleJust :: (Exception -> Maybe b) -> (b -> IO a) -> IO a -> IO a -instance Eq ArithException -instance Eq ArrayException -instance Eq AsyncException -instance Eq Exception -instance Eq IOException -instance Ord ArithException -instance Ord ArrayException -instance Ord AsyncException -instance Show ArithException -instance Show ArrayException -instance Show AsyncException -instance Show Exception -instance Show IOException -instance Typeable ArithException -instance Typeable ArrayException -instance Typeable AsyncException -instance Typeable Exception -instance Typeable IOException -ioErrors :: Exception -> Maybe IOError -mapException :: (Exception -> Exception) -> a -> a -setUncaughtExceptionHandler :: (Exception -> IO ()) -> IO () -throw :: Exception -> a -throwDyn :: Typeable exception => exception -> b -throwDynTo :: Typeable exception => ThreadId -> exception -> IO () -throwIO :: Exception -> IO a -try :: IO a -> IO (Either Exception a) -tryJust :: (Exception -> Maybe b) -> IO a -> IO (Either b a) -unblock :: IO a -> IO a -userErrors :: Exception -> Maybe String - -module Control.Monad -ap :: Monad m => m (a -> b) -> m a -> m b -class Monad m => MonadPlus m -filterM :: Monad m => (a -> m Bool) -> [a] -> m [a] -foldM :: Monad m => (a -> b -> m a) -> a -> [b] -> m a -foldM_ :: Monad m => (a -> b -> m a) -> a -> [b] -> m () -guard :: MonadPlus m => Bool -> m () -join :: Monad m => m (m a) -> m a -liftM :: Monad m => (a1 -> r) -> m a1 -> m r -liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r -liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r -liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r -liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r -mapAndUnzipM :: Monad m => (a -> m (b, c)) -> [a] -> m ([b], [c]) -mplus :: MonadPlus m => m a -> m a -> m a -msum :: MonadPlus m => [m a] -> m a -mzero :: MonadPlus m => m a -replicateM :: Monad m => Int -> m a -> m [a] -replicateM_ :: Monad m => Int -> m a -> m () -unless :: Monad m => Bool -> m () -> m () -when :: Monad m => Bool -> m () -> m () -zipWithM :: Monad m => (a -> b -> m c) -> [a] -> [b] -> m [c] -zipWithM_ :: Monad m => (a -> b -> m c) -> [a] -> [b] -> m () - -module Control.Monad.Cont -Cont :: ((a -> r) -> r) -> Cont r a -ContT :: ((a -> m r) -> m r) -> ContT r m a -callCC :: MonadCont m => ((a -> m b) -> m a) -> m a -class Monad m => MonadCont m -instance Functor (Cont r) -instance Monad (Cont r) -instance Monad m => Functor (ContT r m) -instance Monad m => Monad (ContT r m) -instance Monad m => MonadCont (ContT r m) -instance MonadCont (Cont r) -instance MonadIO m => MonadIO (ContT r m) -instance MonadReader r' m => MonadReader r' (ContT r m) -instance MonadState s m => MonadState s (ContT r m) -instance MonadTrans (ContT r) -mapCont :: (r -> r) -> Cont r a -> Cont r a -mapContT :: (m r -> m r) -> ContT r m a -> ContT r m a -newtype Cont r a -newtype ContT r m a -runCont :: Cont r a -> ((a -> r) -> r) -runContT :: ContT r m a -> ((a -> m r) -> m r) -withCont :: ((b -> r) -> a -> r) -> Cont r a -> Cont r b -withContT :: ((b -> m r) -> a -> m r) -> ContT r m a -> ContT r m b - -module Control.Monad.Error -ErrorT :: (m (Either e a)) -> ErrorT e m a -catchError :: MonadError e m => m a -> (e -> m a) -> m a -class Error a -class Monad m => MonadError e m -instance (Error e, MonadCont m) => MonadCont (ErrorT e m) -instance (Error e, MonadIO m) => MonadIO (ErrorT e m) -instance (Error e, MonadReader r m) => MonadReader r (ErrorT e m) -instance (Error e, MonadState s m) => MonadState s (ErrorT e m) -instance (Error e, MonadWriter w m) => MonadWriter w (ErrorT e m) -instance (Monad m, Error e) => Monad (ErrorT e m) -instance (Monad m, Error e) => MonadError e (ErrorT e m) -instance (Monad m, Error e) => MonadPlus (ErrorT e m) -instance (MonadFix m, Error e) => MonadFix (ErrorT e m) -instance Error e => MonadTrans (ErrorT e) -instance Monad m => Functor (ErrorT e m) -mapErrorT :: (m (Either e a) -> n (Either e' b)) -> ErrorT e m a -> ErrorT e' n b -newtype ErrorT e m a -noMsg :: Error a => a -runErrorT :: ErrorT e m a -> (m (Either e a)) -strMsg :: Error a => String -> a -throwError :: MonadError e m => e -> m a - -module Control.Monad.Fix -class Monad m => MonadFix m -fix :: (a -> a) -> a -mfix :: MonadFix m => (a -> m a) -> m a - -module Control.Monad.Identity -Identity :: a -> Identity a -instance Functor Identity -instance Monad Identity -instance MonadFix Identity -newtype Identity a -runIdentity :: Identity a -> a - -module Control.Monad.List -ListT :: m [a] -> ListT m a -instance Monad m => Functor (ListT m) -instance Monad m => Monad (ListT m) -instance Monad m => MonadPlus (ListT m) -instance MonadCont m => MonadCont (ListT m) -instance MonadError e m => MonadError e (ListT m) -instance MonadIO m => MonadIO (ListT m) -instance MonadReader s m => MonadReader s (ListT m) -instance MonadState s m => MonadState s (ListT m) -instance MonadTrans ListT -mapListT :: (m [a] -> n [b]) -> ListT m a -> ListT n b -newtype ListT m a -runListT :: ListT m a -> m [a] - -module Control.Monad.RWS -RWS :: (r -> s -> (a,s,w)) -> RWS r w s a -RWST :: (r -> s -> m (a,s,w)) -> RWST r w s m a -evalRWS :: RWS r w s a -> r -> s -> (a, w) -evalRWST :: Monad m => RWST r w s m a -> r -> s -> m (a, w) -execRWS :: RWS r w s a -> r -> s -> (s, w) -execRWST :: Monad m => RWST r w s m a -> r -> s -> m (s, w) -instance (Monoid w, Monad m) => Monad (RWST r w s m) -instance (Monoid w, Monad m) => MonadReader r (RWST r w s m) -instance (Monoid w, Monad m) => MonadState s (RWST r w s m) -instance (Monoid w, Monad m) => MonadWriter w (RWST r w s m) -instance (Monoid w, MonadCont m) => MonadCont (RWST r w s m) -instance (Monoid w, MonadError e m) => MonadError e (RWST r w s m) -instance (Monoid w, MonadFix m) => MonadFix (RWST r w s m) -instance (Monoid w, MonadIO m) => MonadIO (RWST r w s m) -instance (Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) -instance Functor (RWS r w s) -instance Monad m => Functor (RWST r w s m) -instance Monoid w => Monad (RWS r w s) -instance Monoid w => MonadFix (RWS r w s) -instance Monoid w => MonadReader r (RWS r w s) -instance Monoid w => MonadState s (RWS r w s) -instance Monoid w => MonadTrans (RWST r w s) -instance Monoid w => MonadWriter w (RWS r w s) -mapRWS :: ((a, s, w) -> (b, s, w')) -> RWS r w s a -> RWS r w' s b -mapRWST :: (m (a, s, w) -> n (b, s, w')) -> RWST r w s m a -> RWST r w' s n b -newtype RWS r w s a -newtype RWST r w s m a -runRWS :: RWS r w s a -> (r -> s -> (a,s,w)) -runRWST :: RWST r w s m a -> (r -> s -> m (a,s,w)) -withRWS :: (r' -> s -> (r, s)) -> RWS r w s a -> RWS r' w s a -withRWST :: (r' -> s -> (r, s)) -> RWST r w s m a -> RWST r' w s m a - -module Control.Monad.Reader -Reader :: r -> a -> Reader r a -ReaderT :: r -> m a -> ReaderT r m a -ask :: MonadReader r m => m r -asks :: MonadReader r m => (r -> a) -> m a -class Monad m => MonadReader r m -instance Functor (Reader r) -instance Monad (Reader r) -instance Monad m => Functor (ReaderT r m) -instance Monad m => Monad (ReaderT r m) -instance Monad m => MonadReader r (ReaderT r m) -instance MonadCont m => MonadCont (ReaderT r m) -instance MonadError e m => MonadError e (ReaderT r m) -instance MonadFix (Reader r) -instance MonadFix m => MonadFix (ReaderT r m) -instance MonadIO m => MonadIO (ReaderT r m) -instance MonadPlus m => MonadPlus (ReaderT r m) -instance MonadReader r (Reader r) -instance MonadState s m => MonadState s (ReaderT r m) -instance MonadTrans (ReaderT r) -instance MonadWriter w m => MonadWriter w (ReaderT r m) -local :: MonadReader r m => (r -> r) -> m a -> m a -mapReader :: (a -> b) -> Reader r a -> Reader r b -mapReaderT :: (m a -> n b) -> ReaderT w m a -> ReaderT w n b -newtype Reader r a -newtype ReaderT r m a -runReader :: Reader r a -> r -> a -runReaderT :: ReaderT r m a -> r -> m a -withReader :: (r' -> r) -> Reader r a -> Reader r' a -withReaderT :: (r' -> r) -> ReaderT r m a -> ReaderT r' m a - -module Control.Monad.ST -data RealWorld -data ST s a -fixST :: (a -> ST s a) -> ST s a -instance (Typeable s, Typeable a) => Data (ST s a) -instance Functor (ST s) -instance MArray (STArray s) e (ST s) -instance Monad (ST s) -instance MonadFix (ST s) -instance Show (ST s a) -instance Typeable RealWorld -instance Typeable2 ST -runST :: (ST s a) -> a -stToIO :: ST RealWorld a -> IO a -unsafeIOToST :: IO a -> ST s a -unsafeInterleaveST :: ST s a -> ST s a - -module Control.Monad.ST.Lazy -lazyToStrictST :: ST s a -> ST s a -strictToLazyST :: ST s a -> ST s a - -module Control.Monad.State -State :: (s -> (a,s)) -> State s a -StateT :: (s -> m (a,s)) -> StateT s m a -class Monad m => MonadState s m -evalState :: State s a -> s -> a -evalStateT :: Monad m => StateT s m a -> s -> m a -execState :: State s a -> s -> s -execStateT :: Monad m => StateT s m a -> s -> m s -get :: MonadState s m => m s -gets :: MonadState s m => (s -> a) -> m a -instance Functor (State s) -instance Monad (State s) -instance Monad m => Functor (StateT s m) -instance Monad m => Monad (StateT s m) -instance Monad m => MonadState s (StateT s m) -instance MonadCont m => MonadCont (StateT s m) -instance MonadError e m => MonadError e (StateT s m) -instance MonadFix (State s) -instance MonadFix m => MonadFix (StateT s m) -instance MonadIO m => MonadIO (StateT s m) -instance MonadPlus m => MonadPlus (StateT s m) -instance MonadReader r m => MonadReader r (StateT s m) -instance MonadState s (State s) -instance MonadTrans (StateT s) -instance MonadWriter w m => MonadWriter w (StateT s m) -mapState :: ((a, s) -> (b, s)) -> State s a -> State s b -mapStateT :: (m (a, s) -> n (b, s)) -> StateT s m a -> StateT s n b -modify :: MonadState s m => (s -> s) -> m () -newtype State s a -newtype StateT s m a -put :: MonadState s m => s -> m () -runState :: State s a -> (s -> (a,s)) -runStateT :: StateT s m a -> (s -> m (a,s)) -withState :: (s -> s) -> State s a -> State s a -withStateT :: (s -> s) -> StateT s m a -> StateT s m a - -module Control.Monad.Trans -class Monad m => MonadIO m -class MonadTrans t -lift :: (MonadTrans t, Monad m) => m a -> t m a -liftIO :: MonadIO m => IO a -> m a - -module Control.Monad.Writer -Writer :: a,w -> Writer w a -WriterT :: (m (a,w)) -> WriterT w m a -censor :: MonadWriter w m => (w -> w) -> m a -> m a -class (Monoid w, Monad m) => MonadWriter w m -execWriter :: Writer w a -> w -execWriterT :: Monad m => WriterT w m a -> m w -instance (Monoid w, Monad m) => Monad (WriterT w m) -instance (Monoid w, Monad m) => MonadWriter w (WriterT w m) -instance (Monoid w, MonadCont m) => MonadCont (WriterT w m) -instance (Monoid w, MonadError e m) => MonadError e (WriterT w m) -instance (Monoid w, MonadFix m) => MonadFix (WriterT w m) -instance (Monoid w, MonadIO m) => MonadIO (WriterT w m) -instance (Monoid w, MonadPlus m) => MonadPlus (WriterT w m) -instance (Monoid w, MonadReader r m) => MonadReader r (WriterT w m) -instance (Monoid w, MonadState s m) => MonadState s (WriterT w m) -instance Functor (Writer w) -instance Monad m => Functor (WriterT w m) -instance Monoid w => Monad (Writer w) -instance Monoid w => MonadFix (Writer w) -instance Monoid w => MonadTrans (WriterT w) -instance Monoid w => MonadWriter w (Writer w) -listen :: MonadWriter w m => m a -> m (a,w) -listens :: MonadWriter w m => (w -> b) -> m a -> m (a, b) -mapWriter :: ((a, w) -> (b, w')) -> Writer w a -> Writer w' b -mapWriterT :: (m (a, w) -> n (b, w')) -> WriterT w m a -> WriterT w' n b -newtype Writer w a -newtype WriterT w m a -pass :: MonadWriter w m => m (a,w -> w) -> m a -runWriter :: Writer w a -> a,w -runWriterT :: WriterT w m a -> (m (a,w)) -tell :: MonadWriter w m => w -> m () - -module Control.Parallel -par :: a -> b -> b - -module Control.Parallel.Strategies -($|) :: (a -> b) -> Strategy a -> a -> b -($||) :: (a -> b) -> Strategy a -> a -> b -(-|) :: (a -> b) -> Strategy b -> (b -> c) -> a -> c -(-||) :: (a -> b) -> Strategy b -> (b -> c) -> a -> c -(.|) :: (b -> c) -> Strategy b -> (a -> b) -> a -> c -(.||) :: (b -> c) -> Strategy b -> (a -> b) -> a -> c -(:=) :: a -> b -> Assoc a b -(>|) :: Done -> Done -> Done -(>||) :: Done -> Done -> Done -class (NFData a, Integral a) => NFDataInt -class (NFData a, Ord a) => NFDa -class NFData a -data Assoc a b -demanding :: a -> Done -> a -force :: NFData a => a -> a -fstPairFstList :: NFData a => Strategy [(a, b)] -instance (NFData a, NFData b) => NFData (Assoc a b) -parArr :: Ix b => Strategy a -> Strategy (Array b a) -parBuffer :: Int -> Strategy a -> [a] -> [a] -parFlatMap :: Strategy [b] -> (a -> [b]) -> [a] -> [b] -parList :: Strategy a -> Strategy [a] -parListChunk :: Int -> Strategy a -> Strategy [a] -parListN :: Integral b => b -> Strategy a -> Strategy [a] -parListNth :: Int -> Strategy a -> Strategy [a] -parMap :: Strategy b -> (a -> b) -> [a] -> [b] -parPair :: Strategy a -> Strategy b -> Strategy (a, b) -parTriple :: Strategy a -> Strategy b -> Strategy c -> Strategy (a, b, c) -parZipWith :: Strategy c -> (a -> b -> c) -> [a] -> [b] -> [c] -r0 :: Strategy a -rnf :: NFData a => Strategy a -rwhnf :: Strategy a -sPar :: a -> Strategy b -sSeq :: a -> Strategy b -seqArr :: Ix b => Strategy a -> Strategy (Array b a) -seqList :: Strategy a -> Strategy [a] -seqListN :: Integral a => a -> Strategy b -> Strategy [b] -seqListNth :: Int -> Strategy b -> Strategy [b] -seqPair :: Strategy a -> Strategy b -> Strategy (a, b) -seqTriple :: Strategy a -> Strategy b -> Strategy c -> Strategy (a, b, c) -sforce :: NFData a => a -> b -> b -sparking :: a -> Done -> a -type Done = () -type Strategy a = a -> Done -using :: a -> Strategy a -> a - -module Data.Array -(!) :: Ix i => Array i e -> i -> e -(//) :: Ix i => Array i e -> [(i, e)] -> Array i e -accum :: Ix i => (e -> a -> e) -> Array i e -> [(i, a)] -> Array i e -accumArray :: Ix i => (e -> a -> e) -> e -> (i, i) -> [(i, a)] -> Array i e -array :: Ix i => (i, i) -> [(i, e)] -> Array i e -assocs :: Ix i => Array i e -> [(i, e)] -bounds :: Ix i => Array i e -> (i, i) -data Array i e -elems :: Ix i => Array i e -> [e] -indices :: Ix i => Array i e -> [i] -instance (Ix a, NFData a, NFData b) => NFData (Array a b) -instance (Ix a, Read a, Read b) => Read (Array a b) -instance (Ix a, Show a, Show b) => Show (Array a b) -instance (Ix i, Eq e) => Eq (Array i e) -instance (Ix i, Ord e) => Ord (Array i e) -instance (Typeable a, Data b, Ix a) => Data (Array a b) -instance HasBounds Array -instance IArray Array e -instance Ix i => Functor (Array i) -instance Ix i => FunctorM (Array i) -instance Typeable2 Array -ixmap :: (Ix i, Ix j) => (i, i) -> (i -> j) -> Array j e -> Array i e -listArray :: Ix i => (i, i) -> [e] -> Array i e - -module Data.Array.Diff -data IOToDiffArray a i e -instance HasBounds a => HasBounds (IOToDiffArray a) -instance IArray (IOToDiffArray IOArray) e -newDiffArray :: (MArray a e IO, Ix i) => (i, i) -> [(Int, e)] -> IO (IOToDiffArray a i e) -readDiffArray :: (MArray a e IO, Ix i) => IOToDiffArray a i e -> Int -> IO e -replaceDiffArray :: (MArray a e IO, Ix i) => IOToDiffArray a i e -> [(Int, e)] -> IO (IOToDiffArray a i e) -type DiffArray = IOToDiffArray IOArray -type DiffUArray = IOToDiffArray IOUArray - -module Data.Array.IArray -(!) :: (IArray a e, Ix i) => a i e -> i -> e -(//) :: (IArray a e, Ix i) => a i e -> [(i, e)] -> a i e -accum :: (IArray a e, Ix i) => (e -> e' -> e) -> a i e -> [(i, e')] -> a i e -accumArray :: (IArray a e, Ix i) => (e -> e' -> e) -> e -> (i, i) -> [(i, e')] -> a i e -amap :: (IArray a e', IArray a e, Ix i) => (e' -> e) -> a i e' -> a i e -array :: (IArray a e, Ix i) => (i, i) -> [(i, e)] -> a i e -assocs :: (IArray a e, Ix i) => a i e -> [(i, e)] -bounds :: (HasBounds a, Ix i) => a i e -> (i, i) -bounds :: (HasBounds a, Ix i) => a i e -> (i,i) -class HasBounds a -class HasBounds a => IAr -elems :: (IArray a e, Ix i) => a i e -> [e] -indices :: (HasBounds a, Ix i) => a i e -> [i] -ixmap :: (IArray a e, Ix i, Ix j) => (i, i) -> (i -> j) -> a j e -> a i e -listArray :: (IArray a e, Ix i) => (i, i) -> [e] -> a i e - -module Data.Array.IO -castIOUArray :: IOUArray ix a -> IO (IOUArray ix b) -data IOArray i e -data IOUArray i e -hGetArray :: Handle -> IOUArray Int Word8 -> Int -> IO Int -hPutArray :: Handle -> IOUArray Int Word8 -> Int -> IO () -instance Eq (IOArray i e) -instance HasBounds IOArray -instance HasBounds IOUArray -instance Typeable2 IOArray -instance Typeable2 IOUArray - -module Data.Array.MArray -class (HasBounds a, Monad m) => MArray a e m -freeze :: (Ix i, MArray a e m, IArray b e) => a i e -> m (b i e) -getAssocs :: (MArray a e m, Ix i) => a i e -> m [(i, e)] -getElems :: (MArray a e m, Ix i) => a i e -> m [e] -mapArray :: (MArray a e' m, MArray a e m, Ix i) => (e' -> e) -> a i e' -> m (a i e) -mapIndices :: (MArray a e m, Ix i, Ix j) => (i, i) -> (i -> j) -> a j e -> m (a i e) -newArray :: (MArray a e m, Ix i) => (i, i) -> e -> m (a i e) -newArray :: (MArray a e m, Ix i) => (i,i) -> e -> m (a i e) -newArray_ :: (MArray a e m, Ix i) => (i, i) -> m (a i e) -newArray_ :: (MArray a e m, Ix i) => (i,i) -> m (a i e) -newListArray :: (MArray a e m, Ix i) => (i, i) -> [e] -> m (a i e) -readArray :: (MArray a e m, Ix i) => a i e -> i -> m e -thaw :: (Ix i, IArray a e, MArray b e m) => a i e -> m (b i e) -unsafeFreeze :: (Ix i, MArray a e m, IArray b e) => a i e -> m (b i e) -unsafeThaw :: (Ix i, IArray a e, MArray b e m) => a i e -> m (b i e) -writeArray :: (MArray a e m, Ix i) => a i e -> i -> e -> m () - -module Data.Array.ST -castSTUArray :: STUArray s ix a -> ST s (STUArray s ix b) -data STArray s i e -data STUArray s i a -instance Eq (STArray s i e) -instance HasBounds (STArray s) -instance HasBounds (STUArray s) -instance Typeable3 STArray -instance Typeable3 STUArray -runSTArray :: Ix i => (ST s (STArray s i e)) -> Array i e -runSTUArray :: Ix i => (ST s (STUArray s i e)) -> UArray i e - -module Data.Array.Storable -data StorableArray i e -instance HasBounds StorableArray -touchStorableArray :: StorableArray i e -> IO () -withStorableArray :: StorableArray i e -> (Ptr e -> IO a) -> IO a - -module Data.Array.Unboxed -data UArray i e -instance HasBounds UArray -instance Typeable2 UArray - -module Data.Bits -(.&.) :: Bits a => a -> a -> a -(.|.) :: Bits a => a -> a -> a -bit :: Bits a => Int -> a -bitSize :: Bits a => a -> Int -class Num a => Bits a -clearBit :: Bits a => a -> Int -> a -complement :: Bits a => a -> a -complementBit :: Bits a => a -> Int -> a -isSigned :: Bits a => a -> Bool -rotate :: Bits a => a -> Int -> a -rotateL :: Bits a => a -> Int -> a -rotateR :: Bits a => a -> Int -> a -setBit :: Bits a => a -> Int -> a -shift :: Bits a => a -> Int -> a -shiftL :: Bits a => a -> Int -> a -shiftR :: Bits a => a -> Int -> a -testBit :: Bits a => a -> Int -> Bool -xor :: Bits a => a -> a -> a - -module Data.Char -isLatin1 :: Char -> Bool - -module Data.Complex -(:+) :: !a -> !a -> Complex a -data Complex a -instance (RealFloat a, Eq a) => Eq (Complex a) -instance (RealFloat a, NFData a) => NFData (Complex a) -instance (RealFloat a, Read a) => Read (Complex a) -instance (RealFloat a, Show a) => Show (Complex a) -instance RealFloat a => Floating (Complex a) -instance RealFloat a => Fractional (Complex a) -instance RealFloat a => Num (Complex a) -instance Typeable1 Complex -polar :: RealFloat a => Complex a -> (a, a) - -module Data.Dynamic -data Dynamic -dynApp :: Dynamic -> Dynamic -> Dynamic -dynApply :: Dynamic -> Dynamic -> Maybe Dynamic -fromDyn :: Typeable a => Dynamic -> a -> a -fromDynamic :: Typeable a => Dynamic -> Maybe a -instance Show Dynamic -instance Typeable Dynamic -toDyn :: Typeable a => a -> Dynamic - -module Data.FiniteMap -addListToFM :: Ord key => FiniteMap key elt -> [(key, elt)] -> FiniteMap key elt -addListToFM_C :: Ord key => (elt -> elt -> elt) -> FiniteMap key elt -> [(key, elt)] -> FiniteMap key elt -addToFM :: Ord key => FiniteMap key elt -> key -> elt -> FiniteMap key elt -addToFM_C :: Ord key => (elt -> elt -> elt) -> FiniteMap key elt -> key -> elt -> FiniteMap key elt -data FiniteMap key elt -delFromFM :: Ord key => FiniteMap key elt -> key -> FiniteMap key elt -delListFromFM :: Ord key => FiniteMap key elt -> [key] -> FiniteMap key elt -elemFM :: Ord key => key -> FiniteMap key elt -> Bool -eltsFM :: FiniteMap key elt -> [elt] -eltsFM_GE :: Ord key => FiniteMap key elt -> key -> [elt] -eltsFM_LE :: Ord key => FiniteMap key elt -> key -> [elt] -emptyFM :: FiniteMap key elt -filterFM :: Ord key => (key -> elt -> Bool) -> FiniteMap key elt -> FiniteMap key elt -fmToList :: FiniteMap key elt -> [(key, elt)] -fmToList_GE :: Ord key => FiniteMap key elt -> key -> [(key, elt)] -fmToList_LE :: Ord key => FiniteMap key elt -> key -> [(key, elt)] -foldFM :: (key -> elt -> a -> a) -> a -> FiniteMap key elt -> a -foldFM_GE :: Ord key => (key -> elt -> a -> a) -> a -> key -> FiniteMap key elt -> a -foldFM_LE :: Ord key => (key -> elt -> a -> a) -> a -> key -> FiniteMap key elt -> a -instance (Data a, Data b, Ord a) => Data (FiniteMap a b) -instance (Eq key, Eq elt) => Eq (FiniteMap key elt) -instance (Show k, Show e) => Show (FiniteMap k e) -instance Functor (FiniteMap k) -instance Typeable2 FiniteMap -intersectFM :: Ord key => FiniteMap key elt -> FiniteMap key elt -> FiniteMap key elt -intersectFM_C :: Ord key => (elt1 -> elt2 -> elt3) -> FiniteMap key elt1 -> FiniteMap key elt2 -> FiniteMap key elt3 -isEmptyFM :: FiniteMap key elt -> Bool -keysFM :: FiniteMap key elt -> [key] -keysFM_GE :: Ord key => FiniteMap key elt -> key -> [key] -keysFM_LE :: Ord key => FiniteMap key elt -> key -> [key] -listToFM :: Ord key => [(key, elt)] -> FiniteMap key elt -lookupFM :: Ord key => FiniteMap key elt -> key -> Maybe elt -lookupWithDefaultFM :: Ord key => FiniteMap key elt -> elt -> key -> elt -mapFM :: (key -> elt1 -> elt2) -> FiniteMap key elt1 -> FiniteMap key elt2 -maxFM :: Ord key => FiniteMap key elt -> Maybe key -minFM :: Ord key => FiniteMap key elt -> Maybe key -minusFM :: Ord key => FiniteMap key elt1 -> FiniteMap key elt2 -> FiniteMap key elt1 -plusFM :: Ord key => FiniteMap key elt -> FiniteMap key elt -> FiniteMap key elt -plusFM_C :: Ord key => (elt -> elt -> elt) -> FiniteMap key elt -> FiniteMap key elt -> FiniteMap key elt -sizeFM :: FiniteMap key elt -> Int -unitFM :: key -> elt -> FiniteMap key elt - -module Data.FunctorM -class FunctorM f -fmapM :: (FunctorM f, Monad m) => (a -> m b) -> f a -> m (f b) -fmapM_ :: (FunctorM f, Monad m) => (a -> m b) -> f a -> m () - -module Data.Generics.Aliases -GM :: Data a => a -> m a -> GenericM' m -GQ :: GenericQ r -> GenericQ' r -GT :: Data a => a -> a -> GenericT' -Generic' :: Generic c -> Generic' c -choiceMp :: MonadPlus m => GenericM m -> GenericM m -> GenericM m -choiceQ :: MonadPlus m => GenericQ (m r) -> GenericQ (m r) -> GenericQ (m r) -data Generic' c -ext0 :: (Typeable a, Typeable b) => c a -> c b -> c a -ext1M :: (Monad m, Data d, Typeable1 t) => (d -> m d) -> (t d -> m (t d)) -> d -> m d -ext1Q :: (Data d, Typeable1 t) => (d -> q) -> (t d -> q) -> d -> q -ext1R :: (Monad m, Data d, Typeable1 t) => m d -> (m (t d)) -> m d -ext1T :: (Data d, Typeable1 t) => (d -> d) -> (t d -> t d) -> d -> d -extB :: (Typeable a, Typeable b) => a -> b -> a -extM :: (Monad m, Typeable a, Typeable b) => (a -> m a) -> (b -> m b) -> a -> m a -extMp :: (MonadPlus m, Typeable a, Typeable b) => (a -> m a) -> (b -> m b) -> a -> m a -extQ :: (Typeable a, Typeable b) => (a -> q) -> (b -> q) -> a -> q -extR :: (Monad m, Typeable a, Typeable b) => m a -> m b -> m a -extT :: (Typeable a, Typeable b) => (a -> a) -> (b -> b) -> a -> a -mkM :: (Monad m, Typeable a, Typeable b) => (b -> m b) -> a -> m a -mkMp :: (MonadPlus m, Typeable a, Typeable b) => (b -> m b) -> a -> m a -mkQ :: (Typeable a, Typeable b) => r -> (b -> r) -> a -> r -mkR :: (MonadPlus m, Typeable a, Typeable b) => m b -> m a -mkT :: (Typeable a, Typeable b) => (b -> b) -> a -> a -newtype GenericM' m -newtype GenericQ' r -newtype GenericT' -orElse :: Maybe a -> Maybe a -> Maybe a -recoverMp :: MonadPlus m => GenericM m -> GenericM m -recoverQ :: MonadPlus m => r -> GenericQ (m r) -> GenericQ (m r) -type Generic c = a -> c a -type GenericB = a -type GenericM m = a -> m a -type GenericQ r = a -> r -type GenericR m = m a -type GenericT = a -> a -unGM :: Data a => GenericM' m -> a -> m a -unGQ :: GenericQ' r -> GenericQ r -unGT :: Data a => GenericT' -> a -> a -unGeneric' :: Generic' c -> Generic c - -module Data.Generics.Basics -AlgConstr :: ConIndex -> ConstrRep -AlgRep :: [Constr] -> DataRep -FloatConstr :: Double -> ConstrRep -FloatRep :: DataRep -Infix :: Fixity -IntConstr :: Integer -> ConstrRep -IntRep :: DataRep -NoRep :: DataRep -Prefix :: Fixity -StringConstr :: String -> ConstrRep -StringRep :: DataRep -class Typeable a => Data a -constrFields :: Constr -> [String] -constrFixity :: Constr -> Fixity -constrIndex :: Constr -> ConIndex -constrRep :: Constr -> ConstrRep -constrType :: Constr -> DataType -data Constr -data ConstrRep -data DataRep -data DataType -data Fixity -dataCast1 :: (Data a, Typeable1 t) => (c (t a)) -> Maybe (c a) -dataCast2 :: (Data a, Typeable2 t) => (c (t a b)) -> Maybe (c a) -dataTypeConstrs :: DataType -> [Constr] -dataTypeName :: DataType -> String -dataTypeOf :: Data a => a -> DataType -dataTypeRep :: DataType -> DataRep -fromConstr :: Data a => Constr -> a -fromConstrB :: Data a => (a) -> Constr -> a -fromConstrM :: (Monad m, Data a) => (m a) -> Constr -> m a -gfoldl :: Data a => (c (a -> b) -> a -> c b) -> (g -> c g) -> a -> c a -gmapM :: (Data a, Monad m) => (a -> m a) -> a -> m a -gmapMo :: (Data a, MonadPlus m) => (a -> m a) -> a -> m a -gmapMp :: (Data a, MonadPlus m) => (a -> m a) -> a -> m a -gmapQ :: Data a => (a -> u) -> a -> [u] -gmapQi :: Data a => Int -> (a -> u) -> a -> u -gmapQl :: Data a => (r -> r' -> r) -> r -> (a -> r') -> a -> r -gmapQr :: Data a => (r' -> r -> r) -> r -> (a -> r') -> a -> r -gmapT :: Data a => (b -> b) -> a -> a -gunfold :: Data a => (c (b -> r) -> c r) -> (r -> c r) -> Constr -> c a -indexConstr :: DataType -> ConIndex -> Constr -instance Data DataType -instance Eq Constr -instance Eq ConstrRep -instance Eq DataRep -instance Eq Fixity -instance Show Constr -instance Show ConstrRep -instance Show DataRep -instance Show DataType -instance Show Fixity -instance Typeable DataType -isAlgType :: DataType -> Bool -isNorepType :: DataType -> Bool -maxConstrIndex :: DataType -> ConIndex -mkConstr :: DataType -> String -> [String] -> Fixity -> Constr -mkDataType :: String -> [Constr] -> DataType -mkFloatConstr :: DataType -> Double -> Constr -mkFloatType :: String -> DataType -mkIntConstr :: DataType -> Integer -> Constr -mkIntType :: String -> DataType -mkNorepType :: String -> DataType -mkStringConstr :: DataType -> String -> Constr -mkStringType :: String -> DataType -readConstr :: DataType -> String -> Maybe Constr -repConstr :: DataType -> ConstrRep -> Constr -showConstr :: Constr -> String -toConstr :: Data a => a -> Constr -tyconModule :: String -> String -tyconUQname :: String -> String -type ConIndex = Int - -module Data.Generics.Schemes -everything :: (r -> r -> r) -> GenericQ r -> GenericQ r -everywhere :: (a -> a) -> a -> a -everywhere' :: (a -> a) -> a -> a -everywhereBut :: GenericQ Bool -> GenericT -> GenericT -everywhereM :: Monad m => GenericM m -> GenericM m -gcount :: GenericQ Bool -> GenericQ Int -gdepth :: GenericQ Int -gfindtype :: (Data x, Typeable y) => x -> Maybe y -glength :: GenericQ Int -gnodecount :: GenericQ Int -gsize :: Data a => a -> Int -gtypecount :: Typeable a => a -> GenericQ Int -listify :: Typeable r => (r -> Bool) -> GenericQ [r] -something :: GenericQ (Maybe u) -> GenericQ (Maybe u) -somewhere :: MonadPlus m => GenericM m -> GenericM m -synthesize :: s -> (s -> s -> s) -> GenericQ (s -> s) -> GenericQ s - -module Data.Generics.Text -gread :: Data a => ReadS a -gshow :: Data a => a -> String - -module Data.Generics.Twins -geq :: Data a => a -> a -> Bool -gfoldlAccum :: Data d => (a -> c (d -> r) -> d -> (a, c r)) -> (a -> g -> (a, c g)) -> a -> d -> (a, c d) -gmapAccumM :: (Data d, Monad m) => (a -> d -> (a, m d)) -> a -> d -> (a, m d) -gmapAccumQ :: Data d => (a -> d -> (a, q)) -> a -> d -> (a, [q]) -gmapAccumQl :: Data d => (r -> r' -> r) -> r -> (a -> d -> (a, r')) -> a -> d -> (a, r) -gmapAccumQr :: Data d => (r' -> r -> r) -> r -> (a -> d -> (a, r')) -> a -> d -> (a, r) -gmapAccumT :: Data d => (a -> d -> (a, d)) -> a -> d -> (a, d) -gzip :: (a -> b -> Maybe b) -> a -> b -> Maybe b -gzipWithM :: Monad m => GenericQ (GenericM m) -> GenericQ (GenericM m) -gzipWithQ :: GenericQ (GenericQ r) -> GenericQ (GenericQ [r]) -gzipWithT :: GenericQ GenericT -> GenericQ GenericT - -module Data.Graph -AcyclicSCC :: vertex -> SCC vertex -CyclicSCC :: [vertex] -> SCC vertex -bcc :: Graph -> Forest [Vertex] -buildG :: Bounds -> [Edge] -> Graph -components :: Graph -> Forest Vertex -data SCC vertex -dff :: Graph -> Forest Vertex -dfs :: Graph -> [Vertex] -> Forest Vertex -edges :: Graph -> [Edge] -flattenSCC :: SCC vertex -> [vertex] -flattenSCCs :: [SCC a] -> [a] -graphFromEdges :: Ord key => [(node, key, [key])] -> (Graph, Vertex -> (node, key, [key]), key -> Maybe Vertex) -graphFromEdges' :: Ord key => [(node, key, [key])] -> (Graph, Vertex -> (node, key, [key])) -indegree :: Graph -> Table Int -outdegree :: Graph -> Table Int -path :: Graph -> Vertex -> Vertex -> Bool -reachable :: Graph -> Vertex -> [Vertex] -scc :: Graph -> Forest Vertex -stronglyConnComp :: Ord key => [(node, key, [key])] -> [SCC node] -stronglyConnCompR :: Ord key => [(node, key, [key])] -> [SCC (node, key, [key])] -topSort :: Graph -> [Vertex] -transposeG :: Graph -> Graph -type Bounds = (Vertex, Vertex) -type Edge = (Vertex, Vertex) -type Graph = Table [Vertex] -type Table a = Array Vertex a -type Vertex = Int -vertices :: Graph -> [Vertex] - -module Data.Graph.Inductive -version :: IO () - -module Data.Graph.Inductive.Basic -efilter :: DynGraph gr => (LEdge b -> Bool) -> gr a b -> gr a b -elfilter :: DynGraph gr => (b -> Bool) -> gr a b -> gr a b -gfold :: Graph gr => (Context a b -> [Node]) -> (Context a b -> c -> d) -> (Maybe d -> c -> c, c) -> [Node] -> gr a b -> c -grev :: DynGraph gr => gr a b -> gr a b -gsel :: Graph gr => (Context a b -> Bool) -> gr a b -> [Context a b] -hasLoop :: Graph gr => gr a b -> Bool -isSimple :: Graph gr => gr a b -> Bool -postorder :: Tree a -> [a] -postorderF :: [Tree a] -> [a] -preorder :: Tree a -> [a] -preorderF :: [Tree a] -> [a] -undir :: (Eq b, DynGraph gr) => gr a b -> gr a b -unlab :: DynGraph gr => gr a b -> gr () () - -module Data.Graph.Inductive.Example -a :: Gr Char () -a' :: IO (SGr Char ()) -ab :: Gr Char () -ab' :: IO (SGr Char ()) -abb :: Gr Char () -abb' :: IO (SGr Char ()) -b :: Gr Char () -b' :: IO (SGr Char ()) -c :: Gr Char () -c' :: IO (SGr Char ()) -clr479 :: Gr Char () -clr479' :: IO (SGr Char ()) -clr486 :: Gr String () -clr486' :: IO (SGr String ()) -clr489 :: Gr Char () -clr489' :: IO (SGr Char ()) -clr508 :: Gr Char Int -clr508' :: IO (SGr Char Int) -clr528 :: Gr Char Int -clr528' :: IO (SGr Char Int) -clr595 :: Gr Int Int -cyc3 :: Gr Char String -d1 :: Gr Int Int -d1' :: IO (SGr Int Int) -d3 :: Gr Int Int -d3' :: IO (SGr Int Int) -dag3 :: Gr Char () -dag3' :: IO (SGr Char ()) -dag4 :: Gr Int () -dag4' :: IO (SGr Int ()) -e :: Gr Char () -e' :: IO (SGr Char ()) -e3 :: Gr () String -e3' :: IO (SGr () String) -g3 :: Gr Char String -g3b :: Gr Char String -genLNodes :: Enum a => a -> Int -> [LNode a] -genUNodes :: Int -> [UNode] -gr1 :: Gr Int Int -kin248 :: Gr Int () -kin248' :: IO (SGr Int ()) -labUEdges :: [Edge] -> [UEdge] -loop :: Gr Char () -loop' :: IO (SGr Char ()) -noEdges :: [UEdge] -star :: Graph gr => Int -> gr () () -starM :: GraphM m gr => Int -> m (gr () ()) -ucycle :: Graph gr => Int -> gr () () -ucycleM :: GraphM m gr => Int -> m (gr () ()) -vor :: Gr String Int -vor' :: IO (SGr String Int) - -module Data.Graph.Inductive.Graph -(&) :: DynGraph gr => Context a b -> gr a b -> gr a b -LP :: [LNode a] -> LPath a -buildGr :: DynGraph gr => [Context a b] -> gr a b -class Graph gr -class Graph gr => DynGraph gr -context :: Graph gr => gr a b -> Node -> Context a b -deg :: Graph gr => gr a b -> Node -> Int -deg' :: Context a b -> Int -delEdge :: DynGraph gr => Edge -> gr a b -> gr a b -delEdges :: DynGraph gr => [Edge] -> gr a b -> gr a b -delNode :: Graph gr => Node -> gr a b -> gr a b -delNodes :: Graph gr => [Node] -> gr a b -> gr a b -edges :: Graph gr => gr a b -> [Edge] -emap :: DynGraph gr => (b -> c) -> gr a b -> gr a c -empty :: Graph gr => gr a b -equal :: (Eq a, Eq b, Graph gr) => gr a b -> gr a b -> Bool -gelem :: Graph gr => Node -> gr a b -> Bool -gmap :: DynGraph gr => (Context a b -> Context c d) -> gr a b -> gr c d -indeg :: Graph gr => gr a b -> Node -> Int -indeg' :: Context a b -> Int -inn :: Graph gr => gr a b -> Node -> [LEdge b] -inn' :: Context a b -> [LEdge b] -insEdge :: DynGraph gr => LEdge b -> gr a b -> gr a b -insEdges :: DynGraph gr => [LEdge b] -> gr a b -> gr a b -insNode :: DynGraph gr => LNode a -> gr a b -> gr a b -insNodes :: DynGraph gr => [LNode a] -> gr a b -> gr a b -instance Eq a => Eq (LPath a) -instance Ord a => Ord (LPath a) -instance Show a => Show (LPath a) -isEmpty :: Graph gr => gr a b -> Bool -lab :: Graph gr => gr a b -> Node -> Maybe a -lab' :: Context a b -> a -labEdges :: Graph gr => gr a b -> [LEdge b] -labNode' :: Context a b -> LNode a -labNodes :: Graph gr => gr a b -> [LNode a] -lpre :: Graph gr => gr a b -> Node -> [(Node, b)] -lpre' :: Context a b -> [(Node, b)] -lsuc :: Graph gr => gr a b -> Node -> [(Node, b)] -lsuc' :: Context a b -> [(Node, b)] -match :: Graph gr => Node -> gr a b -> Decomp gr a b -matchAny :: Graph gr => gr a b -> GDecomp gr a b -mkGraph :: Graph gr => [LNode a] -> [LEdge b] -> gr a b -mkUGraph :: Graph gr => [Node] -> [Edge] -> gr () () -neighbors :: Graph gr => gr a b -> Node -> [Node] -neighbors' :: Context a b -> [Node] -newNodes :: Graph gr => Int -> gr a b -> [Node] -newtype LPath a -nmap :: DynGraph gr => (a -> c) -> gr a b -> gr c b -noNodes :: Graph gr => gr a b -> Int -node' :: Context a b -> Node -nodeRange :: Graph gr => gr a b -> (Node,Node) -nodes :: Graph gr => gr a b -> [Node] -out :: Graph gr => gr a b -> Node -> [LEdge b] -out' :: Context a b -> [LEdge b] -outdeg :: Graph gr => gr a b -> Node -> Int -outdeg' :: Context a b -> Int -pre :: Graph gr => gr a b -> Node -> [Node] -pre' :: Context a b -> [Node] -suc :: Graph gr => gr a b -> Node -> [Node] -suc' :: Context a b -> [Node] -type Adj b = [(b, Node)] -type Context a b = (Adj b, Node, a, Adj b) -type Decomp g a b = (MContext a b, g a b) -type Edge = (Node, Node) -type GDecomp g a b = (Context a b, g a b) -type LEdge b = (Node, Node, b) -type LNode a = (Node, a) -type MContext a b = Maybe (Context a b) -type Node = Int -type UContext = ([Node], Node, [Node]) -type UDecomp g = (Maybe UContext, g) -type UEdge = LEdge () -type UNode = LNode () -type UPath = [UNode] -ufold :: Graph gr => (Context a b -> c -> c) -> c -> gr a b -> c - -module Data.Graph.Inductive.Graphviz -Landscape :: Orient -Portrait :: Orient -data Orient -graphviz :: (Graph g, Show a, Show b) => g a b -> String -> (Double, Double) -> (Int, Int) -> Orient -> String -graphviz' :: (Graph g, Show a, Show b) => g a b -> String -instance Eq Orient -instance Show Orient - -module Data.Graph.Inductive.Internal.FiniteMap -Empty :: FiniteMap a b -Node :: Int -> (FiniteMap a b) -> (a,b) -> (FiniteMap a b) -> FiniteMap a b -accumFM :: Ord a => FiniteMap a b -> a -> (b -> b -> b) -> b -> FiniteMap a b -addToFM :: Ord a => FiniteMap a b -> a -> b -> FiniteMap a b -data FiniteMap a b -delFromFM :: Ord a => FiniteMap a b -> a -> FiniteMap a b -elemFM :: Ord a => FiniteMap a b -> a -> Bool -emptyFM :: Ord a => FiniteMap a b -fmToList :: Ord a => FiniteMap a b -> [(a, b)] -instance (Ord a, ??? a b) => Eq (FiniteMap a b) -instance (Show a, Show b, Ord a) => Show (FiniteMap a b) -isEmptyFM :: FiniteMap a b -> Bool -lookupFM :: Ord a => FiniteMap a b -> a -> Maybe b -maxFM :: Ord a => FiniteMap a b -> Maybe (a, b) -minFM :: Ord a => FiniteMap a b -> Maybe (a, b) -predFM :: Ord a => FiniteMap a b -> a -> Maybe (a, b) -rangeFM :: Ord a => FiniteMap a b -> a -> a -> [b] -sizeFM :: Ord a => FiniteMap a b -> Int -splitFM :: Ord a => FiniteMap a b -> a -> Maybe (FiniteMap a b, (a, b)) -splitMinFM :: Ord a => FiniteMap a b -> Maybe (FiniteMap a b, (a, b)) -succFM :: Ord a => FiniteMap a b -> a -> Maybe (a, b) -updFM :: Ord a => FiniteMap a b -> a -> (b -> b) -> FiniteMap a b - -module Data.Graph.Inductive.Internal.Heap -Empty :: Heap a b -Node :: a -> b -> [Heap a b] -> Heap a b -build :: Ord a => [(a, b)] -> Heap a b -data Heap a b -deleteMin :: Ord a => Heap a b -> Heap a b -empty :: Ord a => Heap a b -findMin :: Ord a => Heap a b -> (a, b) -heapsort :: Ord a => [a] -> [a] -insert :: Ord a => (a, b) -> Heap a b -> Heap a b -instance (Ord a, Eq a, Eq b, ??? a b) => Eq (Heap a b) -instance (Show a, Ord a, Show b) => Show (Heap a b) -isEmpty :: Ord a => Heap a b -> Bool -merge :: Ord a => Heap a b -> Heap a b -> Heap a b -mergeAll :: Ord a => [Heap a b] -> Heap a b -splitMin :: Ord a => Heap a b -> (a, b, Heap a b) -toList :: Ord a => Heap a b -> [(a, b)] -unit :: Ord a => a -> b -> Heap a b - -module Data.Graph.Inductive.Internal.Queue -MkQueue :: [a] -> [a] -> Queue a -mkQueue :: Queue a -queueEmpty :: Queue a -> Bool -queueGet :: Queue a -> (a, Queue a) -queuePut :: a -> Queue a -> Queue a -queuePutList :: [a] -> Queue a -> Queue a - -module Data.Graph.Inductive.Internal.RootPath -getDistance :: Node -> LRTree a -> a -getLPath :: Node -> LRTree a -> LPath a -getLPathNodes :: Node -> LRTree a -> Path -getPath :: Node -> RTree -> Path -type LRTree a = [LPath a] -type RTree = [Path] - -module Data.Graph.Inductive.Internal.Thread -splitPar :: Split t i r -> Split u j s -> Split (t, u) (i, j) (r, s) -splitParM :: SplitM t i r -> Split u j s -> SplitM (t, u) (i, j) (r, s) -threadList :: Collect r c -> Split t i r -> [i] -> t -> (c, t) -threadList' :: Collect r c -> Split t i r -> [i] -> t -> (c, t) -threadMaybe :: (i -> r -> a) -> Split t i r -> SplitM t j i -> SplitM t j a -threadMaybe' :: (r -> a) -> Split t i r -> Split t j (Maybe i) -> Split t j (Maybe a) -type Collect r c = (r -> c -> c, c) -type Split t i r = i -> t -> (r, t) -type SplitM t i r = Split t i (Maybe r) -type Thread t i r = (t, Split t i r) - -module Data.Graph.Inductive.Monad -class Monad m => GraphM m gr -contextM :: GraphM m gr => m (gr a b) -> Node -> m (Context a b) -delNodeM :: GraphM m gr => Node -> m (gr a b) -> m (gr a b) -delNodesM :: GraphM m gr => [Node] -> m (gr a b) -> m (gr a b) -edgesM :: GraphM m gr => m (gr a b) -> m [Edge] -emptyM :: GraphM m gr => m (gr a b) -isEmptyM :: GraphM m gr => m (gr a b) -> m Bool -labEdgesM :: GraphM m gr => m (gr a b) -> m [LEdge b] -labM :: GraphM m gr => m (gr a b) -> Node -> m (Maybe a) -labNodesM :: GraphM m gr => m (gr a b) -> m [LNode a] -matchAnyM :: GraphM m gr => m (gr a b) -> m (GDecomp gr a b) -matchM :: GraphM m gr => Node -> m (gr a b) -> m (Decomp gr a b) -mkGraphM :: GraphM m gr => [LNode a] -> [LEdge b] -> m (gr a b) -mkUGraphM :: GraphM m gr => [Node] -> [Edge] -> m (gr () ()) -newNodesM :: GraphM m gr => Int -> m (gr a b) -> m [Node] -noNodesM :: GraphM m gr => m (gr a b) -> m Int -nodeRangeM :: GraphM m gr => m (gr a b) -> m (Node,Node) -nodesM :: GraphM m gr => m (gr a b) -> m [Node] -ufoldM :: GraphM m gr => (Context a b -> c -> c) -> c -> m (gr a b) -> m c - -module Data.Graph.Inductive.Monad.IOArray -SGr :: (GraphRep a b) -> SGr a b -data SGr a b -defaultGraphSize :: Int -emptyN :: Int -> IO (SGr a b) -instance (Show a, Show b) => Show (IO (SGr a b)) -instance (Show a, Show b) => Show (SGr a b) -instance GraphM IO SGr -removeDel :: IOArray Node Bool -> Adj b -> IO (Adj b) -type Context' a b = Maybe (Adj b, a, Adj b) -type GraphRep a b = (Int, Array Node (Context' a b), IOArray Node Bool) -type USGr = SGr () () - -module Data.Graph.Inductive.NodeMap -data NodeMap a -delMapEdge :: (Ord a, DynGraph g) => NodeMap a -> (a, a) -> g a b -> g a b -delMapEdgeM :: (Ord a, DynGraph g) => (a, a) -> NodeMapM a b g () -delMapEdges :: (Ord a, DynGraph g) => NodeMap a -> [(a, a)] -> g a b -> g a b -delMapEdgesM :: (Ord a, DynGraph g) => [(a, a)] -> NodeMapM a b g () -delMapNode :: (Ord a, DynGraph g) => NodeMap a -> a -> g a b -> g a b -delMapNodeM :: (Ord a, DynGraph g) => a -> NodeMapM a b g () -delMapNodes :: (Ord a, DynGraph g) => NodeMap a -> [a] -> g a b -> g a b -delMapNodesM :: (Ord a, DynGraph g) => [a] -> NodeMapM a b g () -fromGraph :: (Ord a, Graph g) => g a b -> NodeMap a -insMapEdge :: (Ord a, DynGraph g) => NodeMap a -> (a, a, b) -> g a b -> g a b -insMapEdgeM :: (Ord a, DynGraph g) => (a, a, b) -> NodeMapM a b g () -insMapEdges :: (Ord a, DynGraph g) => NodeMap a -> [(a, a, b)] -> g a b -> g a b -insMapEdgesM :: (Ord a, DynGraph g) => [(a, a, b)] -> NodeMapM a b g () -insMapNode :: (Ord a, DynGraph g) => NodeMap a -> a -> g a b -> (g a b, NodeMap a, LNode a) -insMapNodeM :: (Ord a, DynGraph g) => a -> NodeMapM a b g (LNode a) -insMapNode_ :: (Ord a, DynGraph g) => NodeMap a -> a -> g a b -> g a b -insMapNodes :: (Ord a, DynGraph g) => NodeMap a -> [a] -> g a b -> (g a b, NodeMap a, [LNode a]) -insMapNodesM :: (Ord a, DynGraph g) => [a] -> NodeMapM a b g [LNode a] -insMapNodes_ :: (Ord a, DynGraph g) => NodeMap a -> [a] -> g a b -> g a b -instance (Ord a, ??? a) => Show (NodeMap a) -mkEdge :: Ord a => NodeMap a -> (a, a, b) -> Maybe (LEdge b) -mkEdgeM :: (Ord a, DynGraph g) => (a, a, b) -> NodeMapM a b g (Maybe (LEdge b)) -mkEdges :: Ord a => NodeMap a -> [(a, a, b)] -> Maybe [LEdge b] -mkEdgesM :: (Ord a, DynGraph g) => [(a, a, b)] -> NodeMapM a b g (Maybe [LEdge b]) -mkMapGraph :: (Ord a, DynGraph g) => [a] -> [(a, a, b)] -> (g a b, NodeMap a) -mkNode :: Ord a => NodeMap a -> a -> (LNode a, NodeMap a) -mkNodeM :: (Ord a, DynGraph g) => a -> NodeMapM a b g (LNode a) -mkNode_ :: Ord a => NodeMap a -> a -> LNode a -mkNodes :: Ord a => NodeMap a -> [a] -> ([LNode a], NodeMap a) -mkNodesM :: (Ord a, DynGraph g) => [a] -> NodeMapM a b g [LNode a] -mkNodes_ :: Ord a => NodeMap a -> [a] -> [LNode a] -new :: Ord a => NodeMap a -run :: (DynGraph g, Ord a) => g a b -> NodeMapM a b g r -> (r, (NodeMap a, g a b)) -run_ :: (DynGraph g, Ord a) => g a b -> NodeMapM a b g r -> g a b -type NodeMapM a b g r = State (NodeMap a, g a b) r - -module Data.Graph.Inductive.Query.ArtPoint -ap :: Graph gr => gr a b -> [Node] - -module Data.Graph.Inductive.Query.BCC -bcc :: DynGraph gr => gr a b -> [gr a b] - -module Data.Graph.Inductive.Query.BFS -bfe :: Graph gr => Node -> gr a b -> [Edge] -bfen :: Graph gr => [Edge] -> gr a b -> [Edge] -bfs :: Graph gr => Node -> gr a b -> [Node] -bfsWith :: Graph gr => (Context a b -> c) -> Node -> gr a b -> [c] -bfsn :: Graph gr => [Node] -> gr a b -> [Node] -bfsnWith :: Graph gr => (Context a b -> c) -> [Node] -> gr a b -> [c] -bft :: Graph gr => Node -> gr a b -> RTree -esp :: Graph gr => Node -> Node -> gr a b -> Path -lbft :: Graph gr => Node -> gr a b -> LRTree b -lesp :: Graph gr => Node -> Node -> gr a b -> LPath b -level :: Graph gr => Node -> gr a b -> [(Node, Int)] -leveln :: Graph gr => [(Node, Int)] -> gr a b -> [(Node, Int)] - -module Data.Graph.Inductive.Query.DFS -components :: Graph gr => gr a b -> [[Node]] -dff :: Graph gr => [Node] -> gr a b -> [Tree Node] -dff' :: Graph gr => gr a b -> [Tree Node] -dffWith :: Graph gr => CFun a b c -> [Node] -> gr a b -> [Tree c] -dffWith' :: Graph gr => CFun a b c -> gr a b -> [Tree c] -dfs :: Graph gr => [Node] -> gr a b -> [Node] -dfs' :: Graph gr => gr a b -> [Node] -dfsWith :: Graph gr => CFun a b c -> [Node] -> gr a b -> [c] -dfsWith' :: Graph gr => CFun a b c -> gr a b -> [c] -isConnected :: Graph gr => gr a b -> Bool -noComponents :: Graph gr => gr a b -> Int -rdff :: Graph gr => [Node] -> gr a b -> [Tree Node] -rdff' :: Graph gr => gr a b -> [Tree Node] -rdfs :: Graph gr => [Node] -> gr a b -> [Node] -rdfs' :: Graph gr => gr a b -> [Node] -reachable :: Graph gr => Node -> gr a b -> [Node] -scc :: Graph gr => gr a b -> [[Node]] -topsort :: Graph gr => gr a b -> [Node] -topsort' :: Graph gr => gr a b -> [a] -type CFun a b c = Context a b -> c -udff :: Graph gr => [Node] -> gr a b -> [Tree Node] -udff' :: Graph gr => gr a b -> [Tree Node] -udfs :: Graph gr => [Node] -> gr a b -> [Node] -udfs' :: Graph gr => gr a b -> [Node] - -module Data.Graph.Inductive.Query.Dominators -dom :: Graph gr => gr a b -> Node -> [(Node, [Node])] - -module Data.Graph.Inductive.Query.GVD -gvdIn :: (DynGraph gr, Real b) => [Node] -> gr a b -> Voronoi b -gvdOut :: (Graph gr, Real b) => [Node] -> gr a b -> Voronoi b -nearestDist :: Real b => Node -> Voronoi b -> Maybe b -nearestNode :: Real b => Node -> Voronoi b -> Maybe Node -nearestPath :: Real b => Node -> Voronoi b -> Maybe Path -type Voronoi a = LRTree a -voronoiSet :: Real b => Node -> Voronoi b -> [Node] - -module Data.Graph.Inductive.Query.Indep -indep :: DynGraph gr => gr a b -> [Node] - -module Data.Graph.Inductive.Query.MST -msPath :: Real b => LRTree b -> Node -> Node -> Path -msTree :: (Graph gr, Real b) => gr a b -> LRTree b -msTreeAt :: (Graph gr, Real b) => Node -> gr a b -> LRTree b - -module Data.Graph.Inductive.Query.MaxFlow -augmentGraph :: (DynGraph gr, Num b, Ord b) => gr a b -> gr a (b, b, b) -getRevEdges :: (Num b, Ord b) => [(Node, Node)] -> [(Node, Node, b)] -maxFlow :: (DynGraph gr, Num b, Ord b) => gr a b -> Node -> Node -> b -maxFlowgraph :: (DynGraph gr, Num b, Ord b) => gr a b -> Node -> Node -> gr a (b, b) -mf :: (DynGraph gr, Num b, Ord b) => gr a b -> Node -> Node -> gr a (b, b, b) -mfmg :: (DynGraph gr, Num b, Ord b) => gr a (b, b, b) -> Node -> Node -> gr a (b, b, b) -updAdjList :: (Num b, Ord b) => [((b, b, b), Node)] -> Node -> b -> Bool -> [((b, b, b), Node)] -updateFlow :: (DynGraph gr, Num b, Ord b) => Path -> b -> gr a (b, b, b) -> gr a (b, b, b) - -module Data.Graph.Inductive.Query.MaxFlow2 -ekFused :: Network -> Node -> Node -> (Network, Double) -ekList :: Network -> Node -> Node -> (Network, Double) -ekSimple :: Network -> Node -> Node -> (Network, Double) -type Network = Gr () (Double, Double) - -module Data.Graph.Inductive.Query.Monad -(><) :: (a -> b) -> (c -> d) -> (a, c) -> (b, d) -MGT :: (m g -> m (a,g)) -> GT m g a -apply :: GT m g a -> m g -> m (a, g) -apply' :: Monad m => GT m g a -> g -> m (a, g) -applyWith :: Monad m => (a -> b) -> GT m g a -> m g -> m (b, g) -applyWith' :: Monad m => (a -> b) -> GT m g a -> g -> m (b, g) -condMGT :: Monad m => (m s -> m Bool) -> GT m s a -> GT m s a -> GT m s a -condMGT' :: Monad m => (s -> Bool) -> GT m s a -> GT m s a -> GT m s a -data GT m g a -dffM :: GraphM m gr => [Node] -> GT m (gr a b) [Tree Node] -dfsGT :: GraphM m gr => [Node] -> GT m (gr a b) [Node] -dfsM :: GraphM m gr => [Node] -> m (gr a b) -> m [Node] -dfsM' :: GraphM m gr => m (gr a b) -> m [Node] -getContext :: GraphM m gr => GT m (gr a b) (Context a b) -getNode :: GraphM m gr => GT m (gr a b) Node -getNodes :: GraphM m gr => GT m (gr a b) [Node] -getNodes' :: (Graph gr, GraphM m gr) => GT m (gr a b) [Node] -graphDff :: GraphM m gr => [Node] -> m (gr a b) -> m [Tree Node] -graphDff' :: GraphM m gr => m (gr a b) -> m [Tree Node] -graphFilter :: GraphM m gr => (Context a b -> Bool) -> m (gr a b) -> m [Context a b] -graphFilterM :: GraphM m gr => (Context a b -> Bool) -> GT m (gr a b) [Context a b] -graphNodes :: GraphM m gr => m (gr a b) -> m [Node] -graphNodesM :: GraphM m gr => GT m (gr a b) [Node] -graphNodesM0 :: GraphM m gr => GT m (gr a b) [Node] -graphRec :: GraphM m gr => GT m (gr a b) c -> (c -> d -> d) -> d -> GT m (gr a b) d -graphRec' :: (Graph gr, GraphM m gr) => GT m (gr a b) c -> (c -> d -> d) -> d -> GT m (gr a b) d -graphUFold :: GraphM m gr => (Context a b -> c -> c) -> c -> GT m (gr a b) c -instance Monad m => Monad (GT m g) -mapFst :: (a -> b) -> (a, c) -> (b, c) -mapSnd :: (a -> b) -> (c, a) -> (c, b) -orP :: (a -> Bool) -> (b -> Bool) -> (a, b) -> Bool -recMGT :: Monad m => (m s -> m Bool) -> GT m s a -> (a -> b -> b) -> b -> GT m s b -recMGT' :: Monad m => (s -> Bool) -> GT m s a -> (a -> b -> b) -> b -> GT m s b -runGT :: Monad m => GT m g a -> m g -> m a -sucGT :: GraphM m gr => Node -> GT m (gr a b) (Maybe [Node]) -sucM :: GraphM m gr => Node -> m (gr a b) -> m (Maybe [Node]) - -module Data.Graph.Inductive.Query.SP -dijkstra :: (Graph gr, Real b) => Heap b (LPath b) -> gr a b -> LRTree b -sp :: (Graph gr, Real b) => Node -> Node -> gr a b -> Path -spLength :: (Graph gr, Real b) => Node -> Node -> gr a b -> b -spTree :: (Graph gr, Real b) => Node -> gr a b -> LRTree b - -module Data.Graph.Inductive.Query.TransClos -trc :: DynGraph gr => gr a b -> gr a () - -module Data.Graph.Inductive.Tree -data Gr a b -instance (Show a, Show b) => Show (Gr a b) -instance DynGraph Gr -instance Graph Gr -type UGr = Gr () () - -module Data.HashTable -data HashTable key val -delete :: HashTable key val -> key -> IO () -fromList :: Eq key => (key -> Int32) -> [(key, val)] -> IO (HashTable key val) -hashInt :: Int -> Int32 -hashString :: String -> Int32 -insert :: HashTable key val -> key -> val -> IO () -longestChain :: HashTable key val -> IO [(key, val)] -lookup :: HashTable key val -> key -> IO (Maybe val) -new :: (key -> key -> Bool) -> (key -> Int32) -> IO (HashTable key val) -prime :: Int32 -toList :: HashTable key val -> IO [(key, val)] -update :: HashTable key val -> key -> val -> IO Bool - -module Data.IORef -atomicModifyIORef :: IORef a -> (a -> (a, b)) -> IO b -data IORef a -instance Eq (IORef a) -instance Typeable a => Data (IORef a) -instance Typeable1 IORef -mkWeakIORef :: IORef a -> IO () -> IO (Weak (IORef a)) -modifyIORef :: IORef a -> (a -> a) -> IO () -newIORef :: a -> IO (IORef a) -readIORef :: IORef a -> IO a -writeIORef :: IORef a -> a -> IO () - -module Data.Int -data Int16 -data Int32 -data Int64 -data Int8 -instance (Ix ix, Show ix) => Show (DiffUArray ix Int16) -instance (Ix ix, Show ix) => Show (DiffUArray ix Int32) -instance (Ix ix, Show ix) => Show (DiffUArray ix Int64) -instance (Ix ix, Show ix) => Show (DiffUArray ix Int8) -instance (Ix ix, Show ix) => Show (UArray ix Int16) -instance (Ix ix, Show ix) => Show (UArray ix Int32) -instance (Ix ix, Show ix) => Show (UArray ix Int64) -instance (Ix ix, Show ix) => Show (UArray ix Int8) -instance Bits Int16 -instance Bits Int32 -instance Bits Int64 -instance Bits Int8 -instance Bounded Int16 -instance Bounded Int32 -instance Bounded Int64 -instance Bounded Int8 -instance Data Int16 -instance Data Int32 -instance Data Int64 -instance Data Int8 -instance Enum Int16 -instance Enum Int32 -instance Enum Int64 -instance Enum Int8 -instance Eq Int16 -instance Eq Int32 -instance Eq Int64 -instance Eq Int8 -instance IArray (IOToDiffArray IOUArray) Int16 -instance IArray (IOToDiffArray IOUArray) Int32 -instance IArray (IOToDiffArray IOUArray) Int64 -instance IArray (IOToDiffArray IOUArray) Int8 -instance IArray UArray Int16 -instance IArray UArray Int32 -instance IArray UArray Int64 -instance IArray UArray Int8 -instance Integral Int16 -instance Integral Int32 -instance Integral Int64 -instance Integral Int8 -instance Ix Int16 -instance Ix Int32 -instance Ix Int64 -instance Ix Int8 -instance Ix ix => Eq (UArray ix Int16) -instance Ix ix => Eq (UArray ix Int32) -instance Ix ix => Eq (UArray ix Int64) -instance Ix ix => Eq (UArray ix Int8) -instance Ix ix => Ord (UArray ix Int16) -instance Ix ix => Ord (UArray ix Int32) -instance Ix ix => Ord (UArray ix Int64) -instance Ix ix => Ord (UArray ix Int8) -instance MArray (STUArray s) Int16 (ST s) -instance MArray (STUArray s) Int32 (ST s) -instance MArray (STUArray s) Int64 (ST s) -instance MArray (STUArray s) Int8 (ST s) -instance Num Int16 -instance Num Int32 -instance Num Int64 -instance Num Int8 -instance Ord Int16 -instance Ord Int32 -instance Ord Int64 -instance Ord Int8 -instance Read Int16 -instance Read Int32 -instance Read Int64 -instance Read Int8 -instance Real Int16 -instance Real Int32 -instance Real Int64 -instance Real Int8 -instance Show Int16 -instance Show Int32 -instance Show Int64 -instance Show Int8 -instance Storable Int16 -instance Storable Int32 -instance Storable Int64 -instance Storable Int8 -instance Typeable Int16 -instance Typeable Int32 -instance Typeable Int64 -instance Typeable Int8 - -module Data.IntMap -(!) :: IntMap a -> Key -> a -(\\) :: IntMap a -> IntMap b -> IntMap a -adjust :: (a -> a) -> Key -> IntMap a -> IntMap a -adjustWithKey :: (Key -> a -> a) -> Key -> IntMap a -> IntMap a -assocs :: IntMap a -> [(Key, a)] -data IntMap a -delete :: Key -> IntMap a -> IntMap a -difference :: IntMap a -> IntMap b -> IntMap a -differenceWith :: (a -> b -> Maybe a) -> IntMap a -> IntMap b -> IntMap a -differenceWithKey :: (Key -> a -> b -> Maybe a) -> IntMap a -> IntMap b -> IntMap a -elems :: IntMap a -> [a] -empty :: IntMap a -filter :: (a -> Bool) -> IntMap a -> IntMap a -filterWithKey :: (Key -> a -> Bool) -> IntMap a -> IntMap a -findWithDefault :: a -> Key -> IntMap a -> a -fold :: (a -> b -> b) -> b -> IntMap a -> b -foldWithKey :: (Key -> a -> b -> b) -> b -> IntMap a -> b -fromAscList :: [(Key, a)] -> IntMap a -fromAscListWith :: (a -> a -> a) -> [(Key, a)] -> IntMap a -fromAscListWithKey :: (Key -> a -> a -> a) -> [(Key, a)] -> IntMap a -fromDistinctAscList :: [(Key, a)] -> IntMap a -fromList :: [(Key, a)] -> IntMap a -fromListWith :: (a -> a -> a) -> [(Key, a)] -> IntMap a -fromListWithKey :: (Key -> a -> a -> a) -> [(Key, a)] -> IntMap a -insert :: Key -> a -> IntMap a -> IntMap a -insertLookupWithKey :: (Key -> a -> a -> a) -> Key -> a -> IntMap a -> (Maybe a, IntMap a) -insertWith :: (a -> a -> a) -> Key -> a -> IntMap a -> IntMap a -insertWithKey :: (Key -> a -> a -> a) -> Key -> a -> IntMap a -> IntMap a -instance Data a => Data (IntMap a) -instance Eq a => Eq (IntMap a) -instance Functor IntMap -instance Ord a => Monoid (IntMap a) -instance Ord a => Ord (IntMap a) -instance Show a => Show (IntMap a) -instance Typeable1 IntMap -intersection :: IntMap a -> IntMap b -> IntMap a -intersectionWith :: (a -> b -> a) -> IntMap a -> IntMap b -> IntMap a -intersectionWithKey :: (Key -> a -> b -> a) -> IntMap a -> IntMap b -> IntMap a -isProperSubmapOf :: Eq a => IntMap a -> IntMap a -> Bool -isProperSubmapOfBy :: (a -> b -> Bool) -> IntMap a -> IntMap b -> Bool -isSubmapOf :: Eq a => IntMap a -> IntMap a -> Bool -isSubmapOfBy :: (a -> b -> Bool) -> IntMap a -> IntMap b -> Bool -keys :: IntMap a -> [Key] -keysSet :: IntMap a -> IntSet -lookup :: Key -> IntMap a -> Maybe a -map :: (a -> b) -> IntMap a -> IntMap b -mapAccum :: (a -> b -> (a, c)) -> a -> IntMap b -> (a, IntMap c) -mapAccumWithKey :: (a -> Key -> b -> (a, c)) -> a -> IntMap b -> (a, IntMap c) -mapWithKey :: (Key -> a -> b) -> IntMap a -> IntMap b -member :: Key -> IntMap a -> Bool -null :: IntMap a -> Bool -partition :: (a -> Bool) -> IntMap a -> (IntMap a, IntMap a) -partitionWithKey :: (Key -> a -> Bool) -> IntMap a -> (IntMap a, IntMap a) -showTree :: Show a => IntMap a -> String -showTreeWith :: Show a => Bool -> Bool -> IntMap a -> String -singleton :: Key -> a -> IntMap a -size :: IntMap a -> Int -split :: Key -> IntMap a -> (IntMap a, IntMap a) -splitLookup :: Key -> IntMap a -> (IntMap a, Maybe a, IntMap a) -toAscList :: IntMap a -> [(Key, a)] -toList :: IntMap a -> [(Key, a)] -type Key = Int -union :: IntMap a -> IntMap a -> IntMap a -unionWith :: (a -> a -> a) -> IntMap a -> IntMap a -> IntMap a -unionWithKey :: (Key -> a -> a -> a) -> IntMap a -> IntMap a -> IntMap a -unions :: [IntMap a] -> IntMap a -unionsWith :: (a -> a -> a) -> [IntMap a] -> IntMap a -update :: (a -> Maybe a) -> Key -> IntMap a -> IntMap a -updateLookupWithKey :: (Key -> a -> Maybe a) -> Key -> IntMap a -> (Maybe a, IntMap a) -updateWithKey :: (Key -> a -> Maybe a) -> Key -> IntMap a -> IntMap a - -module Data.IntSet -(\\) :: IntSet -> IntSet -> IntSet -data IntSet -delete :: Int -> IntSet -> IntSet -difference :: IntSet -> IntSet -> IntSet -elems :: IntSet -> [Int] -empty :: IntSet -filter :: (Int -> Bool) -> IntSet -> IntSet -fold :: (Int -> b -> b) -> b -> IntSet -> b -fromAscList :: [Int] -> IntSet -fromDistinctAscList :: [Int] -> IntSet -fromList :: [Int] -> IntSet -insert :: Int -> IntSet -> IntSet -instance Data IntSet -instance Eq IntSet -instance Monoid IntSet -instance Ord IntSet -instance Show IntSet -instance Typeable IntSet -intersection :: IntSet -> IntSet -> IntSet -isProperSubsetOf :: IntSet -> IntSet -> Bool -isSubsetOf :: IntSet -> IntSet -> Bool -map :: (Int -> Int) -> IntSet -> IntSet -member :: Int -> IntSet -> Bool -null :: IntSet -> Bool -partition :: (Int -> Bool) -> IntSet -> (IntSet, IntSet) -showTree :: IntSet -> String -showTreeWith :: Bool -> Bool -> IntSet -> String -singleton :: Int -> IntSet -size :: IntSet -> Int -split :: Int -> IntSet -> (IntSet, IntSet) -splitMember :: Int -> IntSet -> (IntSet, Bool, IntSet) -toAscList :: IntSet -> [Int] -toList :: IntSet -> [Int] -union :: IntSet -> IntSet -> IntSet -unions :: [IntSet] -> IntSet - -module Data.Ix -class Ord a => Ix a - -module Data.List -deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] -elemIndex :: Eq a => a -> [a] -> Maybe Int -foldl' :: (a -> b -> a) -> a -> [b] -> a -foldl1' :: (a -> a -> a) -> [a] -> a -genericDrop :: Integral i => i -> [a] -> [a] -genericLength :: Num i => [b] -> i -genericReplicate :: Integral i => i -> a -> [a] -genericSplitAt :: Integral i => i -> [b] -> ([b], [b]) -genericTake :: Integral i => i -> [a] -> [a] -mapAccumL :: (acc -> x -> (acc, y)) -> acc -> [x] -> (acc, [y]) -mapAccumR :: (acc -> x -> (acc, y)) -> acc -> [x] -> (acc, [y]) -maximumBy :: (a -> a -> Ordering) -> [a] -> a -minimumBy :: (a -> a -> Ordering) -> [a] -> a -partition :: (a -> Bool) -> [a] -> ([a], [a]) -unfoldr :: (b -> Maybe (a, b)) -> b -> [a] -unzip4 :: [(a, b, c, d)] -> ([a], [b], [c], [d]) -unzip5 :: [(a, b, c, d, e)] -> ([a], [b], [c], [d], [e]) -unzip6 :: [(a, b, c, d, e, f)] -> ([a], [b], [c], [d], [e], [f]) -unzip7 :: [(a, b, c, d, e, f, g)] -> ([a], [b], [c], [d], [e], [f], [g]) -zip4 :: [a] -> [b] -> [c] -> [d] -> [(a, b, c, d)] -zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a, b, c, d, e)] -zip6 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [(a, b, c, d, e, f)] -zip7 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [(a, b, c, d, e, f, g)] - -module Data.Map -(!) :: Ord k => Map k a -> k -> a -(\\) :: Ord k => Map k a -> Map k b -> Map k a -adjust :: Ord k => (a -> a) -> k -> Map k a -> Map k a -adjustWithKey :: Ord k => (k -> a -> a) -> k -> Map k a -> Map k a -assocs :: Map k a -> [(k, a)] -data Map k a -delete :: Ord k => k -> Map k a -> Map k a -deleteAt :: Int -> Map k a -> Map k a -deleteFindMax :: Map k a -> ((k, a), Map k a) -deleteFindMin :: Map k a -> ((k, a), Map k a) -deleteMax :: Map k a -> Map k a -deleteMin :: Map k a -> Map k a -difference :: Ord k => Map k a -> Map k b -> Map k a -differenceWith :: Ord k => (a -> b -> Maybe a) -> Map k a -> Map k b -> Map k a -differenceWithKey :: Ord k => (k -> a -> b -> Maybe a) -> Map k a -> Map k b -> Map k a -elemAt :: Int -> Map k a -> (k, a) -elems :: Map k a -> [a] -empty :: Map k a -filter :: Ord k => (a -> Bool) -> Map k a -> Map k a -filterWithKey :: Ord k => (k -> a -> Bool) -> Map k a -> Map k a -findIndex :: Ord k => k -> Map k a -> Int -findMax :: Map k a -> (k, a) -findMin :: Map k a -> (k, a) -findWithDefault :: Ord k => a -> k -> Map k a -> a -fold :: (a -> b -> b) -> b -> Map k a -> b -foldWithKey :: (k -> a -> b -> b) -> b -> Map k a -> b -fromAscList :: Eq k => [(k, a)] -> Map k a -fromAscListWith :: Eq k => (a -> a -> a) -> [(k, a)] -> Map k a -fromAscListWithKey :: Eq k => (k -> a -> a -> a) -> [(k, a)] -> Map k a -fromDistinctAscList :: [(k, a)] -> Map k a -fromList :: Ord k => [(k, a)] -> Map k a -fromListWith :: Ord k => (a -> a -> a) -> [(k, a)] -> Map k a -fromListWithKey :: Ord k => (k -> a -> a -> a) -> [(k, a)] -> Map k a -insert :: Ord k => k -> a -> Map k a -> Map k a -insertLookupWithKey :: Ord k => (k -> a -> a -> a) -> k -> a -> Map k a -> (Maybe a, Map k a) -insertWith :: Ord k => (a -> a -> a) -> k -> a -> Map k a -> Map k a -insertWithKey :: Ord k => (k -> a -> a -> a) -> k -> a -> Map k a -> Map k a -instance (Data k, Data a, Ord k) => Data (Map k a) -instance (Eq k, Eq a) => Eq (Map k a) -instance (Ord k, Ord v) => Ord (Map k v) -instance (Show k, Show a) => Show (Map k a) -instance Functor (Map k) -instance Ord k => Monoid (Map k v) -instance Typeable2 Map -intersection :: Ord k => Map k a -> Map k b -> Map k a -intersectionWith :: Ord k => (a -> b -> c) -> Map k a -> Map k b -> Map k c -intersectionWithKey :: Ord k => (k -> a -> b -> c) -> Map k a -> Map k b -> Map k c -isProperSubmapOf :: (Ord k, Eq a) => Map k a -> Map k a -> Bool -isProperSubmapOfBy :: Ord k => (a -> b -> Bool) -> Map k a -> Map k b -> Bool -isSubmapOf :: (Ord k, Eq a) => Map k a -> Map k a -> Bool -isSubmapOfBy :: Ord k => (a -> b -> Bool) -> Map k a -> Map k b -> Bool -keys :: Map k a -> [k] -keysSet :: Map k a -> Set k -lookup :: (Monad m, Ord k) => k -> Map k a -> m a -lookupIndex :: (Monad m, Ord k) => k -> Map k a -> m Int -map :: (a -> b) -> Map k a -> Map k b -mapAccum :: (a -> b -> (a, c)) -> a -> Map k b -> (a, Map k c) -mapAccumWithKey :: (a -> k -> b -> (a, c)) -> a -> Map k b -> (a, Map k c) -mapKeys :: Ord k2 => (k1 -> k2) -> Map k1 a -> Map k2 a -mapKeysMonotonic :: (k1 -> k2) -> Map k1 a -> Map k2 a -mapKeysWith :: Ord k2 => (a -> a -> a) -> (k1 -> k2) -> Map k1 a -> Map k2 a -mapWithKey :: (k -> a -> b) -> Map k a -> Map k b -member :: Ord k => k -> Map k a -> Bool -null :: Map k a -> Bool -partition :: Ord k => (a -> Bool) -> Map k a -> (Map k a, Map k a) -partitionWithKey :: Ord k => (k -> a -> Bool) -> Map k a -> (Map k a, Map k a) -showTree :: (Show k, Show a) => Map k a -> String -showTreeWith :: (k -> a -> String) -> Bool -> Bool -> Map k a -> String -singleton :: k -> a -> Map k a -size :: Map k a -> Int -split :: Ord k => k -> Map k a -> (Map k a, Map k a) -splitLookup :: Ord k => k -> Map k a -> (Map k a, Maybe a, Map k a) -toAscList :: Map k a -> [(k, a)] -toList :: Map k a -> [(k, a)] -union :: Ord k => Map k a -> Map k a -> Map k a -unionWith :: Ord k => (a -> a -> a) -> Map k a -> Map k a -> Map k a -unionWithKey :: Ord k => (k -> a -> a -> a) -> Map k a -> Map k a -> Map k a -unions :: Ord k => [Map k a] -> Map k a -unionsWith :: Ord k => (a -> a -> a) -> [Map k a] -> Map k a -update :: Ord k => (a -> Maybe a) -> k -> Map k a -> Map k a -updateAt :: (k -> a -> Maybe a) -> Int -> Map k a -> Map k a -updateLookupWithKey :: Ord k => (k -> a -> Maybe a) -> k -> Map k a -> (Maybe a, Map k a) -updateMax :: (a -> Maybe a) -> Map k a -> Map k a -updateMaxWithKey :: (k -> a -> Maybe a) -> Map k a -> Map k a -updateMin :: (a -> Maybe a) -> Map k a -> Map k a -updateMinWithKey :: (k -> a -> Maybe a) -> Map k a -> Map k a -updateWithKey :: Ord k => (k -> a -> Maybe a) -> k -> Map k a -> Map k a -valid :: Ord k => Map k a -> Bool - -module Data.Monoid -class Monoid a -mappend :: Monoid a => a -> a -> a -mconcat :: Monoid a => [a] -> a -mempty :: Monoid a => a - -module Data.PackedString -appendPS :: PackedString -> PackedString -> PackedString -breakPS :: (Char -> Bool) -> PackedString -> (PackedString, PackedString) -concatPS :: [PackedString] -> PackedString -consPS :: Char -> PackedString -> PackedString -data PackedString -dropPS :: Int -> PackedString -> PackedString -dropWhilePS :: (Char -> Bool) -> PackedString -> PackedString -elemPS :: Char -> PackedString -> Bool -filterPS :: (Char -> Bool) -> PackedString -> PackedString -foldlPS :: (a -> Char -> a) -> a -> PackedString -> a -foldrPS :: (Char -> a -> a) -> a -> PackedString -> a -hGetPS :: Handle -> Int -> IO PackedString -hPutPS :: Handle -> PackedString -> IO () -headPS :: PackedString -> Char -indexPS :: PackedString -> Int -> Char -instance Eq PackedString -instance Ord PackedString -instance Show PackedString -instance Typeable PackedString -joinPS :: PackedString -> [PackedString] -> PackedString -lengthPS :: PackedString -> Int -linesPS :: PackedString -> [PackedString] -mapPS :: (Char -> Char) -> PackedString -> PackedString -nilPS :: PackedString -nullPS :: PackedString -> Bool -packString :: String -> PackedString -reversePS :: PackedString -> PackedString -spanPS :: (Char -> Bool) -> PackedString -> (PackedString, PackedString) -splitAtPS :: Int -> PackedString -> (PackedString, PackedString) -splitPS :: Char -> PackedString -> [PackedString] -splitWithPS :: (Char -> Bool) -> PackedString -> [PackedString] -substrPS :: PackedString -> Int -> Int -> PackedString -tailPS :: PackedString -> PackedString -takePS :: Int -> PackedString -> PackedString -takeWhilePS :: (Char -> Bool) -> PackedString -> PackedString -unlinesPS :: [PackedString] -> PackedString -unpackPS :: PackedString -> String -unwordsPS :: [PackedString] -> PackedString -wordsPS :: PackedString -> [PackedString] - -module Data.Queue -addToQueue :: Queue a -> a -> Queue a -data Queue a -deQueue :: Queue a -> Maybe (a, Queue a) -emptyQueue :: Queue a -instance Functor Queue -instance Typeable1 Queue -listToQueue :: [a] -> Queue a -queueToList :: Queue a -> [a] - -module Data.Ratio -data Ratio a -instance (Data a, Integral a) => Data (Ratio a) -instance (Integral a, Eq a) => Eq (Ratio a) -instance (Integral a, NFData a) => NFData (Ratio a) -instance (Integral a, Read a) => Read (Ratio a) -instance Integral a => Enum (Ratio a) -instance Integral a => Fractional (Ratio a) -instance Integral a => Num (Ratio a) -instance Integral a => Ord (Ratio a) -instance Integral a => Real (Ratio a) -instance Integral a => RealFrac (Ratio a) -instance Integral a => Show (Ratio a) -instance Typeable1 Ratio - -module Data.STRef -data STRef s a -instance Eq (STRef s a) -instance Typeable2 STRef -modifySTRef :: STRef s a -> (a -> a) -> ST s () -newSTRef :: a -> ST s (STRef s a) -readSTRef :: STRef s a -> ST s a -writeSTRef :: STRef s a -> a -> ST s () - -module Data.Set -(\\) :: Ord a => Set a -> Set a -> Set a -addToSet :: Ord a => Set a -> a -> Set a -cardinality :: Set a -> Int -data Set a -delFromSet :: Ord a => Set a -> a -> Set a -delete :: Ord a => a -> Set a -> Set a -deleteFindMax :: Set a -> (a, Set a) -deleteFindMin :: Set a -> (a, Set a) -deleteMax :: Set a -> Set a -deleteMin :: Set a -> Set a -difference :: Ord a => Set a -> Set a -> Set a -elementOf :: Ord a => a -> Set a -> Bool -elems :: Set a -> [a] -empty :: Set a -emptySet :: Set a -filter :: Ord a => (a -> Bool) -> Set a -> Set a -findMax :: Set a -> a -findMin :: Set a -> a -fold :: (a -> b -> b) -> b -> Set a -> b -fromAscList :: Eq a => [a] -> Set a -fromDistinctAscList :: [a] -> Set a -fromList :: Ord a => [a] -> Set a -insert :: Ord a => a -> Set a -> Set a -instance (Data a, Ord a) => Data (Set a) -instance Eq a => Eq (Set a) -instance Ord a => Monoid (Set a) -instance Ord a => Ord (Set a) -instance Show a => Show (Set a) -instance Typeable1 Set -intersect :: Ord a => Set a -> Set a -> Set a -intersection :: Ord a => Set a -> Set a -> Set a -isEmptySet :: Set a -> Bool -isProperSubsetOf :: Ord a => Set a -> Set a -> Bool -isSubsetOf :: Ord a => Set a -> Set a -> Bool -map :: (Ord a, Ord b) => (a -> b) -> Set a -> Set b -mapMonotonic :: (a -> b) -> Set a -> Set b -mapSet :: (Ord a, Ord b) => (b -> a) -> Set b -> Set a -member :: Ord a => a -> Set a -> Bool -minusSet :: Ord a => Set a -> Set a -> Set a -mkSet :: Ord a => [a] -> Set a -null :: Set a -> Bool -partition :: Ord a => (a -> Bool) -> Set a -> (Set a, Set a) -setToList :: Set a -> [a] -showTree :: Show a => Set a -> String -showTreeWith :: Show a => Bool -> Bool -> Set a -> String -singleton :: a -> Set a -size :: Set a -> Int -split :: Ord a => a -> Set a -> (Set a, Set a) -splitMember :: Ord a => a -> Set a -> (Set a, Bool, Set a) -toAscList :: Set a -> [a] -toList :: Set a -> [a] -union :: Ord a => Set a -> Set a -> Set a -unionManySets :: Ord a => [Set a] -> Set a -unions :: Ord a => [Set a] -> Set a -unitSet :: a -> Set a -valid :: Ord a => Set a -> Bool - -module Data.Tree -Node :: a -> Forest a -> Tree a -data Tree a -drawForest :: Forest String -> String -drawTree :: Tree String -> String -flatten :: Tree a -> [a] -instance Eq a => Eq (Tree a) -instance Functor Tree -instance Read a => Read (Tree a) -instance Show a => Show (Tree a) -levels :: Tree a -> [[a]] -rootLabel :: Tree a -> a -subForest :: Tree a -> Forest a -type Forest a = [Tree a] -unfoldForest :: (b -> (a, [b])) -> [b] -> Forest a -unfoldForestM :: Monad m => (b -> m (a, [b])) -> [b] -> m (Forest a) -unfoldForestM_BF :: Monad m => (b -> m (a, [b])) -> [b] -> m (Forest a) -unfoldTree :: (b -> (a, [b])) -> b -> Tree a -unfoldTreeM :: Monad m => (b -> m (a, [b])) -> b -> m (Tree a) -unfoldTreeM_BF :: Monad m => (b -> m (a, [b])) -> b -> m (Tree a) - -module Data.Typeable -cast :: (Typeable a, Typeable b) => a -> Maybe b -class Typeable a -class Typeable1 t -class Typeable2 t -class Typeable3 t -class Typeable4 t -class Typeable5 t -class Typeable6 t -class Typeable7 t -data TyCon -data TypeRep -funResultTy :: TypeRep -> TypeRep -> Maybe TypeRep -gcast :: (Typeable a, Typeable b) => c a -> Maybe (c b) -gcast1 :: (Typeable1 t, Typeable1 t') => c (t a) -> Maybe (c (t' a)) -gcast2 :: (Typeable2 t, Typeable2 t') => c (t a b) -> Maybe (c (t' a b)) -instance Data TyCon -instance Data TypeRep -instance Eq TyCon -instance Eq TypeRep -instance Show TyCon -instance Show TypeRep -instance Typeable TyCon -instance Typeable TypeRep -mkAppTy :: TypeRep -> TypeRep -> TypeRep -mkFunTy :: TypeRep -> TypeRep -> TypeRep -mkTyCon :: String -> TyCon -mkTyConApp :: TyCon -> [TypeRep] -> TypeRep -splitTyConApp :: TypeRep -> (TyCon, [TypeRep]) -tyConString :: TyCon -> String -typeOf :: Typeable a => a -> TypeRep -typeOf1 :: Typeable1 t => t a -> TypeRep -typeOf1Default :: (Typeable2 t, Typeable a) => t a b -> TypeRep -typeOf2 :: Typeable2 t => t a b -> TypeRep -typeOf2Default :: (Typeable3 t, Typeable a) => t a b c -> TypeRep -typeOf3 :: Typeable3 t => t a b c -> TypeRep -typeOf3Default :: (Typeable4 t, Typeable a) => t a b c d -> TypeRep -typeOf4 :: Typeable4 t => t a b c d -> TypeRep -typeOf4Default :: (Typeable5 t, Typeable a) => t a b c d e -> TypeRep -typeOf5 :: Typeable5 t => t a b c d e -> TypeRep -typeOf5Default :: (Typeable6 t, Typeable a) => t a b c d e f -> TypeRep -typeOf6 :: Typeable6 t => t a b c d e f -> TypeRep -typeOf6Default :: (Typeable7 t, Typeable a) => t a b c d e f g -> TypeRep -typeOf7 :: Typeable7 t => t a b c d e f g -> TypeRep -typeOfDefault :: (Typeable1 t, Typeable a) => t a -> TypeRep -typeRepArgs :: TypeRep -> [TypeRep] -typeRepTyCon :: TypeRep -> TyCon - -module Data.Unique -data Unique -hashUnique :: Unique -> Int -instance Eq Unique -instance Ord Unique -newUnique :: IO Unique - -module Data.Version -Version :: [Int] -> [String] -> Version -data Version -instance Eq Version -instance Ord Version -instance Read Version -instance Show Version -instance Typeable Version -parseVersion :: ReadP Version -showVersion :: Version -> String -versionBranch :: Version -> [Int] -versionTags :: Version -> [String] - -module Data.Word -data Word -data Word16 -data Word32 -data Word64 -data Word8 -instance (Ix ix, Show ix) => Show (DiffUArray ix Word) -instance (Ix ix, Show ix) => Show (DiffUArray ix Word16) -instance (Ix ix, Show ix) => Show (DiffUArray ix Word32) -instance (Ix ix, Show ix) => Show (DiffUArray ix Word64) -instance (Ix ix, Show ix) => Show (DiffUArray ix Word8) -instance (Ix ix, Show ix) => Show (UArray ix Word) -instance (Ix ix, Show ix) => Show (UArray ix Word16) -instance (Ix ix, Show ix) => Show (UArray ix Word32) -instance (Ix ix, Show ix) => Show (UArray ix Word64) -instance (Ix ix, Show ix) => Show (UArray ix Word8) -instance Bits Word -instance Bits Word16 -instance Bits Word32 -instance Bits Word64 -instance Bits Word8 -instance Bounded Word -instance Bounded Word16 -instance Bounded Word32 -instance Bounded Word64 -instance Bounded Word8 -instance Data Word -instance Data Word16 -instance Data Word32 -instance Data Word64 -instance Data Word8 -instance Enum Word -instance Enum Word16 -instance Enum Word32 -instance Enum Word64 -instance Enum Word8 -instance Eq Word -instance Eq Word16 -instance Eq Word32 -instance Eq Word64 -instance Eq Word8 -instance IArray (IOToDiffArray IOUArray) Word -instance IArray (IOToDiffArray IOUArray) Word16 -instance IArray (IOToDiffArray IOUArray) Word32 -instance IArray (IOToDiffArray IOUArray) Word64 -instance IArray (IOToDiffArray IOUArray) Word8 -instance IArray UArray Word -instance IArray UArray Word16 -instance IArray UArray Word32 -instance IArray UArray Word64 -instance IArray UArray Word8 -instance Integral Word -instance Integral Word16 -instance Integral Word32 -instance Integral Word64 -instance Integral Word8 -instance Ix Word -instance Ix Word16 -instance Ix Word32 -instance Ix Word64 -instance Ix Word8 -instance Ix ix => Eq (UArray ix Word) -instance Ix ix => Eq (UArray ix Word16) -instance Ix ix => Eq (UArray ix Word32) -instance Ix ix => Eq (UArray ix Word64) -instance Ix ix => Eq (UArray ix Word8) -instance Ix ix => Ord (UArray ix Word) -instance Ix ix => Ord (UArray ix Word16) -instance Ix ix => Ord (UArray ix Word32) -instance Ix ix => Ord (UArray ix Word64) -instance Ix ix => Ord (UArray ix Word8) -instance MArray (STUArray s) Word (ST s) -instance MArray (STUArray s) Word16 (ST s) -instance MArray (STUArray s) Word32 (ST s) -instance MArray (STUArray s) Word64 (ST s) -instance MArray (STUArray s) Word8 (ST s) -instance Num Word -instance Num Word16 -instance Num Word32 -instance Num Word64 -instance Num Word8 -instance Ord Word -instance Ord Word16 -instance Ord Word32 -instance Ord Word64 -instance Ord Word8 -instance Read Word -instance Read Word16 -instance Read Word32 -instance Read Word64 -instance Read Word8 -instance Real Word -instance Real Word16 -instance Real Word32 -instance Real Word64 -instance Real Word8 -instance Show Word -instance Show Word16 -instance Show Word32 -instance Show Word64 -instance Show Word8 -instance Storable Word -instance Storable Word16 -instance Storable Word32 -instance Storable Word64 -instance Storable Word8 -instance Typeable Word -instance Typeable Word16 -instance Typeable Word32 -instance Typeable Word64 -instance Typeable Word8 - -module Debug.Trace -putTraceMsg :: String -> IO () -trace :: String -> a -> a - -module Directory -createDirectory :: FilePath -> IO () -doesDirectoryExist :: FilePath -> IO Bool -doesFileExist :: FilePath -> IO Bool -executable :: Permissions -> Bool -getCurrentDirectory :: IO FilePath -getDirectoryContents :: FilePath -> IO [FilePath] -getModificationTime :: FilePath -> IO ClockTime -getPermissions :: FilePath -> IO Permissions -readable :: Permissions -> Bool -removeDirectory :: FilePath -> IO () -removeFile :: FilePath -> IO () -renameDirectory :: FilePath -> FilePath -> IO () -renameFile :: FilePath -> FilePath -> IO () -searchable :: Permissions -> Bool -setCurrentDirectory :: FilePath -> IO () -setPermissions :: FilePath -> Permissions -> IO () -writable :: Permissions -> Bool - -module Distribution.Compat.Directory -copyFile -createDirectoryIfMissing -findExecutable -getHomeDirectory -removeDirectoryRecursive - -module Distribution.Compat.Exception -bracket -finally - -module Distribution.Compat.FilePath -FilePath -breakFilePath :: FilePath -> [String] -changeFileExt :: FilePath -> String -> FilePath -commonParent :: [FilePath] -> Maybe FilePath -dllExtension :: String -dropAbsolutePrefix :: FilePath -> FilePath -dropPrefix :: FilePath -> FilePath -> FilePath -exeExtension :: String -isAbsolutePath :: FilePath -> Bool -isPathSeparator :: Char -> Bool -isRootedPath :: FilePath -> Bool -joinFileExt :: String -> String -> FilePath -joinFileName :: String -> String -> FilePath -joinPaths :: FilePath -> FilePath -> FilePath -mkSearchPath :: [FilePath] -> String -objExtension :: String -parseSearchPath :: String -> [FilePath] -pathParents :: FilePath -> [FilePath] -pathSeparator :: Char -searchPathSeparator :: Char -splitFileExt :: FilePath -> (String, String) -splitFileName :: FilePath -> (String, String) -splitFilePath :: FilePath -> (String, String, String) - -module Distribution.Extension -AllowIncoherentInstances :: Extension -AllowOverlappingInstances :: Extension -AllowUndecidableInstances :: Extension -Arrows :: Extension -CPP :: Extension -ContextStack :: Extension -EmptyDataDecls :: Extension -ExistentialQuantification :: Extension -ExtensibleRecords :: Extension -FlexibleContexts :: Extension -FlexibleInstances :: Extension -ForeignFunctionInterface :: Extension -FunctionalDependencies :: Extension -Generics :: Extension -HereDocuments :: Extension -ImplicitParams :: Extension -InlinePhase :: Extension -MultiParamTypeClasses :: Extension -NamedFieldPuns :: Extension -NoImplicitPrelude :: Extension -NoMonomorphismRestriction :: Extension -OverlappingInstances :: Extension -ParallelListComp :: Extension -PolymorphicComponents :: Extension -RankNTypes :: Extension -RecursiveDo :: Extension -RestrictedTypeSynonyms :: Extension -ScopedTypeVariables :: Extension -TemplateHaskell :: Extension -TypeSynonymInstances :: Extension -UnsafeOverlappingInstances :: Extension -data Extension -extensionsToGHCFlag :: [Extension] -> ([Extension], [Opt]) -extensionsToHugsFlag :: [Extension] -> ([Extension], [Opt]) -extensionsToNHCFlag :: [Extension] -> ([Extension], [Opt]) -instance Eq Extension -instance Read Extension -instance Show Extension -type Opt = String - -module Distribution.GetOpt -NoArg :: a -> ArgDescr a -OptArg :: (Maybe String -> a) -> String -> ArgDescr a -Option :: [Char] -> [String] -> (ArgDescr a) -> String -> OptDescr a -Permute :: ArgOrder a -ReqArg :: (String -> a) -> String -> ArgDescr a -RequireOrder :: ArgOrder a -ReturnInOrder :: (String -> a) -> ArgOrder a -data ArgDescr a -data ArgOrder a -data OptDescr a -getOpt :: ArgOrder a -> [OptDescr a] -> [String] -> ([a], [String], [String]) -getOpt' :: ArgOrder a -> [OptDescr a] -> [String] -> ([a], [String], [String], [String]) -usageInfo :: String -> [OptDescr a] -> String - -module Distribution.InstalledPackageInfo -InstalledPackageInfo :: PackageIdentifier -> License -> String -> String -> String -> String -> String -> String -> String -> String -> Bool -> [String] -> [String] -> [FilePath] -> [FilePath] -> [String] -> [String] -> [FilePath] -> [String] -> [PackageIdentifier] -> [Opt] -> [Opt] -> [Opt] -> [FilePath] -> [String] -> [FilePath] -> [FilePath] -> InstalledPackageInfo -ParseFailed :: PError -> ParseResult a -ParseOk :: a -> ParseResult a -author :: InstalledPackageInfo -> String -category :: InstalledPackageInfo -> String -ccOptions :: InstalledPackageInfo -> [Opt] -copyright :: InstalledPackageInfo -> String -data InstalledPackageInfo -data ParseResult a -depends :: InstalledPackageInfo -> [PackageIdentifier] -description :: InstalledPackageInfo -> String -emptyInstalledPackageInfo :: InstalledPackageInfo -exposed :: InstalledPackageInfo -> Bool -exposedModules :: InstalledPackageInfo -> [String] -extraLibraries :: InstalledPackageInfo -> [String] -frameworkDirs :: InstalledPackageInfo -> [FilePath] -frameworks :: InstalledPackageInfo -> [String] -haddockHTMLs :: InstalledPackageInfo -> [FilePath] -haddockInterfaces :: InstalledPackageInfo -> [FilePath] -hiddenModules :: InstalledPackageInfo -> [String] -homepage :: InstalledPackageInfo -> String -hsLibraries :: InstalledPackageInfo -> [String] -hugsOptions :: InstalledPackageInfo -> [Opt] -importDirs :: InstalledPackageInfo -> [FilePath] -includeDirs :: InstalledPackageInfo -> [FilePath] -includes :: InstalledPackageInfo -> [String] -instance Monad ParseResult -instance Read InstalledPackageInfo -instance Show InstalledPackageInfo -instance Show a => Show (ParseResult a) -ldOptions :: InstalledPackageInfo -> [Opt] -libraryDirs :: InstalledPackageInfo -> [FilePath] -license :: InstalledPackageInfo -> License -maintainer :: InstalledPackageInfo -> String -package :: InstalledPackageInfo -> PackageIdentifier -parseInstalledPackageInfo :: String -> ParseResult InstalledPackageInfo -pkgUrl :: InstalledPackageInfo -> String -showInstalledPackageInfo :: InstalledPackageInfo -> String -showInstalledPackageInfoField :: String -> Maybe (InstalledPackageInfo -> String) -stability :: InstalledPackageInfo -> String - -module Distribution.License -AllRightsReserved :: License -BSD3 :: License -BSD4 :: License -GPL :: License -LGPL :: License -OtherLicense :: License -PublicDomain :: License -data License -instance Eq License -instance Read License -instance Show License - -module Distribution.Package -PackageIdentifier :: String -> Version -> PackageIdentifier -data PackageIdentifier -instance Eq PackageIdentifier -instance Read PackageIdentifier -instance Show PackageIdentifier -parsePackageId :: ReadP r PackageIdentifier -parsePackageName :: ReadP r String -pkgName :: PackageIdentifier -> String -pkgVersion :: PackageIdentifier -> Version -showPackageId :: PackageIdentifier -> String - -module Distribution.PackageDescription -BuildInfo :: Bool -> [String] -> [String] -> [String] -> [FilePath] -> FilePath -> [String] -> [Extension] -> [String] -> [String] -> [FilePath] -> [FilePath] -> [(CompilerFlavor,[String])] -> BuildInfo -Executable :: String -> FilePath -> BuildInfo -> Executable -Library :: [String] -> BuildInfo -> Library -PackageDescription :: PackageIdentifier -> License -> FilePath -> String -> String -> String -> String -> [(CompilerFlavor,VersionRange)] -> String -> String -> String -> String -> String -> [Dependency] -> Maybe Library -> [Executable] -> PackageDescription -StanzaField :: String -> a -> Doc -> LineNo -> String -> a -> ParseResult a -> StanzaField a -author :: PackageDescription -> String -basicStanzaFields :: [StanzaField PackageDescription] -buildDepends :: PackageDescription -> [Dependency] -buildInfo :: Executable -> BuildInfo -buildable :: BuildInfo -> Bool -cSources :: BuildInfo -> [FilePath] -category :: PackageDescription -> String -ccOptions :: BuildInfo -> [String] -copyright :: PackageDescription -> String -data BuildInfo -data Executable -data Library -data PError -data PackageDescription -data StanzaField a -description :: PackageDescription -> String -emptyBuildInfo :: BuildInfo -emptyHookedBuildInfo :: HookedBuildInfo -emptyPackageDescription :: PackageDescription -errorOut :: [String] -> [String] -> IO () -exeModules :: PackageDescription -> [String] -exeName :: Executable -> String -executables :: PackageDescription -> [Executable] -exposedModules :: Library -> [String] -extensions :: BuildInfo -> [Extension] -extraLibDirs :: BuildInfo -> [String] -extraLibs :: BuildInfo -> [String] -fieldGet :: StanzaField a -> a -> Doc -fieldName :: StanzaField a -> String -fieldSet :: StanzaField a -> LineNo -> String -> a -> ParseResult a -frameworks :: BuildInfo -> [String] -hasLibs :: PackageDescription -> Bool -hcOptions :: CompilerFlavor -> [(CompilerFlavor, [String])] -> [String] -homepage :: PackageDescription -> String -hsSourceDir :: BuildInfo -> FilePath -includeDirs :: BuildInfo -> [FilePath] -includes :: BuildInfo -> [FilePath] -instance Eq BuildInfo -instance Eq Executable -instance Eq Library -instance Eq PackageDescription -instance Read BuildInfo -instance Read Executable -instance Read Library -instance Read PackageDescription -instance Show BuildInfo -instance Show Executable -instance Show Library -instance Show PError -instance Show PackageDescription -ldOptions :: BuildInfo -> [String] -libBuildInfo :: Library -> BuildInfo -libModules :: PackageDescription -> [String] -library :: PackageDescription -> Maybe Library -license :: PackageDescription -> License -licenseFile :: PackageDescription -> FilePath -maintainer :: PackageDescription -> String -modulePath :: Executable -> FilePath -options :: BuildInfo -> [(CompilerFlavor,[String])] -otherModules :: BuildInfo -> [String] -package :: PackageDescription -> PackageIdentifier -parseDescription :: String -> ParseResult PackageDescription -parseHookedBuildInfo :: String -> ParseResult HookedBuildInfo -pkgUrl :: PackageDescription -> String -readHookedBuildInfo :: FilePath -> IO HookedBuildInfo -readPackageDescription :: FilePath -> IO PackageDescription -sanityCheckPackage :: PackageDescription -> IO ([String], [String]) -setupMessage :: String -> PackageDescription -> IO () -showError :: PError -> String -showHookedBuildInfo :: HookedBuildInfo -> String -showPackageDescription :: PackageDescription -> String -stability :: PackageDescription -> String -synopsis :: PackageDescription -> String -testedWith :: PackageDescription -> [(CompilerFlavor,VersionRange)] -type HookedBuildInfo = (Maybe BuildInfo, [(String, BuildInfo)]) -type LineNo = Int -updatePackageDescription :: HookedBuildInfo -> PackageDescription -> PackageDescription -withExe :: PackageDescription -> (Executable -> IO a) -> IO () -withLib :: PackageDescription -> a -> (Library -> IO a) -> IO a -writeHookedBuildInfo :: FilePath -> HookedBuildInfo -> IO () -writePackageDescription :: FilePath -> PackageDescription -> IO () - -module Distribution.PreProcess -knownSuffixHandlers :: [PPSuffixHandler] -ppAlex :: BuildInfo -> LocalBuildInfo -> PreProcessor -ppC2hs :: PreProcessor -ppCpp :: BuildInfo -> LocalBuildInfo -> PreProcessor -ppCpp' :: [String] -> BuildInfo -> LocalBuildInfo -> PreProcessor -ppGreenCard :: PreProcessor -ppHappy :: BuildInfo -> LocalBuildInfo -> PreProcessor -ppHsc2hs :: BuildInfo -> LocalBuildInfo -> PreProcessor -ppSuffixes :: [PPSuffixHandler] -> [String] -ppUnlit :: PreProcessor -preprocessSources :: PackageDescription -> LocalBuildInfo -> Int -> [PPSuffixHandler] -> IO () -removePreprocessed :: FilePath -> [String] -> [String] -> IO () -removePreprocessedPackage :: PackageDescription -> FilePath -> [String] -> IO () -type PPSuffixHandler = (String, BuildInfo -> LocalBuildInfo -> PreProcessor) -type PreProcessor = FilePath -> FilePath -> Int -> IO ExitCode - -module Distribution.PreProcess.Unlit -plain :: String -> String -> String -unlit :: String -> String -> String - -module Distribution.Setup -BuildCmd :: Action -CleanCmd :: Action -Compiler :: CompilerFlavor -> Version -> FilePath -> FilePath -> Compiler -ConfigCmd :: ConfigFlags -> Action -ConfigFlags :: Maybe CompilerFlavor -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Int -> Bool -> ConfigFlags -CopyCmd :: (Maybe FilePath) -> Action -GHC :: CompilerFlavor -HBC :: CompilerFlavor -HaddockCmd :: Action -Helium :: CompilerFlavor -HelpCmd :: Action -Hugs :: CompilerFlavor -InstallCmd :: Bool -> Action -NHC :: CompilerFlavor -OtherCompiler :: String -> CompilerFlavor -ProgramaticaCmd :: Action -RegisterCmd :: Bool -> Bool -> Action -SDistCmd :: Action -UnregisterCmd :: Bool -> Bool -> Action -compilerFlavor :: Compiler -> CompilerFlavor -compilerPath :: Compiler -> FilePath -compilerPkgTool :: Compiler -> FilePath -compilerVersion :: Compiler -> Version -configAlex :: ConfigFlags -> Maybe FilePath -configCpphs :: ConfigFlags -> Maybe FilePath -configHaddock :: ConfigFlags -> Maybe FilePath -configHappy :: ConfigFlags -> Maybe FilePath -configHcFlavor :: ConfigFlags -> Maybe CompilerFlavor -configHcPath :: ConfigFlags -> Maybe FilePath -configHcPkg :: ConfigFlags -> Maybe FilePath -configHsc2hs :: ConfigFlags -> Maybe FilePath -configPrefix :: ConfigFlags -> Maybe FilePath -configUser :: ConfigFlags -> Bool -configVerbose :: ConfigFlags -> Int -data Action -data Compiler -data CompilerFlavor -data ConfigFlags -instance Eq Action -instance Eq Compiler -instance Eq CompilerFlavor -instance Eq ConfigFlags -instance Read Compiler -instance Read CompilerFlavor -instance Show Action -instance Show Compiler -instance Show CompilerFlavor -instance Show ConfigFlags -parseBuildArgs :: [String] -> [OptDescr a] -> IO (Int, [a], [String]) -parseCleanArgs :: [String] -> [OptDescr a] -> IO (Int, [a], [String]) -parseConfigureArgs :: ConfigFlags -> [String] -> [OptDescr a] -> IO (ConfigFlags, [a], [String]) -parseCopyArgs :: CopyFlags -> [String] -> [OptDescr a] -> IO (CopyFlags, [a], [String]) -parseGlobalArgs :: [String] -> IO (Action, [String]) -parseHaddockArgs :: [String] -> [OptDescr a] -> IO (Int, [a], [String]) -parseInstallArgs :: InstallFlags -> [String] -> [OptDescr a] -> IO (InstallFlags, [a], [String]) -parseProgramaticaArgs :: [String] -> [OptDescr a] -> IO (Int, [a], [String]) -parseRegisterArgs :: RegisterFlags -> [String] -> [OptDescr a] -> IO (RegisterFlags, [a], [String]) -parseSDistArgs :: [String] -> [OptDescr a] -> IO (Int, [a], [String]) -parseUnregisterArgs :: RegisterFlags -> [String] -> [OptDescr a] -> IO (RegisterFlags, [a], [String]) -type CopyFlags = (Maybe FilePath, Int) -type InstallFlags = (Bool, Int) -type RegisterFlags = (Bool, Bool, Int) - -module Distribution.Simple -UserHooks :: Args -> Bool -> LocalBuildInfo -> IO ExitCode -> (IO (Maybe PackageDescription)) -> [PPSuffixHandler] -> Args -> ConfigFlags -> IO HookedBuildInfo -> Args -> ConfigFlags -> LocalBuildInfo -> IO ExitCode -> Args -> Int -> IO HookedBuildInfo -> Args -> Int -> LocalBuildInfo -> IO ExitCode -> Args -> Int -> IO HookedBuildInfo -> Args -> Int -> LocalBuildInfo -> IO ExitCode -> Args -> CopyFlags -> IO HookedBuildInfo -> Args -> CopyFlags -> LocalBuildInfo -> IO ExitCode -> Args -> InstallFlags -> IO HookedBuildInfo -> Args -> InstallFlags -> LocalBuildInfo -> IO ExitCode -> Args -> Int -> IO HookedBuildInfo -> Args -> Int -> LocalBuildInfo -> IO ExitCode -> Args -> RegisterFlags -> IO HookedBuildInfo -> Args -> RegisterFlags -> LocalBuildInfo -> IO ExitCode -> Args -> RegisterFlags -> IO HookedBuildInfo -> Args -> RegisterFlags -> LocalBuildInfo -> IO ExitCode -> Args -> Int -> IO HookedBuildInfo -> Args -> Int -> LocalBuildInfo -> IO ExitCode -> Args -> Int -> IO HookedBuildInfo -> Args -> Int -> LocalBuildInfo -> IO ExitCode -> UserHooks -data UserHooks -defaultHookedPackageDesc :: IO (Maybe FilePath) -defaultMain :: IO () -defaultMainNoRead :: PackageDescription -> IO () -defaultMainWithHooks :: UserHooks -> IO () -defaultUserHooks :: UserHooks -emptyUserHooks :: UserHooks -hookedPreProcessors :: UserHooks -> [PPSuffixHandler] -postBuild :: UserHooks -> Args -> Int -> LocalBuildInfo -> IO ExitCode -postClean :: UserHooks -> Args -> Int -> LocalBuildInfo -> IO ExitCode -postConf :: UserHooks -> Args -> ConfigFlags -> LocalBuildInfo -> IO ExitCode -postCopy :: UserHooks -> Args -> CopyFlags -> LocalBuildInfo -> IO ExitCode -postHaddock :: UserHooks -> Args -> Int -> LocalBuildInfo -> IO ExitCode -postInst :: UserHooks -> Args -> InstallFlags -> LocalBuildInfo -> IO ExitCode -postPFE :: UserHooks -> Args -> Int -> LocalBuildInfo -> IO ExitCode -postReg :: UserHooks -> Args -> RegisterFlags -> LocalBuildInfo -> IO ExitCode -postSDist :: UserHooks -> Args -> Int -> LocalBuildInfo -> IO ExitCode -postUnreg :: UserHooks -> Args -> RegisterFlags -> LocalBuildInfo -> IO ExitCode -preBuild :: UserHooks -> Args -> Int -> IO HookedBuildInfo -preClean :: UserHooks -> Args -> Int -> IO HookedBuildInfo -preConf :: UserHooks -> Args -> ConfigFlags -> IO HookedBuildInfo -preCopy :: UserHooks -> Args -> CopyFlags -> IO HookedBuildInfo -preHaddock :: UserHooks -> Args -> Int -> IO HookedBuildInfo -preInst :: UserHooks -> Args -> InstallFlags -> IO HookedBuildInfo -prePFE :: UserHooks -> Args -> Int -> IO HookedBuildInfo -preReg :: UserHooks -> Args -> RegisterFlags -> IO HookedBuildInfo -preSDist :: UserHooks -> Args -> Int -> IO HookedBuildInfo -preUnreg :: UserHooks -> Args -> RegisterFlags -> IO HookedBuildInfo -readDesc :: UserHooks -> (IO (Maybe PackageDescription)) -runTests :: UserHooks -> Args -> Bool -> LocalBuildInfo -> IO ExitCode -type Args = [String] - -module Distribution.Simple.Build -build :: PackageDescription -> LocalBuildInfo -> Int -> [PPSuffixHandler] -> IO () - -module Distribution.Simple.Configure -LocalBuildInfo :: FilePath -> Compiler -> FilePath -> [PackageIdentifier] -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> Maybe FilePath -> LocalBuildInfo -buildDir :: LocalBuildInfo -> FilePath -compiler :: LocalBuildInfo -> Compiler -configure :: PackageDescription -> ConfigFlags -> IO LocalBuildInfo -data LocalBuildInfo -findProgram :: String -> Maybe FilePath -> IO (Maybe FilePath) -getPersistBuildConfig :: IO LocalBuildInfo -instance Eq LocalBuildInfo -instance Read LocalBuildInfo -instance Show LocalBuildInfo -localBuildInfoFile :: FilePath -packageDeps :: LocalBuildInfo -> [PackageIdentifier] -prefix :: LocalBuildInfo -> FilePath -withAlex :: LocalBuildInfo -> Maybe FilePath -withCpphs :: LocalBuildInfo -> Maybe FilePath -withHaddock :: LocalBuildInfo -> Maybe FilePath -withHappy :: LocalBuildInfo -> Maybe FilePath -withHsc2hs :: LocalBuildInfo -> Maybe FilePath -writePersistBuildConfig :: LocalBuildInfo -> IO () - -module Distribution.Simple.GHCPackageConfig -GHCPackage :: String -> Bool -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> [String] -> GHCPackageConfig -auto :: GHCPackageConfig -> Bool -c_includes :: GHCPackageConfig -> [String] -canReadLocalPackageConfig :: IO Bool -canWriteLocalPackageConfig :: IO Bool -data GHCPackageConfig -defaultGHCPackageConfig :: GHCPackageConfig -extra_cc_opts :: GHCPackageConfig -> [String] -extra_frameworks :: GHCPackageConfig -> [String] -extra_ghc_opts :: GHCPackageConfig -> [String] -extra_ld_opts :: GHCPackageConfig -> [String] -extra_libraries :: GHCPackageConfig -> [String] -framework_dirs :: GHCPackageConfig -> [String] -hs_libraries :: GHCPackageConfig -> [String] -import_dirs :: GHCPackageConfig -> [String] -include_dirs :: GHCPackageConfig -> [String] -library_dirs :: GHCPackageConfig -> [String] -localPackageConfig :: IO FilePath -maybeCreateLocalPackageConfig :: IO Bool -mkGHCPackageConfig :: PackageDescription -> LocalBuildInfo -> GHCPackageConfig -name :: GHCPackageConfig -> String -package_deps :: GHCPackageConfig -> [String] -showGHCPackageConfig :: GHCPackageConfig -> String -source_dirs :: GHCPackageConfig -> [String] - -module Distribution.Simple.Install -hugsMainFilename :: Executable -> FilePath -hugsPackageDir :: PackageDescription -> LocalBuildInfo -> FilePath -hugsProgramsDirs :: PackageDescription -> LocalBuildInfo -> [FilePath] -install :: PackageDescription -> LocalBuildInfo -> (Maybe FilePath, Int) -> IO () -mkBinDir :: PackageDescription -> LocalBuildInfo -> Maybe FilePath -> FilePath -mkLibDir :: PackageDescription -> LocalBuildInfo -> Maybe FilePath -> FilePath - -module Distribution.Simple.Register -installedPkgConfigFile :: String -regScriptLocation :: FilePath -register :: PackageDescription -> LocalBuildInfo -> RegisterFlags -> IO () -removeInstalledConfig :: IO () -unregScriptLocation :: FilePath -unregister :: PackageDescription -> LocalBuildInfo -> RegisterFlags -> IO () -writeInstalledConfig :: PackageDescription -> LocalBuildInfo -> IO () - -module Distribution.Simple.SrcDist -sdist :: FilePath -> FilePath -> Int -> [PPSuffixHandler] -> PackageDescription -> IO () - -module Foreign -unsafePerformIO :: IO a -> a - -module Foreign.C.Error -Errno :: CInt -> Errno -e2BIG :: Errno -eACCES :: Errno -eADDRINUSE :: Errno -eADDRNOTAVAIL :: Errno -eADV :: Errno -eAFNOSUPPORT :: Errno -eAGAIN :: Errno -eALREADY :: Errno -eBADF :: Errno -eBADMSG :: Errno -eBADRPC :: Errno -eBUSY :: Errno -eCHILD :: Errno -eCOMM :: Errno -eCONNABORTED :: Errno -eCONNREFUSED :: Errno -eCONNRESET :: Errno -eDEADLK :: Errno -eDESTADDRREQ :: Errno -eDIRTY :: Errno -eDOM :: Errno -eDQUOT :: Errno -eEXIST :: Errno -eFAULT :: Errno -eFBIG :: Errno -eFTYPE :: Errno -eHOSTDOWN :: Errno -eHOSTUNREACH :: Errno -eIDRM :: Errno -eILSEQ :: Errno -eINPROGRESS :: Errno -eINTR :: Errno -eINVAL :: Errno -eIO :: Errno -eISCONN :: Errno -eISDIR :: Errno -eLOOP :: Errno -eMFILE :: Errno -eMLINK :: Errno -eMSGSIZE :: Errno -eMULTIHOP :: Errno -eNAMETOOLONG :: Errno -eNETDOWN :: Errno -eNETRESET :: Errno -eNETUNREACH :: Errno -eNFILE :: Errno -eNOBUFS :: Errno -eNODATA :: Errno -eNODEV :: Errno -eNOENT :: Errno -eNOEXEC :: Errno -eNOLCK :: Errno -eNOLINK :: Errno -eNOMEM :: Errno -eNOMSG :: Errno -eNONET :: Errno -eNOPROTOOPT :: Errno -eNOSPC :: Errno -eNOSR :: Errno -eNOSTR :: Errno -eNOSYS :: Errno -eNOTBLK :: Errno -eNOTCONN :: Errno -eNOTDIR :: Errno -eNOTEMPTY :: Errno -eNOTSOCK :: Errno -eNOTTY :: Errno -eNXIO :: Errno -eOK :: Errno -eOPNOTSUPP :: Errno -ePERM :: Errno -ePFNOSUPPORT :: Errno -ePIPE :: Errno -ePROCLIM :: Errno -ePROCUNAVAIL :: Errno -ePROGMISMATCH :: Errno -ePROGUNAVAIL :: Errno -ePROTO :: Errno -ePROTONOSUPPORT :: Errno -ePROTOTYPE :: Errno -eRANGE :: Errno -eREMCHG :: Errno -eREMOTE :: Errno -eROFS :: Errno -eRPCMISMATCH :: Errno -eRREMOTE :: Errno -eSHUTDOWN :: Errno -eSOCKTNOSUPPORT :: Errno -eSPIPE :: Errno -eSRCH :: Errno -eSRMNT :: Errno -eSTALE :: Errno -eTIME :: Errno -eTIMEDOUT :: Errno -eTOOMANYREFS :: Errno -eTXTBSY :: Errno -eUSERS :: Errno -eWOULDBLOCK :: Errno -eXDEV :: Errno -errnoToIOError :: String -> Errno -> Maybe Handle -> Maybe String -> IOError -getErrno :: IO Errno -instance Eq Errno -isValidErrno :: Errno -> Bool -newtype Errno -resetErrno :: IO () -throwErrno :: String -> IO a -throwErrnoIf :: (a -> Bool) -> String -> IO a -> IO a -throwErrnoIfMinus1 :: Num a => String -> IO a -> IO a -throwErrnoIfMinus1Retry :: Num a => String -> IO a -> IO a -throwErrnoIfMinus1RetryMayBlock :: Num a => String -> IO a -> IO b -> IO a -throwErrnoIfMinus1RetryMayBlock_ :: Num a => String -> IO a -> IO b -> IO () -throwErrnoIfMinus1Retry_ :: Num a => String -> IO a -> IO () -throwErrnoIfMinus1_ :: Num a => String -> IO a -> IO () -throwErrnoIfNull :: String -> IO (Ptr a) -> IO (Ptr a) -throwErrnoIfNullRetry :: String -> IO (Ptr a) -> IO (Ptr a) -throwErrnoIfNullRetryMayBlock :: String -> IO (Ptr a) -> IO b -> IO (Ptr a) -throwErrnoIfRetry :: (a -> Bool) -> String -> IO a -> IO a -throwErrnoIfRetryMayBlock :: (a -> Bool) -> String -> IO a -> IO b -> IO a -throwErrnoIfRetryMayBlock_ :: (a -> Bool) -> String -> IO a -> IO b -> IO () -throwErrnoIfRetry_ :: (a -> Bool) -> String -> IO a -> IO () -throwErrnoIf_ :: (a -> Bool) -> String -> IO a -> IO () - -module Foreign.C.String -castCCharToChar :: CChar -> Char -castCharToCChar :: Char -> CChar -charIsRepresentable :: Char -> IO Bool -newCAString :: String -> IO CString -newCAStringLen :: String -> IO CStringLen -newCString :: String -> IO CString -newCStringLen :: String -> IO CStringLen -newCWString :: String -> IO CWString -newCWStringLen :: String -> IO CWStringLen -peekCAString :: CString -> IO String -peekCAStringLen :: CStringLen -> IO String -peekCString :: CString -> IO String -peekCStringLen :: CStringLen -> IO String -peekCWString :: CWString -> IO String -peekCWStringLen :: CWStringLen -> IO String -type CString = Ptr CChar -type CStringLen = (Ptr CChar, Int) -type CWString = Ptr CWchar -type CWStringLen = (Ptr CWchar, Int) -withCAString :: String -> (CString -> IO a) -> IO a -withCAStringLen :: String -> (CStringLen -> IO a) -> IO a -withCString :: String -> (CString -> IO a) -> IO a -withCStringLen :: String -> (CStringLen -> IO a) -> IO a -withCWString :: String -> (CWString -> IO a) -> IO a -withCWStringLen :: String -> (CWStringLen -> IO a) -> IO a - -module Foreign.C.Types -data CChar -data CClock -data CDouble -data CFile -data CFloat -data CFpos -data CInt -data CJmpBuf -data CLDouble -data CLLong -data CLong -data CPtrdiff -data CSChar -data CShort -data CSigAtomic -data CSize -data CTime -data CUChar -data CUInt -data CULLong -data CULong -data CUShort -data CWchar -instance Bits CChar -instance Bits CInt -instance Bits CLLong -instance Bits CLong -instance Bits CPtrdiff -instance Bits CSChar -instance Bits CShort -instance Bits CSigAtomic -instance Bits CSize -instance Bits CUChar -instance Bits CUInt -instance Bits CULLong -instance Bits CULong -instance Bits CUShort -instance Bits CWchar -instance Bounded CChar -instance Bounded CInt -instance Bounded CLLong -instance Bounded CLong -instance Bounded CPtrdiff -instance Bounded CSChar -instance Bounded CShort -instance Bounded CSigAtomic -instance Bounded CSize -instance Bounded CUChar -instance Bounded CUInt -instance Bounded CULLong -instance Bounded CULong -instance Bounded CUShort -instance Bounded CWchar -instance Enum CChar -instance Enum CClock -instance Enum CDouble -instance Enum CFloat -instance Enum CInt -instance Enum CLDouble -instance Enum CLLong -instance Enum CLong -instance Enum CPtrdiff -instance Enum CSChar -instance Enum CShort -instance Enum CSigAtomic -instance Enum CSize -instance Enum CTime -instance Enum CUChar -instance Enum CUInt -instance Enum CULLong -instance Enum CULong -instance Enum CUShort -instance Enum CWchar -instance Eq CChar -instance Eq CClock -instance Eq CDouble -instance Eq CFloat -instance Eq CInt -instance Eq CLDouble -instance Eq CLLong -instance Eq CLong -instance Eq CPtrdiff -instance Eq CSChar -instance Eq CShort -instance Eq CSigAtomic -instance Eq CSize -instance Eq CTime -instance Eq CUChar -instance Eq CUInt -instance Eq CULLong -instance Eq CULong -instance Eq CUShort -instance Eq CWchar -instance Floating CDouble -instance Floating CFloat -instance Floating CLDouble -instance Fractional CDouble -instance Fractional CFloat -instance Fractional CLDouble -instance Integral CChar -instance Integral CInt -instance Integral CLLong -instance Integral CLong -instance Integral CPtrdiff -instance Integral CSChar -instance Integral CShort -instance Integral CSigAtomic -instance Integral CSize -instance Integral CUChar -instance Integral CUInt -instance Integral CULLong -instance Integral CULong -instance Integral CUShort -instance Integral CWchar -instance Num CChar -instance Num CClock -instance Num CDouble -instance Num CFloat -instance Num CInt -instance Num CLDouble -instance Num CLLong -instance Num CLong -instance Num CPtrdiff -instance Num CSChar -instance Num CShort -instance Num CSigAtomic -instance Num CSize -instance Num CTime -instance Num CUChar -instance Num CUInt -instance Num CULLong -instance Num CULong -instance Num CUShort -instance Num CWchar -instance Ord CChar -instance Ord CClock -instance Ord CDouble -instance Ord CFloat -instance Ord CInt -instance Ord CLDouble -instance Ord CLLong -instance Ord CLong -instance Ord CPtrdiff -instance Ord CSChar -instance Ord CShort -instance Ord CSigAtomic -instance Ord CSize -instance Ord CTime -instance Ord CUChar -instance Ord CUInt -instance Ord CULLong -instance Ord CULong -instance Ord CUShort -instance Ord CWchar -instance Read CChar -instance Read CClock -instance Read CDouble -instance Read CFloat -instance Read CInt -instance Read CLDouble -instance Read CLLong -instance Read CLong -instance Read CPtrdiff -instance Read CSChar -instance Read CShort -instance Read CSigAtomic -instance Read CSize -instance Read CTime -instance Read CUChar -instance Read CUInt -instance Read CULLong -instance Read CULong -instance Read CUShort -instance Read CWchar -instance Real CChar -instance Real CClock -instance Real CDouble -instance Real CFloat -instance Real CInt -instance Real CLDouble -instance Real CLLong -instance Real CLong -instance Real CPtrdiff -instance Real CSChar -instance Real CShort -instance Real CSigAtomic -instance Real CSize -instance Real CTime -instance Real CUChar -instance Real CUInt -instance Real CULLong -instance Real CULong -instance Real CUShort -instance Real CWchar -instance RealFloat CDouble -instance RealFloat CFloat -instance RealFloat CLDouble -instance RealFrac CDouble -instance RealFrac CFloat -instance RealFrac CLDouble -instance Show CChar -instance Show CClock -instance Show CDouble -instance Show CFloat -instance Show CInt -instance Show CLDouble -instance Show CLLong -instance Show CLong -instance Show CPtrdiff -instance Show CSChar -instance Show CShort -instance Show CSigAtomic -instance Show CSize -instance Show CTime -instance Show CUChar -instance Show CUInt -instance Show CULLong -instance Show CULong -instance Show CUShort -instance Show CWchar -instance Storable CChar -instance Storable CClock -instance Storable CDouble -instance Storable CFloat -instance Storable CInt -instance Storable CLDouble -instance Storable CLLong -instance Storable CLong -instance Storable CPtrdiff -instance Storable CSChar -instance Storable CShort -instance Storable CSigAtomic -instance Storable CSize -instance Storable CTime -instance Storable CUChar -instance Storable CUInt -instance Storable CULLong -instance Storable CULong -instance Storable CUShort -instance Storable CWchar -instance Typeable CChar -instance Typeable CClock -instance Typeable CDouble -instance Typeable CFloat -instance Typeable CInt -instance Typeable CLDouble -instance Typeable CLLong -instance Typeable CLong -instance Typeable CPtrdiff -instance Typeable CSChar -instance Typeable CShort -instance Typeable CSigAtomic -instance Typeable CSize -instance Typeable CTime -instance Typeable CUChar -instance Typeable CUInt -instance Typeable CULLong -instance Typeable CULong -instance Typeable CUShort -instance Typeable CWchar - -module Foreign.Concurrent -addForeignPtrFinalizer :: ForeignPtr a -> IO () -> IO () -newForeignPtr :: Ptr a -> IO () -> IO (ForeignPtr a) - -module Foreign.ForeignPtr -addForeignPtrFinalizer :: FinalizerPtr a -> ForeignPtr a -> IO () -castForeignPtr :: ForeignPtr a -> ForeignPtr b -data ForeignPtr a -finalizeForeignPtr :: ForeignPtr a -> IO () -instance Eq (ForeignPtr a) -instance Ord (ForeignPtr a) -instance Show (ForeignPtr a) -instance Typeable a => Data (ForeignPtr a) -instance Typeable1 ForeignPtr -mallocForeignPtr :: Storable a => IO (ForeignPtr a) -mallocForeignPtrArray :: Storable a => Int -> IO (ForeignPtr a) -mallocForeignPtrArray0 :: Storable a => Int -> IO (ForeignPtr a) -mallocForeignPtrBytes :: Int -> IO (ForeignPtr a) -newForeignPtr :: FinalizerPtr a -> Ptr a -> IO (ForeignPtr a) -newForeignPtr_ :: Ptr a -> IO (ForeignPtr a) -touchForeignPtr :: ForeignPtr a -> IO () -type FinalizerPtr a = FunPtr (Ptr a -> IO ()) -unsafeForeignPtrToPtr :: ForeignPtr a -> Ptr a -withForeignPtr :: ForeignPtr a -> (Ptr a -> IO b) -> IO b - -module Foreign.Marshal.Alloc -alloca :: Storable a => (Ptr a -> IO b) -> IO b -allocaBytes :: Int -> (Ptr a -> IO b) -> IO b -finalizerFree :: FinalizerPtr a -free :: Ptr a -> IO () -malloc :: Storable a => IO (Ptr a) -mallocBytes :: Int -> IO (Ptr a) -realloc :: Storable b => Ptr a -> IO (Ptr b) -reallocBytes :: Ptr a -> Int -> IO (Ptr a) - -module Foreign.Marshal.Array -advancePtr :: Storable a => Ptr a -> Int -> Ptr a -allocaArray :: Storable a => Int -> (Ptr a -> IO b) -> IO b -allocaArray0 :: Storable a => Int -> (Ptr a -> IO b) -> IO b -copyArray :: Storable a => Ptr a -> Ptr a -> Int -> IO () -lengthArray0 :: (Storable a, Eq a) => a -> Ptr a -> IO Int -mallocArray :: Storable a => Int -> IO (Ptr a) -mallocArray0 :: Storable a => Int -> IO (Ptr a) -moveArray :: Storable a => Ptr a -> Ptr a -> Int -> IO () -newArray :: Storable a => [a] -> IO (Ptr a) -newArray0 :: Storable a => a -> [a] -> IO (Ptr a) -peekArray :: Storable a => Int -> Ptr a -> IO [a] -peekArray0 :: (Storable a, Eq a) => a -> Ptr a -> IO [a] -pokeArray :: Storable a => Ptr a -> [a] -> IO () -pokeArray0 :: Storable a => a -> Ptr a -> [a] -> IO () -reallocArray :: Storable a => Ptr a -> Int -> IO (Ptr a) -reallocArray0 :: Storable a => Ptr a -> Int -> IO (Ptr a) -withArray :: Storable a => [a] -> (Ptr a -> IO b) -> IO b -withArray0 :: Storable a => a -> [a] -> (Ptr a -> IO b) -> IO b -withArrayLen :: Storable a => [a] -> (Int -> Ptr a -> IO b) -> IO b -withArrayLen0 :: Storable a => a -> [a] -> (Int -> Ptr a -> IO b) -> IO b - -module Foreign.Marshal.Error -throwIf :: (a -> Bool) -> (a -> String) -> IO a -> IO a -throwIfNeg :: (Ord a, Num a) => (a -> String) -> IO a -> IO a -throwIfNeg_ :: (Ord a, Num a) => (a -> String) -> IO a -> IO () -throwIfNull :: String -> IO (Ptr a) -> IO (Ptr a) -throwIf_ :: (a -> Bool) -> (a -> String) -> IO a -> IO () -void :: IO a -> IO () - -module Foreign.Marshal.Pool -data Pool -freePool :: Pool -> IO () -newPool :: IO Pool -pooledMalloc :: Storable a => Pool -> IO (Ptr a) -pooledMallocArray :: Storable a => Pool -> Int -> IO (Ptr a) -pooledMallocArray0 :: Storable a => Pool -> Int -> IO (Ptr a) -pooledMallocBytes :: Pool -> Int -> IO (Ptr a) -pooledNew :: Storable a => Pool -> a -> IO (Ptr a) -pooledNewArray :: Storable a => Pool -> [a] -> IO (Ptr a) -pooledNewArray0 :: Storable a => Pool -> a -> [a] -> IO (Ptr a) -pooledRealloc :: Storable a => Pool -> Ptr a -> IO (Ptr a) -pooledReallocArray :: Storable a => Pool -> Ptr a -> Int -> IO (Ptr a) -pooledReallocArray0 :: Storable a => Pool -> Ptr a -> Int -> IO (Ptr a) -pooledReallocBytes :: Pool -> Ptr a -> Int -> IO (Ptr a) -withPool :: (Pool -> IO b) -> IO b - -module Foreign.Marshal.Utils -copyBytes :: Ptr a -> Ptr a -> Int -> IO () -fromBool :: Num a => Bool -> a -maybeNew :: (a -> IO (Ptr a)) -> Maybe a -> IO (Ptr a) -maybePeek :: (Ptr a -> IO b) -> Ptr a -> IO (Maybe b) -maybeWith :: (a -> (Ptr b -> IO c) -> IO c) -> Maybe a -> (Ptr b -> IO c) -> IO c -moveBytes :: Ptr a -> Ptr a -> Int -> IO () -new :: Storable a => a -> IO (Ptr a) -toBool :: Num a => a -> Bool -with :: Storable a => a -> (Ptr a -> IO b) -> IO b -withMany :: (a -> (b -> res) -> res) -> [a] -> ([b] -> res) -> res -withObject :: Storable a => a -> (Ptr a -> IO b) -> IO b - -module Foreign.Ptr -alignPtr :: Ptr a -> Int -> Ptr a -castFunPtr :: FunPtr a -> FunPtr b -castFunPtrToPtr :: FunPtr a -> Ptr b -castPtr :: Ptr a -> Ptr b -castPtrToFunPtr :: Ptr a -> FunPtr b -data FunPtr a -data Ptr a -freeHaskellFunPtr :: FunPtr a -> IO () -instance Eq (FunPtr a) -instance Eq (Ptr a) -instance IArray (IOToDiffArray IOUArray) (FunPtr a) -instance IArray (IOToDiffArray IOUArray) (Ptr a) -instance IArray UArray (FunPtr a) -instance IArray UArray (Ptr a) -instance Ix ix => Eq (UArray ix (FunPtr a)) -instance Ix ix => Eq (UArray ix (Ptr a)) -instance Ix ix => Ord (UArray ix (FunPtr a)) -instance Ix ix => Ord (UArray ix (Ptr a)) -instance MArray (STUArray s) (FunPtr a) (ST s) -instance MArray (STUArray s) (Ptr a) (ST s) -instance Ord (FunPtr a) -instance Ord (Ptr a) -instance Show (FunPtr a) -instance Show (Ptr a) -instance Storable (FunPtr a) -instance Storable (Ptr a) -instance Typeable a => Data (Ptr a) -instance Typeable1 FunPtr -instance Typeable1 Ptr -minusPtr :: Ptr a -> Ptr b -> Int -nullFunPtr :: FunPtr a -nullPtr :: Ptr a -plusPtr :: Ptr a -> Int -> Ptr b - -module Foreign.StablePtr -castPtrToStablePtr :: Ptr () -> StablePtr a -castStablePtrToPtr :: StablePtr a -> Ptr () -data StablePtr a -deRefStablePtr :: StablePtr a -> IO a -freeStablePtr :: StablePtr a -> IO () -instance Eq (StablePtr a) -instance IArray (IOToDiffArray IOUArray) (StablePtr a) -instance IArray UArray (StablePtr a) -instance Ix ix => Eq (UArray ix (StablePtr a)) -instance MArray (STUArray s) (StablePtr a) (ST s) -instance Storable (StablePtr a) -instance Typeable a => Data (StablePtr a) -instance Typeable1 StablePtr -newStablePtr :: a -> IO (StablePtr a) - -module Foreign.Storable -alignment :: Storable a => a -> Int -class Storable a -peek :: Storable a => Ptr a -> IO a -peekByteOff :: Storable a => Ptr b -> Int -> IO a -peekElemOff :: Storable a => Ptr a -> Int -> IO a -poke :: Storable a => Ptr a -> a -> IO () -pokeByteOff :: Storable a => Ptr b -> Int -> a -> IO () -pokeElemOff :: Storable a => Ptr a -> Int -> a -> IO () -sizeOf :: Storable a => a -> Int - -module GHC.Conc -ThreadId :: ThreadId# -> ThreadId -addMVarFinalizer :: MVar a -> IO () -> IO () -asyncDoProc :: FunPtr (Ptr a -> IO Int) -> Ptr a -> IO Int -asyncRead :: Int -> Int -> Int -> Ptr a -> IO (Int, Int) -asyncReadBA :: Int -> Int -> Int -> Int -> MutableByteArray# RealWorld -> IO (Int, Int) -asyncWrite :: Int -> Int -> Int -> Ptr a -> IO (Int, Int) -asyncWriteBA :: Int -> Int -> Int -> Int -> MutableByteArray# RealWorld -> IO (Int, Int) -atomically :: STM a -> IO a -catchSTM :: STM a -> (Exception -> STM a) -> STM a -data MVar a -data STM a -data TVar a -instance ??? a => Typeable (STM a) -instance ??? a => Typeable (TVar a) -instance Eq (MVar a) -instance Eq (TVar a) -instance Functor STM -instance Monad STM -instance Typeable a => Data (MVar a) -instance Typeable a => Data (STM a) -instance Typeable a => Data (TVar a) -instance Typeable1 MVar -isEmptyMVar :: MVar a -> IO Bool -labelThread :: ThreadId -> String -> IO () -newEmptyMVar :: IO (MVar a) -newMVar :: a -> IO (MVar a) -newTVar :: a -> STM (TVar a) -orElse :: STM a -> STM a -> STM a -pseq :: a -> b -> b -putMVar :: MVar a -> a -> IO () -readTVar :: TVar a -> STM a -retry :: STM a -takeMVar :: MVar a -> IO a -tryPutMVar :: MVar a -> a -> IO Bool -tryTakeMVar :: MVar a -> IO (Maybe a) -unsafeIOToSTM :: IO a -> STM a -writeTVar :: TVar a -> a -> STM () - -module GHC.ConsoleHandler -Break :: ConsoleEvent -Catch :: (ConsoleEvent -> IO ()) -> Handler -Close :: ConsoleEvent -ControlC :: ConsoleEvent -Default :: Handler -Ignore :: Handler -Logoff :: ConsoleEvent -Shutdown :: ConsoleEvent -data ConsoleEvent -data Handler -flushConsole :: Handle -> IO () -installHandler :: Handler -> IO Handler - -module GHC.Dotnet -checkResult :: (State# RealWorld -> (#State# RealWorld, a, Addr##)) -> IO a -data Object a -marshalObject :: Object a -> (Addr# -> IO b) -> IO b -marshalString :: String -> (Addr# -> IO a) -> IO a -unmarshalObject :: Addr# -> Object a -unmarshalString :: Addr# -> String - -module GHC.Exts -C# :: Char# -> Char -D# :: Double# -> Double -F# :: Float# -> Float -FunPtr :: Addr# -> FunPtr a -I# :: Int# -> Int -J# :: Int# -> ByteArray# -> Integer -Ptr :: Addr# -> Ptr a -S# :: Int# -> Integer -W# :: Word# -> Word -augment :: ((a -> b -> b) -> b -> b) -> [a] -> [a] -build :: ((a -> b -> b) -> b -> b) -> [a] -class Splittable t -iShiftL# :: Int# -> Int# -> Int# -iShiftRA# :: Int# -> Int# -> Int# -iShiftRL# :: Int# -> Int# -> Int# -shiftL# :: Word# -> Int# -> Word# -shiftRL# :: Word# -> Int# -> Word# -split :: Splittable t => t -> (t,t) - -module GHC.Unicode -isAsciiLower :: Char -> Bool -isAsciiUpper :: Char -> Bool - -module IO -bracket :: IO a -> (a -> IO b) -> (a -> IO c) -> IO c -bracket_ :: IO a -> (a -> IO b) -> IO c -> IO c -hClose :: Handle -> IO () -hFileSize :: Handle -> IO Integer -hFlush :: Handle -> IO () -hGetBuffering :: Handle -> IO BufferMode -hGetChar :: Handle -> IO Char -hGetContents :: Handle -> IO String -hGetLine :: Handle -> IO String -hGetPosn :: Handle -> IO HandlePosn -hIsClosed :: Handle -> IO Bool -hIsEOF :: Handle -> IO Bool -hIsOpen :: Handle -> IO Bool -hIsReadable :: Handle -> IO Bool -hIsSeekable :: Handle -> IO Bool -hIsWritable :: Handle -> IO Bool -hLookAhead :: Handle -> IO Char -hPrint :: Show a => Handle -> a -> IO () -hPutChar :: Handle -> Char -> IO () -hPutStr :: Handle -> String -> IO () -hPutStrLn :: Handle -> String -> IO () -hReady :: Handle -> IO Bool -hSeek :: Handle -> SeekMode -> Integer -> IO () -hSetBuffering :: Handle -> BufferMode -> IO () -hSetPosn :: HandlePosn -> IO () -hWaitForInput :: Handle -> Int -> IO Bool -ioeGetErrorString :: IOError -> String -ioeGetFileName :: IOError -> Maybe FilePath -ioeGetHandle :: IOError -> Maybe Handle -isAlreadyExistsError :: IOError -> Bool -isAlreadyInUseError :: IOError -> Bool -isDoesNotExistError :: IOError -> Bool -isEOF :: IO Bool -isEOFError :: IOError -> Bool -isFullError :: IOError -> Bool -isIllegalOperation :: IOError -> Bool -isPermissionError :: IOError -> Bool -isUserError :: IOError -> Bool -openFile :: FilePath -> IOMode -> IO Handle -stderr :: Handle -stdin :: Handle -stdout :: Handle -try :: IO a -> IO (Either IOError a) - -module Ix -inRange :: Ix a => (a,a) -> a -> Bool -index :: Ix a => (a,a) -> a -> Int -range :: Ix a => (a,a) -> [a] -rangeSize :: Ix a => (a,a) -> Int - -module Language.Haskell.Parser -ParseFailed :: SrcLoc -> String -> ParseResult a -ParseMode :: String -> ParseMode -data ParseMode -defaultParseMode :: ParseMode -parseFilename :: ParseMode -> String -parseModule :: String -> ParseResult HsModule -parseModuleWithMode :: ParseMode -> String -> ParseResult HsModule - -module Language.Haskell.Syntax -HsAlt :: SrcLoc -> HsPat -> HsGuardedAlts -> [HsDecl] -> HsAlt -HsApp :: HsExp -> HsExp -> HsExp -HsAsPat :: HsName -> HsExp -> HsExp -HsAssocLeft :: HsAssoc -HsAssocNone :: HsAssoc -HsAssocRight :: HsAssoc -HsBangedTy :: HsType -> HsBangType -HsCase :: HsExp -> [HsAlt] -> HsExp -HsChar :: Char -> HsLiteral -HsCharPrim :: Char -> HsLiteral -HsClassDecl :: SrcLoc -> HsContext -> HsName -> [HsName] -> [HsDecl] -> HsDecl -HsCon :: HsQName -> HsExp -HsConDecl :: SrcLoc -> HsName -> [HsBangType] -> HsConDecl -HsConName :: HsName -> HsCName -HsConOp :: HsName -> HsOp -HsCons :: HsSpecialCon -HsDataDecl :: SrcLoc -> HsContext -> HsName -> [HsName] -> [HsConDecl] -> [HsQName] -> HsDecl -HsDefaultDecl :: SrcLoc -> [HsType] -> HsDecl -HsDo :: [HsStmt] -> HsExp -HsDoublePrim :: Rational -> HsLiteral -HsEAbs :: HsQName -> HsExportSpec -HsEModuleContents :: Module -> HsExportSpec -HsEThingAll :: HsQName -> HsExportSpec -HsEThingWith :: HsQName -> [HsCName] -> HsExportSpec -HsEVar :: HsQName -> HsExportSpec -HsEnumFrom :: HsExp -> HsExp -HsEnumFromThen :: HsExp -> HsExp -> HsExp -HsEnumFromThenTo :: HsExp -> HsExp -> HsExp -> HsExp -HsEnumFromTo :: HsExp -> HsExp -> HsExp -HsExpTypeSig :: SrcLoc -> HsExp -> HsQualType -> HsExp -HsFieldUpdate :: HsQName -> HsExp -> HsFieldUpdate -HsFloatPrim :: Rational -> HsLiteral -HsFrac :: Rational -> HsLiteral -HsFunBind :: [HsMatch] -> HsDecl -HsFunCon :: HsSpecialCon -HsGenerator :: SrcLoc -> HsPat -> HsExp -> HsStmt -HsGuardedAlt :: SrcLoc -> HsExp -> HsExp -> HsGuardedAlt -HsGuardedAlts :: [HsGuardedAlt] -> HsGuardedAlts -HsGuardedRhs :: SrcLoc -> HsExp -> HsExp -> HsGuardedRhs -HsGuardedRhss :: [HsGuardedRhs] -> HsRhs -HsIAbs :: HsName -> HsImportSpec -HsIThingAll :: HsName -> HsImportSpec -HsIThingWith :: HsName -> [HsCName] -> HsImportSpec -HsIVar :: HsName -> HsImportSpec -HsIdent :: String -> HsName -HsIf :: HsExp -> HsExp -> HsExp -> HsExp -HsImportDecl :: SrcLoc -> Module -> Bool -> Maybe Module -> (Maybe (Bool,[HsImportSpec])) -> HsImportDecl -HsInfixApp :: HsExp -> HsQOp -> HsExp -> HsExp -HsInfixDecl :: SrcLoc -> HsAssoc -> Int -> [HsOp] -> HsDecl -HsInstDecl :: SrcLoc -> HsContext -> HsQName -> [HsType] -> [HsDecl] -> HsDecl -HsInt :: Integer -> HsLiteral -HsIntPrim :: Integer -> HsLiteral -HsIrrPat :: HsExp -> HsExp -HsLambda :: SrcLoc -> [HsPat] -> HsExp -> HsExp -HsLeftSection :: HsExp -> HsQOp -> HsExp -HsLet :: [HsDecl] -> HsExp -> HsExp -HsLetStmt :: [HsDecl] -> HsStmt -HsList :: [HsExp] -> HsExp -HsListComp :: HsExp -> [HsStmt] -> HsExp -HsListCon :: HsSpecialCon -HsLit :: HsLiteral -> HsExp -HsMatch :: SrcLoc -> HsName -> [HsPat] -> HsRhs -> [HsDecl] -> HsMatch -HsModule :: SrcLoc -> Module -> (Maybe [HsExportSpec]) -> [HsImportDecl] -> [HsDecl] -> HsModule -HsNegApp :: HsExp -> HsExp -HsNewTypeDecl :: SrcLoc -> HsContext -> HsName -> [HsName] -> HsConDecl -> [HsQName] -> HsDecl -HsPApp :: HsQName -> [HsPat] -> HsPat -HsPAsPat :: HsName -> HsPat -> HsPat -HsPFieldPat :: HsQName -> HsPat -> HsPatField -HsPInfixApp :: HsPat -> HsQName -> HsPat -> HsPat -HsPIrrPat :: HsPat -> HsPat -HsPList :: [HsPat] -> HsPat -HsPLit :: HsLiteral -> HsPat -HsPNeg :: HsPat -> HsPat -HsPParen :: HsPat -> HsPat -HsPRec :: HsQName -> [HsPatField] -> HsPat -HsPTuple :: [HsPat] -> HsPat -HsPVar :: HsName -> HsPat -HsPWildCard :: HsPat -HsParen :: HsExp -> HsExp -HsPatBind :: SrcLoc -> HsPat -> HsRhs -> [HsDecl] -> HsDecl -HsQConOp :: HsQName -> HsQOp -HsQVarOp :: HsQName -> HsQOp -HsQualType :: HsContext -> HsType -> HsQualType -HsQualifier :: HsExp -> HsStmt -HsRecConstr :: HsQName -> [HsFieldUpdate] -> HsExp -HsRecDecl :: SrcLoc -> HsName -> [([HsName],HsBangType)] -> HsConDecl -HsRecUpdate :: HsExp -> [HsFieldUpdate] -> HsExp -HsRightSection :: HsQOp -> HsExp -> HsExp -HsString :: String -> HsLiteral -HsStringPrim :: String -> HsLiteral -HsSymbol :: String -> HsName -HsTuple :: [HsExp] -> HsExp -HsTupleCon :: Int -> HsSpecialCon -HsTyApp :: HsType -> HsType -> HsType -HsTyCon :: HsQName -> HsType -HsTyFun :: HsType -> HsType -> HsType -HsTyTuple :: [HsType] -> HsType -HsTyVar :: HsName -> HsType -HsTypeDecl :: SrcLoc -> HsName -> [HsName] -> HsType -> HsDecl -HsTypeSig :: SrcLoc -> [HsName] -> HsQualType -> HsDecl -HsUnBangedTy :: HsType -> HsBangType -HsUnGuardedAlt :: HsExp -> HsGuardedAlts -HsUnGuardedRhs :: HsExp -> HsRhs -HsUnitCon :: HsSpecialCon -HsVar :: HsQName -> HsExp -HsVarName :: HsName -> HsCName -HsVarOp :: HsName -> HsOp -HsWildCard :: HsExp -Module :: String -> Module -Qual :: Module -> HsName -> HsQName -Special :: HsSpecialCon -> HsQName -SrcLoc :: String -> Int -> Int -> SrcLoc -UnQual :: HsName -> HsQName -as_name :: HsName -data HsAlt -data HsAssoc -data HsBangType -data HsCName -data HsConDecl -data HsDecl -data HsExp -data HsExportSpec -data HsFieldUpdate -data HsGuardedAlt -data HsGuardedAlts -data HsGuardedRhs -data HsImportDecl -data HsImportSpec -data HsLiteral -data HsMatch -data HsModule -data HsName -data HsOp -data HsPat -data HsPatField -data HsQName -data HsQOp -data HsQualType -data HsRhs -data HsSpecialCon -data HsStmt -data HsType -data SrcLoc -fun_tycon :: HsType -fun_tycon_name :: HsQName -hiding_name :: HsName -importAs :: HsImportDecl -> Maybe Module -importLoc :: HsImportDecl -> SrcLoc -importModule :: HsImportDecl -> Module -importQualified :: HsImportDecl -> Bool -importSpecs :: HsImportDecl -> (Maybe (Bool,[HsImportSpec])) -instance Data HsAlt -instance Data HsAssoc -instance Data HsBangType -instance Data HsCName -instance Data HsConDecl -instance Data HsDecl -instance Data HsExp -instance Data HsExportSpec -instance Data HsFieldUpdate -instance Data HsGuardedAlt -instance Data HsGuardedAlts -instance Data HsGuardedRhs -instance Data HsImportDecl -instance Data HsImportSpec -instance Data HsLiteral -instance Data HsMatch -instance Data HsModule -instance Data HsName -instance Data HsOp -instance Data HsPat -instance Data HsPatField -instance Data HsQName -instance Data HsQOp -instance Data HsQualType -instance Data HsRhs -instance Data HsSpecialCon -instance Data HsStmt -instance Data HsType -instance Data Module -instance Data SrcLoc -instance Eq HsAlt -instance Eq HsAssoc -instance Eq HsBangType -instance Eq HsCName -instance Eq HsConDecl -instance Eq HsDecl -instance Eq HsExp -instance Eq HsExportSpec -instance Eq HsFieldUpdate -instance Eq HsGuardedAlt -instance Eq HsGuardedAlts -instance Eq HsGuardedRhs -instance Eq HsImportDecl -instance Eq HsImportSpec -instance Eq HsLiteral -instance Eq HsMatch -instance Eq HsName -instance Eq HsOp -instance Eq HsPat -instance Eq HsPatField -instance Eq HsQName -instance Eq HsQOp -instance Eq HsQualType -instance Eq HsRhs -instance Eq HsSpecialCon -instance Eq HsStmt -instance Eq HsType -instance Eq Module -instance Eq SrcLoc -instance Ord HsCName -instance Ord HsName -instance Ord HsOp -instance Ord HsQName -instance Ord HsQOp -instance Ord HsSpecialCon -instance Ord Module -instance Ord SrcLoc -instance Pretty HsAlt -instance Pretty HsAssoc -instance Pretty HsBangType -instance Pretty HsCName -instance Pretty HsConDecl -instance Pretty HsDecl -instance Pretty HsExp -instance Pretty HsExportSpec -instance Pretty HsFieldUpdate -instance Pretty HsGuardedAlt -instance Pretty HsGuardedAlts -instance Pretty HsGuardedRhs -instance Pretty HsImportDecl -instance Pretty HsImportSpec -instance Pretty HsLiteral -instance Pretty HsMatch -instance Pretty HsModule -instance Pretty HsName -instance Pretty HsOp -instance Pretty HsPat -instance Pretty HsPatField -instance Pretty HsQName -instance Pretty HsQOp -instance Pretty HsQualType -instance Pretty HsRhs -instance Pretty HsStmt -instance Pretty HsType -instance Pretty Module -instance Show HsAlt -instance Show HsAssoc -instance Show HsBangType -instance Show HsCName -instance Show HsConDecl -instance Show HsDecl -instance Show HsExp -instance Show HsExportSpec -instance Show HsFieldUpdate -instance Show HsGuardedAlt -instance Show HsGuardedAlts -instance Show HsGuardedRhs -instance Show HsImportDecl -instance Show HsImportSpec -instance Show HsLiteral -instance Show HsMatch -instance Show HsModule -instance Show HsName -instance Show HsOp -instance Show HsPat -instance Show HsPatField -instance Show HsQName -instance Show HsQOp -instance Show HsQualType -instance Show HsRhs -instance Show HsSpecialCon -instance Show HsStmt -instance Show HsType -instance Show Module -instance Show SrcLoc -instance Typeable HsAlt -instance Typeable HsAssoc -instance Typeable HsBangType -instance Typeable HsCName -instance Typeable HsConDecl -instance Typeable HsDecl -instance Typeable HsExp -instance Typeable HsExportSpec -instance Typeable HsFieldUpdate -instance Typeable HsGuardedAlt -instance Typeable HsGuardedAlts -instance Typeable HsGuardedRhs -instance Typeable HsImportDecl -instance Typeable HsImportSpec -instance Typeable HsLiteral -instance Typeable HsMatch -instance Typeable HsModule -instance Typeable HsName -instance Typeable HsOp -instance Typeable HsPat -instance Typeable HsPatField -instance Typeable HsQName -instance Typeable HsQOp -instance Typeable HsQualType -instance Typeable HsRhs -instance Typeable HsSpecialCon -instance Typeable HsStmt -instance Typeable HsType -instance Typeable Module -instance Typeable SrcLoc -list_cons_name :: HsQName -list_tycon :: HsType -list_tycon_name :: HsQName -main_mod :: Module -main_name :: HsName -minus_name :: HsName -newtype Module -pling_name :: HsName -prelude_mod :: Module -qualified_name :: HsName -srcColumn :: SrcLoc -> Int -srcFilename :: SrcLoc -> String -srcLine :: SrcLoc -> Int -tuple_con :: Int -> HsExp -tuple_con_name :: Int -> HsQName -tuple_tycon :: Int -> HsType -tuple_tycon_name :: Int -> HsQName -type HsAsst = (HsQName, [HsType]) -type HsContext = [HsAsst] -unit_con :: HsExp -unit_con_name :: HsQName -unit_tycon :: HsType -unit_tycon_name :: HsQName - -module Language.Haskell.TH -AppE :: Exp -> Exp -> Exp -AppT :: Type -> Type -> Type -ArithSeqE :: Range -> Exp -ArrowT :: Type -AsP :: Name -> Pat -> Pat -BindS :: Pat -> Exp -> Stmt -CCall :: Callconv -CaseE :: Exp -> [Match] -> Exp -CharL :: Char -> Lit -ClassD :: Cxt -> Name -> [Name] -> [FunDep] -> [Dec] -> Dec -ClassI :: Dec -> Info -ClassOpI :: Name -> Type -> Name -> Fixity -> Info -Clause :: [Pat] -> Body -> [Dec] -> Clause -CompE :: [Stmt] -> Exp -ConE :: Name -> Exp -ConP :: Name -> [Pat] -> Pat -ConT :: Name -> Type -CondE :: Exp -> Exp -> Exp -> Exp -DataConI :: Name -> Type -> Name -> Fixity -> Info -DataD :: Cxt -> Name -> [Name] -> [Con] -> [Name] -> Dec -DoE :: [Stmt] -> Exp -DoublePrimL :: Rational -> Lit -ExportF :: Callconv -> String -> Name -> Type -> Foreign -Fixity :: Int -> FixityDirection -> Fixity -FloatPrimL :: Rational -> Lit -ForallC :: [Name] -> Cxt -> Con -> Con -ForallT :: [Name] -> Cxt -> Type -> Type -ForeignD :: Foreign -> Dec -FromR :: Exp -> Range -FromThenR :: Exp -> Exp -> Range -FromThenToR :: Exp -> Exp -> Exp -> Range -FromToR :: Exp -> Exp -> Range -FunD :: Name -> [Clause] -> Dec -FunDep :: [Name] -> [Name] -> FunDep -GuardedB :: [(Guard,Exp)] -> Body -ImportF :: Callconv -> Safety -> String -> Name -> Type -> Foreign -InfixC :: StrictType -> Name -> StrictType -> Con -InfixE :: (Maybe Exp) -> Exp -> (Maybe Exp) -> Exp -InfixL :: FixityDirection -InfixN :: FixityDirection -InfixP :: Pat -> Name -> Pat -> Pat -InfixR :: FixityDirection -InstanceD :: Cxt -> Type -> [Dec] -> Dec -IntPrimL :: Integer -> Lit -IntegerL :: Integer -> Lit -IsStrict :: Strict -LamE :: [Pat] -> Exp -> Exp -LetE :: [Dec] -> Exp -> Exp -LetS :: [Dec] -> Stmt -ListE :: [Exp] -> Exp -ListP :: [Pat] -> Pat -ListT :: Type -LitE :: Lit -> Exp -LitP :: Lit -> Pat -Match :: Pat -> Body -> [Dec] -> Match -NewtypeD :: Cxt -> Name -> [Name] -> Con -> [Name] -> Dec -NoBindS :: Exp -> Stmt -NormalB :: Exp -> Body -NormalC :: Name -> [StrictType] -> Con -NormalG :: Exp -> Guard -NotStrict :: Strict -ParS :: [[Stmt]] -> Stmt -PatG :: [Stmt] -> Guard -PrimTyConI :: Name -> Int -> Bool -> Info -RationalL :: Rational -> Lit -RecC :: Name -> [VarStrictType] -> Con -RecConE :: Name -> [FieldExp] -> Exp -RecP :: Name -> [FieldPat] -> Pat -RecUpdE :: Exp -> [FieldExp] -> Exp -Safe :: Safety -SigD :: Name -> Type -> Dec -SigE :: Exp -> Type -> Exp -SigP :: Pat -> Type -> Pat -StdCall :: Callconv -StringL :: String -> Lit -Threadsafe :: Safety -TildeP :: Pat -> Pat -TupE :: [Exp] -> Exp -TupP :: [Pat] -> Pat -TupleT :: Int -> Type -TyConI :: Dec -> Info -TySynD :: Name -> [Name] -> Type -> Dec -TyVarI :: Name -> Type -> Info -Unsafe :: Safety -ValD :: Pat -> Body -> [Dec] -> Dec -VarE :: Name -> Exp -VarI :: Name -> Type -> (Maybe Dec) -> Fixity -> Info -VarP :: Name -> Pat -VarT :: Name -> Type -WildP :: Pat -appE :: ExpQ -> ExpQ -> ExpQ -appT :: TypeQ -> TypeQ -> TypeQ -appsE :: [ExpQ] -> ExpQ -arithSeqE :: RangeQ -> ExpQ -arrowT :: TypeQ -asP :: Name -> PatQ -> PatQ -bindS :: PatQ -> ExpQ -> StmtQ -cCall :: Callconv -caseE :: ExpQ -> [MatchQ] -> ExpQ -charL :: Char -> Lit -class Ppr a -classD :: CxtQ -> Name -> [Name] -> [FunDep] -> [DecQ] -> DecQ -clause :: [PatQ] -> BodyQ -> [DecQ] -> ClauseQ -compE :: [StmtQ] -> ExpQ -conE :: Name -> ExpQ -conP :: Name -> [PatQ] -> PatQ -conT :: Name -> TypeQ -condE :: ExpQ -> ExpQ -> ExpQ -> ExpQ -currentModule :: Q String -cxt :: [TypeQ] -> CxtQ -data Body -data Callconv -data Clause -data Con -data Dec -data Exp -data FixityDirection -data Foreign -data FunDep -data Guard -data Info -data Lit -data Match -data Name -data Pat -data Q a -data Range -data Safety -data Stmt -data Strict -data Type -dataD :: CxtQ -> Name -> [Name] -> [ConQ] -> [Name] -> DecQ -defaultFixity :: Fixity -doE :: [StmtQ] -> ExpQ -doublePrimL :: Rational -> Lit -dyn :: String -> Q Exp -fieldExp :: Name -> ExpQ -> Q (Name, Exp) -fieldPat :: Name -> PatQ -> FieldPatQ -floatPrimL :: Rational -> Lit -forImpD :: Callconv -> Safety -> String -> Name -> TypeQ -> DecQ -forallT :: [Name] -> CxtQ -> TypeQ -> TypeQ -fromE :: ExpQ -> ExpQ -fromR :: ExpQ -> RangeQ -fromThenE :: ExpQ -> ExpQ -> ExpQ -fromThenR :: ExpQ -> ExpQ -> RangeQ -fromThenToE :: ExpQ -> ExpQ -> ExpQ -> ExpQ -fromThenToR :: ExpQ -> ExpQ -> ExpQ -> RangeQ -fromToE :: ExpQ -> ExpQ -> ExpQ -fromToR :: ExpQ -> ExpQ -> RangeQ -funD :: Name -> [ClauseQ] -> DecQ -global :: Name -> ExpQ -guardedB :: [Q (Guard, Exp)] -> BodyQ -infixApp :: ExpQ -> ExpQ -> ExpQ -> ExpQ -infixC :: Q (Strict, Type) -> Name -> Q (Strict, Type) -> ConQ -infixE :: Maybe ExpQ -> ExpQ -> Maybe ExpQ -> ExpQ -infixP :: PatQ -> Name -> PatQ -> PatQ -instance Eq Body -instance Eq Callconv -instance Eq Clause -instance Eq Con -instance Eq Dec -instance Eq Exp -instance Eq FixityDirection -instance Eq Foreign -instance Eq FunDep -instance Eq Guard -instance Eq Lit -instance Eq Match -instance Eq Name -instance Eq Pat -instance Eq Range -instance Eq Safety -instance Eq Stmt -instance Eq Strict -instance Eq Type -instance Monad Q -instance Ord Name -instance Ppr Clause -instance Ppr Con -instance Ppr Dec -instance Ppr Exp -instance Ppr Foreign -instance Ppr FunDep -instance Ppr Info -instance Ppr Match -instance Ppr Name -instance Ppr Pat -instance Ppr Range -instance Ppr Stmt -instance Ppr Type -instance Quasi Q -instance Show Body -instance Show Callconv -instance Show Clause -instance Show Con -instance Show Dec -instance Show Exp -instance Show Foreign -instance Show FunDep -instance Show Guard -instance Show Lit -instance Show Match -instance Show Name -instance Show Pat -instance Show Range -instance Show Safety -instance Show Stmt -instance Show Strict -instance Show Type -instanceD :: CxtQ -> TypeQ -> [DecQ] -> DecQ -intPrimL :: Integer -> Lit -integerL :: Integer -> Lit -isStrict :: Q Strict -lam1E :: PatQ -> ExpQ -> ExpQ -lamE :: [PatQ] -> ExpQ -> ExpQ -letE :: [DecQ] -> ExpQ -> ExpQ -letS :: [DecQ] -> StmtQ -listE :: [ExpQ] -> ExpQ -listP :: [PatQ] -> PatQ -listT :: TypeQ -litE :: Lit -> ExpQ -litP :: Lit -> PatQ -match :: PatQ -> BodyQ -> [DecQ] -> MatchQ -maxPrecedence :: Int -mkName :: String -> Name -nameBase :: Name -> String -nameModule :: Name -> Maybe String -newName :: String -> Q Name -newtypeD :: CxtQ -> Name -> [Name] -> ConQ -> [Name] -> DecQ -noBindS :: ExpQ -> StmtQ -normalB :: ExpQ -> BodyQ -normalC :: Name -> [StrictTypeQ] -> ConQ -normalG :: ExpQ -> GuardQ -normalGE :: ExpQ -> ExpQ -> Q (Guard, Exp) -notStrict :: Q Strict -parS :: [[StmtQ]] -> StmtQ -patG :: [StmtQ] -> GuardQ -patGE :: [StmtQ] -> Q (Guard, Exp) -ppr :: Ppr a => a -> Doc -pprExp :: Precedence -> Exp -> Doc -pprLit :: Precedence -> Lit -> Doc -pprParendType :: Type -> Doc -pprPat :: Precedence -> Pat -> Doc -ppr_list :: Ppr a => [a] -> Doc -pprint :: Ppr a => a -> String -rationalL :: Rational -> Lit -recC :: Name -> [VarStrictTypeQ] -> ConQ -recConE :: Name -> [Q (Name, Exp)] -> ExpQ -recP :: Name -> [FieldPatQ] -> PatQ -recUpdE :: ExpQ -> [Q (Name, Exp)] -> ExpQ -recover :: Q a -> Q a -> Q a -reify :: Name -> Q Info -report :: Bool -> String -> Q () -runIO :: IO a -> Q a -runQ :: Quasi m => Q a -> m a -safe :: Safety -sectionL :: ExpQ -> ExpQ -> ExpQ -sectionR :: ExpQ -> ExpQ -> ExpQ -sigD :: Name -> TypeQ -> DecQ -sigE :: ExpQ -> TypeQ -> ExpQ -sigP :: PatQ -> TypeQ -> PatQ -stdCall :: Callconv -strictType :: Q Strict -> TypeQ -> StrictTypeQ -stringE :: String -> ExpQ -stringL :: String -> Lit -threadsafe :: Safety -tildeP :: PatQ -> PatQ -tupE :: [ExpQ] -> ExpQ -tupP :: [PatQ] -> PatQ -tupleDataName :: Int -> Name -tupleT :: Int -> TypeQ -tupleTypeName :: Int -> Name -tySynD :: Name -> [Name] -> TypeQ -> DecQ -type BodyQ = Q Body -type ClauseQ = Q Clause -type ConQ = Q Con -type Cxt = [Type] -type CxtQ = Q Cxt -type DecQ = Q Dec -type ExpQ = Q Exp -type FieldExp = (Name, Exp) -type FieldPat = (Name, Pat) -type FieldPatQ = Q FieldPat -type GuardQ = Q Guard -type InfoQ = Q Info -type MatchQ = Q Match -type PatQ = Q Pat -type RangeQ = Q Range -type StmtQ = Q Stmt -type StrictTypeQ = Q StrictType -type TypeQ = Q Type -type VarStrictTypeQ = Q VarStrictType -unsafe :: Safety -valD :: PatQ -> BodyQ -> [DecQ] -> DecQ -varE :: Name -> ExpQ -varP :: Name -> PatQ -varStrictType :: Name -> StrictTypeQ -> VarStrictTypeQ -varT :: Name -> TypeQ -wildP :: PatQ - -module Language.Haskell.TH.Lib -alpha :: [(Name, Name)] -> Name -> ExpQ -combine :: [([(Name, Name)], Pat)] -> ([(Name, Name)], [Pat]) -forallC :: [Name] -> CxtQ -> ConQ -> ConQ -funDep :: [Name] -> [Name] -> FunDep -genpat :: Pat -> Q (Name -> ExpQ, Pat) -rename :: Pat -> Q ([(Name, Name)], Pat) -simpleMatch :: Pat -> Exp -> Match -type FieldExpQ = Q FieldExp - -module Language.Haskell.TH.Ppr -appPrec :: Precedence -nestDepth :: Int -noPrec :: Precedence -opPrec :: Precedence -parensIf :: Bool -> Doc -> Doc -pprBody :: Bool -> Body -> Doc -pprCxt :: Cxt -> Doc -pprFields :: [(Name, Exp)] -> Doc -pprFixity :: Name -> Fixity -> Doc -pprMaybeExp :: Precedence -> Maybe Exp -> Doc -pprStrictType :: (Strict, Type) -> Doc -pprTyApp :: (Type, [Type]) -> Doc -pprVarStrictType :: (Name, Strict, Type) -> Doc -showtextl :: Show a => a -> Doc -split :: Type -> (Type, [Type]) -type Precedence = Int -where_clause :: [Dec] -> Doc - -module Language.Haskell.TH.PprLib -data PprM a -instance Monad PprM -isEmpty :: Doc -> PprM Bool -pprName :: Name -> Doc -to_HPJ_Doc :: Doc -> Doc -type Doc = PprM Doc - -module Language.Haskell.TH.Syntax -DataName :: NameSpace -Name :: OccName -> NameFlavour -> Name -NameG :: NameSpace -> ModName -> NameFlavour -NameL :: Int# -> NameFlavour -NameQ :: ModName -> NameFlavour -NameS :: NameFlavour -NameU :: Int# -> NameFlavour -TcClsName :: NameSpace -VarName :: NameSpace -bindQ :: Q a -> (a -> Q b) -> Q b -class Lift t -class Monad m => Quasi m -data NameFlavour -data NameSpace -instance Eq NameFlavour -instance Eq NameSpace -instance Ord NameFlavour -instance Ord NameSpace -lift :: Lift t => t -> Q Exp -mkModName :: String -> ModName -mkNameG_d :: String -> String -> Name -mkNameG_tc :: String -> String -> Name -mkNameG_v :: String -> String -> Name -mkNameL :: String -> Uniq -> Name -mkNameU :: String -> Uniq -> Name -mkOccName :: String -> OccName -modString :: ModName -> String -occString :: OccName -> String -qCurrentModule :: Quasi m => m String -qNewName :: Quasi m => String -> m Name -qRecover :: Quasi m => m a -> m a -> m a -qReify :: Quasi m => Name -> m Info -qReport :: Quasi m => Bool -> String -> m () -qRunIO :: Quasi m => IO a -> m a -returnQ :: a -> Q a -sequenceQ :: [Q a] -> Q [a] -type ModName = PackedString -type OccName = PackedString -type StrictType = (Strict, Type) -type Uniq = Int -type VarStrictType = (Name, Strict, Type) - -module List -(\\) :: Eq a => [a] -> [a] -> [a] -delete :: Eq a => a -> [a] -> [a] -deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a] -elemIndex :: Eq => a -> [a] -> Maybe Int -elemIndices :: Eq a => a -> [a] -> [Int] -find :: (a -> Bool) -> [a] -> Maybe a -findIndex :: (a -> Bool) -> [a] -> Maybe Int -findIndices :: (a -> Bool) -> [a] -> [Int] -genericDrop :: Integral a => a -> [b] -> [b] -genericIndex :: Integral a => [b] -> a -> b -genericLength :: Integral a => [b] -> a -genericReplicate :: Integral a => a -> b -> [b] -genericSplitAt :: Integral a => a -> [b] -> ([b],[b]) -genericTake :: Integral a => a -> [b] -> [b] -group :: Eq a => [a] -> [[a]] -groupBy :: (a -> a -> Bool) -> [a] -> [[a]] -inits :: [a] -> [[a]] -insert :: Ord a => a -> [a] -> [a] -insertBy :: (a -> a -> Ordering) -> a -> [a] -> [a] -intersect :: Eq a => [a] -> [a] -> [a] -intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] -intersperse :: a -> [a] -> [a] -isPrefixOf :: Eq a => [a] -> [a] -> Bool -isSuffixOf :: Eq a => [a] -> [a] -> Bool -mapAccumL :: (a -> b -> (a,c)) -> a -> [b] -> (a,[c]) -mapAccumR :: (a -> b -> (a,c)) -> a -> [b] -> (a,[c]) -maximumBy :: (a -> a -> a) -> [a] -> a -minimumBy :: (a -> a -> a) -> [a] -> a -nub :: Eq a => [a] -> [a] -nubBy :: (a -> a -> Bool) -> [a] -> [a] -partition :: (a -> Bool) -> [a] -> ([a],[a]) -sort :: Ord a => [a] -> [a] -sortBy :: (a -> a -> Ordering) -> [a] -> [a] -tails :: [a] -> [[a]] -transpose :: [[a]] -> [[a]] -unfoldr :: (a -> Maybe (b,a)) -> a -> [b] -union :: Eq a => [a] -> [a] -> [a] -unionBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] -unzip4 :: [(a,b,c,d)] -> ([a],[b],[c],[d]) -unzip5 :: [(a,b,c,d,e)] -> ([a],[b],[c],[d],[e]) -unzip6 :: [(a,b,c,d,e,f)] -> ([a],[b],[c],[d],[e],[f]) -unzip7 :: [(a,b,c,d,e,f,g)] -> ([a],[b],[c],[d],[e],[f],[g]) -zip4 :: [a] -> [b] -> [c] -> [d] -> [(a,b,c,d)] -zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a,b,c,d,e)] -zip6 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [(a,b,c,d,e,f)] -zip7 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [(a,b,c,d,e,f,g)] -zipWith4 :: (a -> b -> c -> d -> e) -> [a] -> [b] -> [c] -> [d] -> [e] -zipWith5 :: (a -> b -> c -> d -> e -> f) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -zipWith6 :: (a -> b -> c -> d -> e -> f -> g) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h] - -module Locale -defaultTimeLocale :: TimeLocale - -module Maybe -catMaybes :: [Maybe a] -> [a] -fromJust :: Maybe a -> a -fromMaybe :: a -> Maybe a -> a -isJust :: Maybe a -> Bool -isNothing :: Maybe a -> Bool -listToMaybe :: [a] -> Maybe a -mapMaybe :: (a -> Maybe b) -> [a] -> [b] -maybeToList :: Maybe a -> [a] - -module Monad -ap :: Monad a => a (b -> c) -> a b -> a c -filterM :: Monad a => (b -> a Bool) -> [b] -> a [b] -foldM :: Monad a => (b -> c -> a b) -> b -> [c] -> a b -guard :: MonadPlus a => Bool -> a () -join :: Monad a => a (a b) -> a b -liftM :: Monad a => (b -> c) -> a b -> a c -liftM2 :: Monad a => (b -> c -> d) -> a b -> a c -> a d -liftM3 :: Monad a => (b -> c -> d -> e) -> a b -> a c -> a d -> a e -liftM4 :: Monad a => (b -> c -> d -> e -> f) -> a b -> a c -> a d -> a e -> a f -liftM5 :: Monad a => (b -> c -> d -> e -> f -> g) -> a b -> a c -> a d -> a e -> a f -> a g -mapAndUnzipM :: Monad a => (b -> a (c,d)) -> [b] -> a ([c],[d]) -msum :: MonadPlus a => [a b] -> a b -unless :: Monad a => Bool -> a () -> a () -when :: Monad a => Bool -> a () -> a () -zipWithM :: Monad a => (b -> c -> a d) -> [b] -> [c] -> a [d] -zipWithM_ :: Monad a => (b -> c -> a d) -> [b] -> [c] -> a () - -module Network -PortNumber :: PortNumber -> PortID -Service :: String -> PortID -accept :: Socket -> IO (Handle, HostName, PortNumber) -connectTo :: HostName -> PortID -> IO Handle -data PortID -data PortNumber -data Socket -instance Enum PortNumber -instance Eq PortNumber -instance Eq Socket -instance Integral PortNumber -instance Num PortNumber -instance Ord PortNumber -instance Real PortNumber -instance Show PortNumber -instance Show Socket -instance Storable PortNumber -instance Typeable PortNumber -instance Typeable Socket -listenOn :: PortID -> IO Socket -recvFrom :: HostName -> PortID -> IO String -sClose :: Socket -> IO () -sendTo :: HostName -> PortID -> String -> IO () -socketPort :: Socket -> IO PortID -type HostName = String -withSocketsDo :: IO a -> IO a - -module Network.BSD -HostEntry :: HostName -> [HostName] -> Family -> [HostAddress] -> HostEntry -NetworkEntry :: NetworkName -> [NetworkName] -> Family -> NetworkAddr -> NetworkEntry -ProtocolEntry :: ProtocolName -> [ProtocolName] -> ProtocolNumber -> ProtocolEntry -ServiceEntry :: ServiceName -> [ServiceName] -> PortNumber -> ProtocolName -> ServiceEntry -data HostEntry -data NetworkEntry -data ProtocolEntry -data ServiceEntry -getHostByAddr :: Family -> HostAddress -> IO HostEntry -getHostByName :: HostName -> IO HostEntry -getHostName :: IO HostName -getProtocolByName :: ProtocolName -> IO ProtocolEntry -getProtocolByNumber :: ProtocolNumber -> IO ProtocolEntry -getProtocolNumber :: ProtocolName -> IO ProtocolNumber -getServiceByName :: ServiceName -> ProtocolName -> IO ServiceEntry -getServiceByPort :: PortNumber -> ProtocolName -> IO ServiceEntry -getServicePortNumber :: ServiceName -> IO PortNumber -hostAddress :: HostEntry -> HostAddress -hostAddresses :: HostEntry -> [HostAddress] -hostAliases :: HostEntry -> [HostName] -hostFamily :: HostEntry -> Family -hostName :: HostEntry -> HostName -instance Read HostEntry -instance Read NetworkEntry -instance Read ProtocolEntry -instance Show HostEntry -instance Show NetworkEntry -instance Show ProtocolEntry -instance Show ServiceEntry -instance Storable HostEntry -instance Storable NetworkEntry -instance Storable ProtocolEntry -instance Storable ServiceEntry -instance Typeable HostEntry -instance Typeable NetworkEntry -instance Typeable ProtocolEntry -instance Typeable ServiceEntry -networkAddress :: NetworkEntry -> NetworkAddr -networkAliases :: NetworkEntry -> [NetworkName] -networkFamily :: NetworkEntry -> Family -networkName :: NetworkEntry -> NetworkName -protoAliases :: ProtocolEntry -> [ProtocolName] -protoName :: ProtocolEntry -> ProtocolName -protoNumber :: ProtocolEntry -> ProtocolNumber -serviceAliases :: ServiceEntry -> [ServiceName] -serviceName :: ServiceEntry -> ServiceName -servicePort :: ServiceEntry -> PortNumber -serviceProtocol :: ServiceEntry -> ProtocolName -type NetworkAddr = CULong -type NetworkName = String -type ProtocolName = String -type ProtocolNumber = CInt -type ServiceName = String - -module Network.CGI -Html -connectToCGIScript :: String -> PortID -> IO () -pwrapper :: PortID -> ([(String, String)] -> IO Html) -> IO () -wrapper :: ([(String, String)] -> IO Html) -> IO () - -module Network.Socket -AF_APPLETALK :: Family -AF_CCITT :: Family -AF_CHAOS :: Family -AF_DATAKIT :: Family -AF_DECnet :: Family -AF_DLI :: Family -AF_ECMA :: Family -AF_HYLINK :: Family -AF_IMPLINK :: Family -AF_INET :: Family -AF_INET6 :: Family -AF_IPX :: Family -AF_ISO :: Family -AF_LAT :: Family -AF_NETBIOS :: Family -AF_NS :: Family -AF_OSI :: Family -AF_PUP :: Family -AF_SNA :: Family -AF_UNIX :: Family -AF_UNSPEC :: Family -Bound :: SocketStatus -Broadcast :: SocketOption -Connected :: SocketStatus -Datagram :: SocketType -Debug :: SocketOption -DontRoute :: SocketOption -DummySocketOption__ :: SocketOption -KeepAlive :: SocketOption -Linger :: SocketOption -Listening :: SocketStatus -MkSocket :: CInt -> Family -> SocketType -> ProtocolNumber -> (MVar SocketStatus) -> Socket -NoDelay :: SocketOption -NoSocketType :: SocketType -NotConnected :: SocketStatus -OOBInline :: SocketOption -PortNum :: Word16 -> PortNumber -RDM :: SocketType -Raw :: SocketType -RecvBuffer :: SocketOption -RecvLowWater :: SocketOption -RecvTimeOut :: SocketOption -ReuseAddr :: SocketOption -SendBuffer :: SocketOption -SendLowWater :: SocketOption -SendTimeOut :: SocketOption -SeqPacket :: SocketType -ShutdownBoth :: ShutdownCmd -ShutdownReceive :: ShutdownCmd -ShutdownSend :: ShutdownCmd -SoError :: SocketOption -SockAddrInet :: PortNumber -> HostAddress -> SockAddr -Stream :: SocketType -Type :: SocketOption -UseLoopBack :: SocketOption -aNY_PORT :: PortNumber -accept :: Socket -> IO (Socket, SockAddr) -bindSocket :: Socket -> SockAddr -> IO () -connect :: Socket -> SockAddr -> IO () -data Family -data ShutdownCmd -data SockAddr -data SocketOption -data SocketStatus -data SocketType -fdSocket :: Socket -> CInt -getPeerName :: Socket -> IO SockAddr -getSocketName :: Socket -> IO SockAddr -getSocketOption :: Socket -> SocketOption -> IO Int -iNADDR_ANY :: HostAddress -inet_addr :: String -> IO HostAddress -inet_ntoa :: HostAddress -> IO String -instance Eq Family -instance Eq SockAddr -instance Eq SocketStatus -instance Eq SocketType -instance Ord Family -instance Ord SocketType -instance Read Family -instance Read SocketType -instance Show Family -instance Show SockAddr -instance Show SocketStatus -instance Show SocketType -instance Typeable ShutdownCmd -instance Typeable SockAddr -instance Typeable SocketOption -instance Typeable SocketStatus -instance Typeable SocketType -listen :: Socket -> Int -> IO () -maxListenQueue :: Int -mkSocket :: CInt -> Family -> SocketType -> ProtocolNumber -> SocketStatus -> IO Socket -newtype PortNumber -packFamily :: Family -> CInt -packSocketType :: SocketType -> CInt -recv :: Socket -> Int -> IO String -recvBufFrom :: Socket -> Ptr a -> Int -> IO (Int, SockAddr) -recvFrom :: Socket -> Int -> IO (String, Int, SockAddr) -recvLen :: Socket -> Int -> IO (String, Int) -sIsBound :: Socket -> IO Bool -sIsConnected :: Socket -> IO Bool -sIsListening :: Socket -> IO Bool -sIsReadable :: Socket -> IO Bool -sIsWritable :: Socket -> IO Bool -sOL_SOCKET :: Int -sOMAXCONN :: Int -send :: Socket -> String -> IO Int -sendBufTo :: Socket -> Ptr a -> Int -> SockAddr -> IO Int -sendTo :: Socket -> String -> SockAddr -> IO Int -setSocketOption :: Socket -> SocketOption -> Int -> IO () -shutdown :: Socket -> ShutdownCmd -> IO () -socket :: Family -> SocketType -> ProtocolNumber -> IO Socket -socketPort :: Socket -> IO PortNumber -socketToHandle :: Socket -> IOMode -> IO Handle -throwSocketErrorIfMinus1_ :: Num a => String -> IO a -> IO () -type HostAddress = Word32 -unpackFamily :: CInt -> Family - -module Network.URI -URI :: String -> Maybe URIAuth -> String -> String -> String -> URI -URIAuth :: String -> String -> String -> URIAuth -authority :: URI -> String -data URI -data URIAuth -escapeString :: String -> (Char -> Bool) -> String -escapeURIChar :: (Char -> Bool) -> Char -> String -escapeURIString :: (Char -> Bool) -> String -> String -fragment :: URI -> String -instance Data URI -instance Data URIAuth -instance Eq URI -instance Eq URIAuth -instance Show URI -instance Typeable URI -instance Typeable URIAuth -isAbsoluteURI :: String -> Bool -isAllowedInURI :: Char -> Bool -isIPv4address :: String -> Bool -isIPv6address :: String -> Bool -isRelativeReference :: String -> Bool -isReserved :: Char -> Bool -isURI :: String -> Bool -isURIReference :: String -> Bool -isUnescapedInURI :: Char -> Bool -isUnreserved :: Char -> Bool -nonStrictRelativeTo :: URI -> URI -> Maybe URI -normalizeCase :: String -> String -normalizeEscape :: String -> String -normalizePathSegments :: String -> String -nullURI :: URI -parseRelativeReference :: String -> Maybe URI -parseURI :: String -> Maybe URI -parseURIReference :: String -> Maybe URI -parseabsoluteURI :: String -> Maybe URI -path :: URI -> String -query :: URI -> String -relativeFrom :: URI -> URI -> URI -relativeTo :: URI -> URI -> Maybe URI -reserved :: Char -> Bool -scheme :: URI -> String -unEscapeString :: String -> String -unreserved :: Char -> Bool -uriAuthority :: URI -> Maybe URIAuth -uriFragment :: URI -> String -uriPath :: URI -> String -uriPort :: URIAuth -> String -uriQuery :: URI -> String -uriRegName :: URIAuth -> String -uriScheme :: URI -> String -uriToString :: (String -> String) -> URI -> ShowS -uriUserInfo :: URIAuth -> String - -module Numeric -floatToDigits :: RealFloat a => Integer -> a -> ([Int], Int) -floatToDigits :: RealFloat a => Integer -> a -> ([Int],Int) -fromRat :: RealFloat a => Rational -> a -lexDigits :: ReadS String -readDec :: Integral a => ReadS a -readDec :: Num a => ReadS a -readFloat :: RealFloat a => ReadS a -readFloat :: RealFrac a => ReadS a -readHex :: Integral a => ReadS a -readHex :: Num a => ReadS a -readInt :: Integral a => a -> (Char -> Bool) -> (Char -> Int) -> ReadS a -readInt :: Num a => a -> (Char -> Bool) -> (Char -> Int) -> ReadS a -readOct :: Integral a => ReadS a -readOct :: Num a => ReadS a -readSigned :: Real a => ReadS a -> ReadS a -showEFloat :: RealFloat a => Maybe Int -> a -> ShowS -showFFloat :: RealFloat a => Maybe Int -> a -> ShowS -showFloat :: RealFloat a => a -> ShowS -showGFloat :: RealFloat a => Maybe Int -> a -> ShowS -showHex :: Integral a => a -> ShowS -showInt :: Integral a => a -> ShowS -showIntAtBase :: Integral a => a -> (Int -> Char) -> a -> ShowS -showOct :: Integral a => a -> ShowS -showSigned :: Real a => (a -> ShowS) -> Int -> a -> ShowS - -module Prelude -(!!) :: [a] -> Int -> a -($!) :: (a -> b) -> a -> b -($) :: (a -> b) -> a -> b -(&&) :: Bool -> Bool -> Bool -(*) :: Num a => a -> a -> a -(**) :: Floating a => a -> a -> a -(+) :: Num a => a -> a -> a -(++) :: [a] -> [a] -> [a] -(-) :: Num a => a -> a -> a -(.) :: (b -> c) -> (a -> b) -> a -> c -(/) :: Fractional a => a -> a -> a -(/=) :: Eq a => a -> a -> Bool -(:) :: a -> [a] -> [a] -(<) :: Ord a => a -> a -> Bool -(<=) :: Ord a => a -> a -> Bool -(=<<) :: Monad m => (a -> m b) -> m a -> m b -(==) :: Eq a => a -> a -> Bool -(>) :: Ord a => a -> a -> Bool -(>=) :: Ord a => a -> a -> Bool -(>>) :: Monad m => m a -> m b -> m b -(>>=) :: Monad m => m a -> (a -> m b) -> m b -(^) :: (Num a, Integral b) => a -> b -> a -(^^) :: (Fractional a, Integral b) => a -> b -> a -(||) :: Bool -> Bool -> Bool -EQ :: Ordering -False :: Bool -GT :: Ordering -Just :: a -> Maybe a -LT :: Ordering -Left :: a -> Either a b -Nothing :: Maybe a -Right :: b -> Either a b -True :: Bool -[] :: [a] -abs :: Num a => a -> a -acos :: Floating a => a -> a -acosh :: Floating a => a -> a -all :: (a -> Bool) -> [a] -> Bool -and :: [Bool] -> Bool -any :: (a -> Bool) -> [a] -> Bool -appendFile :: FilePath -> String -> IO () -asTypeOf :: a -> a -> a -asin :: Floating a => a -> a -asinh :: Floating a => a -> a -atan :: Floating a => a -> a -atan2 :: RealFloat a => a -> a -> a -atanh :: Floating a => a -> a -break :: (a -> Bool) -> [a] -> ([a], [a]) -catch :: IO a -> (IOError -> IO a) -> IO a -ceiling :: (RealFrac a, Integral b) => a -> b -class (Eq a, Show a) => Num a -class (Num a, Ord a) => Real a -class (Real a, Enum a) => Integral a -class (Real a, Fractional a) => RealFrac a -class (RealFrac a, Floating a) => RealFloat a -class Bounded a -class Enum a -class Eq a -class Eq a => Ord a -class Fractional a => Floating a -class Functor f -class Monad m -class Num a => Fractional a -class Read a -class Show a -compare :: Ord a => a -> a -> Ordering -concat :: [[a]] -> [a] -concatMap :: (a -> [b]) -> [a] -> [b] -const :: a -> b -> a -cos :: Floating a => a -> a -cosh :: Floating a => a -> a -curry :: ((a, b) -> c) -> a -> b -> c -cycle :: [a] -> [a] -data Bool -data Char -data Double -data Either a b -data Float -data IO a -data Int -data Integer -data Maybe a -data Ordering -data [] -decodeFloat :: RealFloat a => a -> (Integer,Int) -div :: Integral a => a -> a -> a -divMod :: Integral a => a -> a -> (a,a) -drop :: Int -> [a] -> [a] -dropWhile :: (a -> Bool) -> [a] -> [a] -either :: (a -> c) -> (b -> c) -> Either a b -> c -elem :: Eq a => a -> [a] -> Bool -encodeFloat :: RealFloat a => Integer -> Int -> a -enumFrom :: Enum a => a -> [a] -enumFromThen :: Enum a => a -> a -> [a] -enumFromThenTo :: Enum a => a -> a -> a -> [a] -enumFromTo :: Enum a => a -> a -> [a] -error :: String -> a -even :: Integral a => a -> Bool -exp :: Floating a => a -> a -exponent :: RealFloat a => a -> Int -fail :: Monad m => String -> m a -filter :: (a -> Bool) -> [a] -> [a] -flip :: (a -> b -> c) -> b -> a -> c -floatDigits :: RealFloat a => a -> Int -floatRadix :: RealFloat a => a -> Integer -floatRange :: RealFloat a => a -> (Int,Int) -floor :: (RealFrac a, Integral b) => a -> b -fmap :: Functor f => (a -> b) -> f a -> f b -foldl :: (a -> b -> a) -> a -> [b] -> a -foldl1 :: (a -> a -> a) -> [a] -> a -foldr :: (a -> b -> b) -> b -> [a] -> b -foldr1 :: (a -> a -> a) -> [a] -> a -fromEnum :: Enum a => a -> Int -fromInteger :: Num a => Integer -> a -fromIntegral :: (Integral a, Num b) => a -> b -fromRational :: Fractional a => Rational -> a -fst :: (a, b) -> a -gcd :: Integral a => a -> a -> a -getChar :: IO Char -getContents :: IO String -getLine :: IO String -head :: [a] -> a -id :: a -> a -init :: [a] -> [a] -instance (Data a, Data b) => Data (Either a b) -instance (Eq a, Eq b) => Eq (Either a b) -instance (Ix ix, Show ix) => Show (DiffUArray ix Char) -instance (Ix ix, Show ix) => Show (DiffUArray ix Double) -instance (Ix ix, Show ix) => Show (DiffUArray ix Float) -instance (Ix ix, Show ix) => Show (DiffUArray ix Int) -instance (Ix ix, Show ix) => Show (UArray ix Bool) -instance (Ix ix, Show ix) => Show (UArray ix Char) -instance (Ix ix, Show ix) => Show (UArray ix Double) -instance (Ix ix, Show ix) => Show (UArray ix Float) -instance (Ix ix, Show ix) => Show (UArray ix Int) -instance (Ord a, Ord b) => Ord (Either a b) -instance (Read a, Read b) => Read (Either a b) -instance (Show a, Show b) => Show (Either a b) -instance Bits Int -instance Bits Integer -instance Bounded Bool -instance Bounded Char -instance Bounded Int -instance Bounded Ordering -instance Data Bool -instance Data Char -instance Data Double -instance Data Float -instance Data Int -instance Data Integer -instance Data Ordering -instance Data a => Data (Maybe a) -instance Enum Bool -instance Enum Char -instance Enum Double -instance Enum Float -instance Enum Int -instance Enum Integer -instance Enum Ordering -instance Eq Bool -instance Eq Char -instance Eq Double -instance Eq Float -instance Eq Int -instance Eq Integer -instance Eq Ordering -instance Eq a => Eq (Maybe a) -instance Floating Double -instance Floating Float -instance Fractional Double -instance Fractional Float -instance Functor IO -instance Functor Maybe -instance FunctorM Maybe -instance HPrintfType (IO a) -instance HTML Char -instance IArray (IOToDiffArray IOUArray) Char -instance IArray (IOToDiffArray IOUArray) Double -instance IArray (IOToDiffArray IOUArray) Float -instance IArray (IOToDiffArray IOUArray) Int -instance IArray UArray Bool -instance IArray UArray Char -instance IArray UArray Double -instance IArray UArray Float -instance IArray UArray Int -instance Integral Int -instance Integral Integer -instance IsChar Char -instance Ix Bool -instance Ix Char -instance Ix Int -instance Ix Integer -instance Ix Ordering -instance Ix ix => Eq (UArray ix Bool) -instance Ix ix => Eq (UArray ix Char) -instance Ix ix => Eq (UArray ix Double) -instance Ix ix => Eq (UArray ix Float) -instance Ix ix => Eq (UArray ix Int) -instance Ix ix => Ord (UArray ix Bool) -instance Ix ix => Ord (UArray ix Char) -instance Ix ix => Ord (UArray ix Double) -instance Ix ix => Ord (UArray ix Float) -instance Ix ix => Ord (UArray ix Int) -instance MArray (STUArray s) Bool (ST s) -instance MArray (STUArray s) Char (ST s) -instance MArray (STUArray s) Double (ST s) -instance MArray (STUArray s) Float (ST s) -instance MArray (STUArray s) Int (ST s) -instance MArray IOArray e IO -instance MArray IOUArray (FunPtr a) IO -instance MArray IOUArray (Ptr a) IO -instance MArray IOUArray (StablePtr a) IO -instance MArray IOUArray Bool IO -instance MArray IOUArray Char IO -instance MArray IOUArray Double IO -instance MArray IOUArray Float IO -instance MArray IOUArray Int IO -instance MArray IOUArray Int16 IO -instance MArray IOUArray Int32 IO -instance MArray IOUArray Int64 IO -instance MArray IOUArray Int8 IO -instance MArray IOUArray Word IO -instance MArray IOUArray Word16 IO -instance MArray IOUArray Word32 IO -instance MArray IOUArray Word64 IO -instance MArray IOUArray Word8 IO -instance Monad IO -instance Monad Maybe -instance MonadFix IO -instance MonadFix Maybe -instance MonadPlus Maybe -instance Monoid Ordering -instance NFData Bool -instance NFData Char -instance NFData Double -instance NFData Float -instance NFData Int -instance NFData Integer -instance NFDataIntegral Int -instance NFDataOrd Int -instance Num Double -instance Num Float -instance Num Int -instance Num Integer -instance Ord Bool -instance Ord Char -instance Ord Double -instance Ord Float -instance Ord Int -instance Ord Integer -instance Ord Ordering -instance Ord a => Ord (Maybe a) -instance PrintfArg Char -instance PrintfArg Double -instance PrintfArg Float -instance PrintfArg Int -instance PrintfArg Integer -instance PrintfType (IO a) -instance Random Bool -instance Random Char -instance Random Double -instance Random Float -instance Random Int -instance Random Integer -instance Read Bool -instance Read Char -instance Read Double -instance Read Float -instance Read Int -instance Read Integer -instance Read Ordering -instance Read a => Read (Maybe a) -instance Real Double -instance Real Float -instance Real Int -instance Real Integer -instance RealFloat Double -instance RealFloat Float -instance RealFrac Double -instance RealFrac Float -instance Show Bool -instance Show Char -instance Show Double -instance Show Float -instance Show Int -instance Show Integer -instance Show Ordering -instance Show a => Show (Maybe a) -instance Storable Bool -instance Storable Char -instance Storable Double -instance Storable Float -instance Storable Int -instance Storable e => MArray StorableArray e IO -instance Typeable Bool -instance Typeable Char -instance Typeable Double -instance Typeable Float -instance Typeable Int -instance Typeable Integer -instance Typeable Ordering -instance Typeable a => Data (IO a) -instance Typeable1 IO -instance Typeable1 Maybe -instance Typeable2 Either -interact :: (String -> String) -> IO () -ioError :: IOError -> IO a -isDenormalized :: RealFloat a => a -> Bool -isIEEE :: RealFloat a => a -> Bool -isInfinite :: RealFloat a => a -> Bool -isNaN :: RealFloat a => a -> Bool -isNegativeZero :: RealFloat a => a -> Bool -iterate :: (a -> a) -> a -> [a] -keyword ! -keyword -> -keyword :: -keyword <- -keyword @ -keyword _ -keyword as -keyword case -keyword class -keyword data -keyword default -keyword deriving -keyword do -keyword else -keyword forall -keyword hiding -keyword if -keyword import -keyword in -keyword infix -keyword infixl -keyword infixr -keyword instance -keyword let -keyword module -keyword newtype -keyword of -keyword qualified -keyword then -keyword type -keyword where -keyword | -keyword ~ -last :: [a] -> a -lcm :: Integral a => a -> a -> a -length :: [a] -> Int -lex :: ReadS String -lines :: String -> [String] -log :: Floating a => a -> a -logBase :: Floating a => a -> a -> a -lookup :: Eq a => a -> [(a, b)] -> Maybe b -map :: (a -> b) -> [a] -> [b] -mapM :: Monad m => (a -> m b) -> [a] -> m [b] -mapM_ :: Monad m => (a -> m b) -> [a] -> m () -max :: Ord a => a -> a -> a -maxBound :: Bounded a => a -maximum :: Ord a => [a] -> a -maybe :: b -> (a -> b) -> Maybe a -> b -min :: Ord a => a -> a -> a -minBound :: Bounded a => a -minimum :: Ord a => [a] -> a -mod :: Integral a => a -> a -> a -negate :: Num a => a -> a -not :: Bool -> Bool -notElem :: Eq a => a -> [a] -> Bool -null :: [a] -> Bool -odd :: Integral a => a -> Bool -or :: [Bool] -> Bool -otherwise :: Bool -pi :: Floating a => a -pred :: Enum a => a -> a -print :: Show a => a -> IO () -product :: Num a => [a] -> a -properFraction :: (RealFrac a, Integral b) => a -> (b,a) -putChar :: Char -> IO () -putStr :: String -> IO () -putStrLn :: String -> IO () -quot :: Integral a => a -> a -> a -quotRem :: Integral a => a -> a -> (a,a) -read :: Read a => String -> a -readFile :: FilePath -> IO String -readIO :: Read a => String -> IO a -readList :: Read a => ReadS [a] -readLn :: Read a => IO a -readParen :: Bool -> ReadS a -> ReadS a -reads :: Read a => ReadS a -readsPrec :: Read a => Int -> ReadS a -realToFrac :: (Real a, Fractional b) => a -> b -recip :: Fractional a => a -> a -rem :: Integral a => a -> a -> a -repeat :: a -> [a] -replicate :: Int -> a -> [a] -return :: Monad m => a -> m a -reverse :: [a] -> [a] -round :: (RealFrac a, Integral b) => a -> b -scaleFloat :: RealFloat a => Int -> a -> a -scanl :: (a -> b -> a) -> a -> [b] -> [a] -scanl1 :: (a -> a -> a) -> [a] -> [a] -scanr :: (a -> b -> b) -> b -> [a] -> [b] -scanr1 :: (a -> a -> a) -> [a] -> [a] -seq :: a -> b -> b -sequence :: Monad m => [m a] -> m [a] -sequence_ :: Monad m => [m a] -> m () -show :: Show a => a -> String -showChar :: Char -> ShowS -showList :: Show a => [a] -> ShowS -showParen :: Bool -> ShowS -> ShowS -showString :: String -> ShowS -shows :: Show a => a -> ShowS -showsPrec :: Show a => Int -> a -> ShowS -significand :: RealFloat a => a -> a -signum :: Num a => a -> a -sin :: Floating a => a -> a -sinh :: Floating a => a -> a -snd :: (a, b) -> b -span :: (a -> Bool) -> [a] -> ([a], [a]) -splitAt :: Int -> [a] -> ([a], [a]) -sqrt :: Floating a => a -> a -subtract :: Num a => a -> a -> a -succ :: Enum a => a -> a -sum :: Num a => [a] -> a -tail :: [a] -> [a] -take :: Int -> [a] -> [a] -takeWhile :: (a -> Bool) -> [a] -> [a] -tan :: Floating a => a -> a -tanh :: Floating a => a -> a -toEnum :: Enum a => Int -> a -toInteger :: Integral a => a -> Integer -toRational :: Real a => a -> Rational -truncate :: (RealFrac a, Integral b) => a -> b -type FilePath = String -type IOError = IOException -type Rational = Ratio Integer -type ReadS a = String -> [(a, String)] -type ShowS = String -> String -type String = [Char] -uncurry :: (a -> b -> c) -> (a, b) -> c -undefined :: a -unlines :: [String] -> String -until :: (a -> Bool) -> (a -> a) -> a -> a -unwords :: [String] -> String -unzip :: [(a, b)] -> ([a], [b]) -unzip3 :: [(a, b, c)] -> ([a], [b], [c]) -userError :: String -> IOError -words :: String -> [String] -writeFile :: FilePath -> String -> IO () -zip :: [a] -> [b] -> [(a, b)] -zip3 :: [a] -> [b] -> [c] -> [(a, b, c)] -zipWith :: (a -> b -> c) -> [a] -> [b] -> [c] -zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d] - -module Random -getStdGen :: IO StdGen -getStdRandom :: (StdGen -> (a, StdGen)) -> IO a -mkStdGen :: Int -> StdGen -newStdGen :: IO StdGen -next :: RandomGen a => a -> (Int,a) -random :: (Random a, RandomGen b) => b -> (a,b) -randomIO :: Random a => IO a -randomR :: (Random a, RandomGen b) => (a,a) -> b -> (a,b) -randomRIO :: Random a => (a,a) -> IO a -randomRs :: (Random a, RandomGen b) => (a,a) -> b -> [a] -randoms :: (Random a, RandomGen b) => b -> [a] -setStdGen :: StdGen -> IO () -split :: RandomGen a => a -> (a,a) - -module Ratio -(%) :: Integral a => a -> a -> Ratio a -approxRational :: RealFrac a => a -> a -> Rational -denominator :: Integral a => Ratio a -> a -numerator :: Integral a => Ratio a -> a - -module System -exitFailure :: IO a -exitWith :: ExitCode -> IO a -getArgs :: IO [String] -getEnv :: String -> IO String -getProgName :: IO String -system :: String -> IO ExitCode - -module System.Cmd -rawSystem :: String -> [String] -> IO ExitCode - -module System.Console.Readline -Function :: Callback -> Entry -Keymap :: Keymap -> Entry -Macro :: String -> Entry -UndoBegin :: UndoCode -UndoDelete :: UndoCode -UndoEnd :: UndoCode -UndoInsert :: UndoCode -addDefun :: String -> Callback -> Maybe Char -> IO () -addHistory :: String -> IO () -addUndo :: UndoCode -> Int -> Int -> String -> IO () -beginUndoGroup :: IO () -bindKey :: Char -> Callback -> IO () -bindKeyInMap :: Char -> Callback -> Keymap -> IO () -callbackHandlerInstall :: String -> (String -> IO ()) -> IO (IO ()) -callbackReadChar :: IO () -clearMessage :: IO () -clearSignals :: IO () -complete :: Int -> Char -> IO Int -completeInternal :: Char -> IO () -completionMatches :: String -> (String -> IO [String]) -> IO (Maybe (String, [String])) -copyKeymap :: Keymap -> IO Keymap -copyText :: Int -> Int -> IO String -data Entry -data Keymap -data UndoCode -deleteText :: Int -> Int -> IO () -ding :: IO Bool -doUndo :: IO Bool -endUndoGroup :: IO () -filenameCompletionFunction :: String -> IO [String] -forcedUpdateDisplay :: IO () -freeKeymap :: Keymap -> IO () -freeUndoList :: IO () -functionDumper :: Bool -> IO () -functionOfKeyseq :: String -> Maybe Keymap -> IO Entry -genericBind :: String -> Entry -> Keymap -> IO () -getBasicQuoteCharacters :: IO String -getBasicWordBreakCharacters :: IO String -getBindingKeymap :: IO Keymap -getCompleterQuoteCharacters :: IO String -getCompleterWordBreakCharacters :: IO String -getCompletionAppendCharacter :: IO (Maybe Char) -getCompletionQueryItems :: IO Int -getEnd :: IO Int -getExecutingKeymap :: IO Keymap -getFilenameCompletionDesired :: IO Bool -getFilenameQuoteCharacters :: IO String -getFilenameQuotingDesired :: IO Bool -getIgnoreCompletionDuplicates :: IO Bool -getInStream :: IO Handle -getInhibitCompletion :: IO Bool -getKeymap :: IO Keymap -getKeymapByName :: String -> IO Keymap -getKeymapName :: Keymap -> IO (Maybe String) -getLibraryVersion :: IO String -getLineBuffer :: IO String -getMark :: IO Int -getOutStream :: IO Handle -getPoint :: IO Int -getPrompt :: IO String -getSpecialPrefixes :: IO String -getTerminalName :: IO String -initialize :: IO () -insertCompletions :: Int -> Char -> IO Int -insertText :: String -> IO () -killText :: Int -> Int -> IO () -listFunmapNames :: IO () -message :: String -> IO () -modifying :: Int -> Int -> IO () -namedFunction :: String -> IO (Maybe Callback) -newBareKeymap :: IO Keymap -newKeymap :: IO Keymap -onNewLine :: IO () -parseAndBind :: String -> IO () -possibleCompletions :: Int -> Char -> IO Int -quoteFilename :: String -> Bool -> Ptr CChar -> IO String -readInitFile :: String -> IO () -readKey :: IO Char -readline :: String -> IO (Maybe String) -redisplay :: IO () -resetLineState :: IO () -resetTerminal :: Maybe String -> IO () -setAttemptedCompletionFunction :: Maybe (String -> Int -> Int -> IO (Maybe (String, [String]))) -> IO () -setBasicQuoteCharacters :: String -> IO () -setBasicWordBreakCharacters :: String -> IO () -setCharIsQuotedP :: Maybe (String -> Int -> IO Bool) -> IO () -setCompleterQuoteCharacters :: String -> IO () -setCompleterWordBreakCharacters :: String -> IO () -setCompletionAppendCharacter :: Maybe Char -> IO () -setCompletionEntryFunction :: Maybe (String -> IO [String]) -> IO () -setCompletionQueryItems :: Int -> IO () -setDirectoryCompletionHook :: Maybe (String -> IO String) -> IO () -setDone :: Bool -> IO () -setEnd :: Int -> IO () -setEventHook :: Maybe (IO ()) -> IO () -setFilenameCompletionDesired :: Bool -> IO () -setFilenameDequotingFunction :: Maybe (String -> Maybe Char -> IO String) -> IO () -setFilenameQuoteCharacters :: String -> IO () -setFilenameQuotingDesired :: Bool -> IO () -setFilenameQuotingFunction :: Maybe (String -> Bool -> Ptr CChar -> IO String) -> IO () -setIgnoreCompletionDuplicates :: Bool -> IO () -setIgnoreSomeCompletionsFunction :: Maybe ([String] -> IO [String]) -> IO () -setInhibitCompletion :: Bool -> IO () -setKeymap :: Keymap -> IO () -setMark :: Int -> IO () -setPendingInput :: Char -> IO () -setPoint :: Int -> IO () -setReadlineName :: String -> IO () -setRedisplayFunction :: Maybe (IO ()) -> IO () -setSignals :: IO () -setSpecialPrefixes :: String -> IO () -setStartupHook :: Maybe (IO ()) -> IO () -stuffChar :: Char -> IO Bool -type Callback = Int -> Char -> IO Int -unbindCommandInMap :: String -> Keymap -> IO () -unbindKey :: Char -> IO () -unbindKeyInMap :: Char -> Keymap -> IO () -usernameCompletionFunction :: String -> IO [String] - -module System.Console.SimpleLineEditor -delChars :: String -> IO () -getLineEdited :: String -> IO (Maybe String) -initialise :: IO () -restore :: IO () - -module System.Directory -Permissions :: Bool -> Bool -> Bool -> Bool -> Permissions -canonicalizePath :: FilePath -> IO FilePath -copyFile :: FilePath -> FilePath -> IO () -createDirectoryIfMissing :: Bool -> FilePath -> IO () -data Permissions -findExecutable :: String -> IO (Maybe FilePath) -getAppUserDataDirectory :: String -> IO FilePath -getHomeDirectory :: IO FilePath -getTemporaryDirectory :: IO FilePath -getUserDocumentsDirectory :: IO FilePath -instance Eq Permissions -instance Ord Permissions -instance Read Permissions -instance Show Permissions -removeDirectoryRecursive :: FilePath -> IO () - -module System.Environment -getEnvironment :: IO [(String, String)] -withArgs :: [String] -> IO a -> IO a -withProgName :: String -> IO a -> IO a - -module System.Exit -ExitFailure :: Int -> ExitCode -ExitSuccess :: ExitCode -data ExitCode -instance Eq ExitCode -instance Ord ExitCode -instance Read ExitCode -instance Show ExitCode - -module System.IO -AbsoluteSeek :: SeekMode -AppendMode :: IOMode -BlockBuffering :: (Maybe Int) -> BufferMode -LineBuffering :: BufferMode -NoBuffering :: BufferMode -ReadMode :: IOMode -ReadWriteMode :: IOMode -RelativeSeek :: SeekMode -SeekFromEnd :: SeekMode -WriteMode :: IOMode -data BufferMode -data Handle -data HandlePosn -data IOMode -data SeekMode -fixIO :: (a -> IO a) -> IO a -hGetBuf :: Handle -> Ptr a -> Int -> IO Int -hGetBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int -hGetEcho :: Handle -> IO Bool -hIsTerminalDevice :: Handle -> IO Bool -hPutBuf :: Handle -> Ptr a -> Int -> IO () -hPutBufNonBlocking :: Handle -> Ptr a -> Int -> IO Int -hSetBinaryMode :: Handle -> Bool -> IO () -hSetEcho :: Handle -> Bool -> IO () -hSetFileSize :: Handle -> Integer -> IO () -hShow :: Handle -> IO String -hTell :: Handle -> IO Integer -instance Data Handle -instance Enum IOMode -instance Enum SeekMode -instance Eq BufferMode -instance Eq Handle -instance Eq HandlePosn -instance Eq IOMode -instance Eq SeekMode -instance Ix IOMode -instance Ix SeekMode -instance Ord BufferMode -instance Ord IOMode -instance Ord SeekMode -instance Read BufferMode -instance Read IOMode -instance Read SeekMode -instance Show BufferMode -instance Show Handle -instance Show HandlePosn -instance Show IOMode -instance Show SeekMode -instance Typeable Handle -openBinaryFile :: FilePath -> IOMode -> IO Handle -openBinaryTempFile :: FilePath -> String -> IO (FilePath, Handle) -openTempFile :: FilePath -> String -> IO (FilePath, Handle) - -module System.IO.Error -alreadyExistsErrorType :: IOErrorType -alreadyInUseErrorType :: IOErrorType -annotateIOError :: IOError -> String -> Maybe Handle -> Maybe FilePath -> IOError -data IOErrorType -doesNotExistErrorType :: IOErrorType -eofErrorType :: IOErrorType -fullErrorType :: IOErrorType -illegalOperationErrorType :: IOErrorType -instance Eq IOErrorType -instance Show IOErrorType -ioeGetErrorType :: IOError -> IOErrorType -ioeSetErrorString :: IOError -> String -> IOError -ioeSetErrorType :: IOError -> IOErrorType -> IOError -ioeSetFileName :: IOError -> FilePath -> IOError -ioeSetHandle :: IOError -> Handle -> IOError -isAlreadyExistsErrorType :: IOErrorType -> Bool -isAlreadyInUseErrorType :: IOErrorType -> Bool -isDoesNotExistErrorType :: IOErrorType -> Bool -isEOFErrorType :: IOErrorType -> Bool -isFullErrorType :: IOErrorType -> Bool -isIllegalOperationErrorType :: IOErrorType -> Bool -isPermissionErrorType :: IOErrorType -> Bool -isUserErrorType :: IOErrorType -> Bool -mkIOError :: IOErrorType -> String -> Maybe Handle -> Maybe FilePath -> IOError -modifyIOError :: (IOError -> IOError) -> IO a -> IO a -permissionErrorType :: IOErrorType -userErrorType :: IOErrorType - -module System.IO.Unsafe -unsafeInterleaveIO :: IO a -> IO a - -module System.Info -arch :: String -compilerName :: String -compilerVersion :: Version -os :: String - -module System.Locale -TimeLocale :: [(String,String)] -> [(String,String)] -> [(String,String)] -> String,String -> String -> String -> String -> String -> TimeLocale -amPm :: TimeLocale -> String,String -data TimeLocale -dateFmt :: TimeLocale -> String -dateTimeFmt :: TimeLocale -> String -instance Eq TimeLocale -instance Ord TimeLocale -instance Show TimeLocale -intervals :: TimeLocale -> [(String,String)] -iso8601DateFormat :: Maybe String -> String -months :: TimeLocale -> [(String,String)] -rfc822DateFormat :: String -time12Fmt :: TimeLocale -> String -timeFmt :: TimeLocale -> String -wDays :: TimeLocale -> [(String,String)] - -module System.Mem -performGC :: IO () - -module System.Mem.StableName -data StableName a -hashStableName :: StableName a -> Int -instance Eq (StableName a) -instance Typeable1 StableName -makeStableName :: a -> IO (StableName a) - -module System.Mem.Weak -addFinalizer :: key -> IO () -> IO () -data Weak v -deRefWeak :: Weak v -> IO (Maybe v) -finalize :: Weak v -> IO () -instance Typeable1 Weak -mkWeak :: k -> v -> Maybe (IO ()) -> IO (Weak v) -mkWeakPair :: k -> v -> Maybe (IO ()) -> IO (Weak (k, v)) -mkWeakPtr :: k -> Maybe (IO ()) -> IO (Weak k) - -module System.Posix.Types -Fd :: CInt -> Fd -data CDev -data CIno -data CMode -data COff -data CPid -data CSsize -instance Bits CIno -instance Bits CMode -instance Bits COff -instance Bits CPid -instance Bits CSsize -instance Bits Fd -instance Bounded CIno -instance Bounded CMode -instance Bounded COff -instance Bounded CPid -instance Bounded CSsize -instance Bounded Fd -instance Enum CDev -instance Enum CIno -instance Enum CMode -instance Enum COff -instance Enum CPid -instance Enum CSsize -instance Enum Fd -instance Eq CDev -instance Eq CIno -instance Eq CMode -instance Eq COff -instance Eq CPid -instance Eq CSsize -instance Eq Fd -instance Integral CIno -instance Integral CMode -instance Integral COff -instance Integral CPid -instance Integral CSsize -instance Integral Fd -instance Num CDev -instance Num CIno -instance Num CMode -instance Num COff -instance Num CPid -instance Num CSsize -instance Num Fd -instance Ord CDev -instance Ord CIno -instance Ord CMode -instance Ord COff -instance Ord CPid -instance Ord CSsize -instance Ord Fd -instance Read CDev -instance Read CIno -instance Read CMode -instance Read COff -instance Read CPid -instance Read CSsize -instance Read Fd -instance Real CDev -instance Real CIno -instance Real CMode -instance Real COff -instance Real CPid -instance Real CSsize -instance Real Fd -instance Show CDev -instance Show CIno -instance Show CMode -instance Show COff -instance Show CPid -instance Show CSsize -instance Show Fd -instance Storable CDev -instance Storable CIno -instance Storable CMode -instance Storable COff -instance Storable CPid -instance Storable CSsize -instance Storable Fd -instance Typeable CDev -instance Typeable CIno -instance Typeable CMode -instance Typeable COff -instance Typeable CPid -instance Typeable CSsize -instance Typeable Fd -newtype Fd -type ByteCount = CSize -type ClockTick = CClock -type DeviceID = CDev -type EpochTime = CTime -type FileID = CIno -type FileMode = CMode -type FileOffset = COff -type Limit = CLong -type ProcessGroupID = CPid -type ProcessID = CPid - -module System.Process -data ProcessHandle -getProcessExitCode :: ProcessHandle -> IO (Maybe ExitCode) -runCommand :: String -> IO ProcessHandle -runInteractiveCommand :: String -> IO (Handle, Handle, Handle, ProcessHandle) -runInteractiveProcess :: FilePath -> [String] -> Maybe FilePath -> Maybe [(String, String)] -> IO (Handle, Handle, Handle, ProcessHandle) -runProcess :: FilePath -> [String] -> Maybe FilePath -> Maybe [(String, String)] -> Maybe Handle -> Maybe Handle -> Maybe Handle -> IO ProcessHandle -terminateProcess :: ProcessHandle -> IO () -waitForProcess :: ProcessHandle -> IO ExitCode - -module System.Random -class Random a -class RandomGen g -data StdGen -genRange :: RandomGen g => g -> (Int,Int) -instance RandomGen StdGen -instance Read StdGen -instance Show StdGen -next :: RandomGen g => g -> (Int,g) -random :: (Random a, RandomGen g) => g -> (a,g) -randomR :: (Random a, RandomGen g) => (a,a) -> g -> (a,g) -randomRs :: (Random a, RandomGen g) => (a,a) -> g -> [a] -randoms :: (Random a, RandomGen g) => g -> [a] -split :: RandomGen g => g -> (g,g) - -module System.Time -April :: Month -August :: Month -CalendarTime :: Int -> Month -> Int -> Int -> Int -> Int -> Integer -> Day -> Int -> String -> Int -> Bool -> CalendarTime -December :: Month -February :: Month -Friday :: Day -January :: Month -July :: Month -June :: Month -March :: Month -May :: Month -Monday :: Day -November :: Month -October :: Month -Saturday :: Day -September :: Month -Sunday :: Day -TOD :: Integer -> Integer -> ClockTime -Thursday :: Day -TimeDiff :: Int -> Int -> Int -> Int -> Int -> Int -> Integer -> TimeDiff -Tuesday :: Day -Wednesday :: Day -ctDay :: CalendarTime -> Int -ctHour :: CalendarTime -> Int -ctIsDST :: CalendarTime -> Bool -ctMin :: CalendarTime -> Int -ctMonth :: CalendarTime -> Month -ctPicosec :: CalendarTime -> Integer -ctSec :: CalendarTime -> Int -ctTZ :: CalendarTime -> Int -ctTZName :: CalendarTime -> String -ctWDay :: CalendarTime -> Day -ctYDay :: CalendarTime -> Int -ctYear :: CalendarTime -> Int -data CalendarTime -data ClockTime -data Day -data Month -data TimeDiff -formatTimeDiff :: TimeLocale -> String -> TimeDiff -> String -instance Bounded Day -instance Bounded Month -instance Enum Day -instance Enum Month -instance Eq CalendarTime -instance Eq ClockTime -instance Eq Day -instance Eq Month -instance Eq TimeDiff -instance Ix Day -instance Ix Month -instance Ord CalendarTime -instance Ord ClockTime -instance Ord Day -instance Ord Month -instance Ord TimeDiff -instance Read CalendarTime -instance Read Day -instance Read Month -instance Read TimeDiff -instance Show CalendarTime -instance Show ClockTime -instance Show Day -instance Show Month -instance Show TimeDiff -noTimeDiff :: TimeDiff -normalizeTimeDiff :: TimeDiff -> TimeDiff -tdDay :: TimeDiff -> Int -tdHour :: TimeDiff -> Int -tdMin :: TimeDiff -> Int -tdMonth :: TimeDiff -> Int -tdPicosec :: TimeDiff -> Integer -tdSec :: TimeDiff -> Int -tdYear :: TimeDiff -> Int -timeDiffToString :: TimeDiff -> String - -module System.Win32.DLL -c_DisableThreadLibraryCalls :: HMODULE -> IO Bool -c_FreeLibrary :: HMODULE -> IO Bool -c_GetModuleFileName :: HMODULE -> LPTSTR -> Int -> IO Bool -c_GetModuleHandle :: LPCTSTR -> IO HMODULE -c_GetProcAddress :: HMODULE -> LPCSTR -> IO Addr -c_LoadLibrary :: LPCTSTR -> IO HINSTANCE -c_LoadLibraryEx :: LPCTSTR -> HANDLE -> LoadLibraryFlags -> IO HINSTANCE -disableThreadLibraryCalls :: HMODULE -> IO () -freeLibrary :: HMODULE -> IO () -getModuleFileName :: HMODULE -> IO String -getModuleHandle :: Maybe String -> IO HMODULE -getProcAddress :: HMODULE -> String -> IO Addr -lOAD_LIBRARY_AS_DATAFILE :: LoadLibraryFlags -lOAD_WITH_ALTERED_SEARCH_PATH :: LoadLibraryFlags -loadLibrary :: String -> IO HINSTANCE -loadLibraryEx :: String -> HANDLE -> LoadLibraryFlags -> IO HINSTANCE -type LoadLibraryFlags = DWORD - -module System.Win32.File -aCCESS_SYSTEM_SECURITY :: AccessMode -areFileApisANSI :: IO Bool -cREATE_ALWAYS :: CreateMode -cREATE_NEW :: CreateMode -c_CloseHandle :: HANDLE -> IO Bool -c_CopyFile :: LPCTSTR -> LPCTSTR -> Bool -> IO Bool -c_CreateDirectory :: LPCTSTR -> LPSECURITY_ATTRIBUTES -> IO Bool -c_CreateDirectoryEx :: LPCTSTR -> LPCTSTR -> LPSECURITY_ATTRIBUTES -> IO Bool -c_CreateFile :: LPCTSTR -> AccessMode -> ShareMode -> LPSECURITY_ATTRIBUTES -> CreateMode -> FileAttributeOrFlag -> HANDLE -> IO HANDLE -c_DefineDosDevice :: DefineDosDeviceFlags -> LPCTSTR -> LPCTSTR -> IO Bool -c_DeleteFile :: LPCTSTR -> IO Bool -c_FindCloseChangeNotification :: HANDLE -> IO Bool -c_FindFirstChangeNotification :: LPCTSTR -> Bool -> FileNotificationFlag -> IO HANDLE -c_FindNextChangeNotification :: HANDLE -> IO Bool -c_FlushFileBuffers :: HANDLE -> IO Bool -c_GetBinaryType :: LPCTSTR -> Ptr DWORD -> IO Bool -c_GetDiskFreeSpace :: LPCTSTR -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> IO Bool -c_GetFileAttributes :: LPCTSTR -> IO FileAttributeOrFlag -c_GetLogicalDrives :: IO DWORD -c_MoveFile :: LPCTSTR -> LPCTSTR -> IO Bool -c_MoveFileEx :: LPCTSTR -> LPCTSTR -> MoveFileFlag -> IO Bool -c_ReadFile :: HANDLE -> Ptr a -> DWORD -> Ptr DWORD -> LPOVERLAPPED -> IO Bool -c_RemoveDirectory :: LPCTSTR -> IO Bool -c_SetCurrentDirectory :: LPCTSTR -> IO Bool -c_SetEndOfFile :: HANDLE -> IO Bool -c_SetFileAttributes :: LPCTSTR -> FileAttributeOrFlag -> IO Bool -c_SetVolumeLabel :: LPCTSTR -> LPCTSTR -> IO Bool -c_WriteFile :: HANDLE -> Ptr a -> DWORD -> Ptr DWORD -> LPOVERLAPPED -> IO Bool -closeHandle :: HANDLE -> IO () -copyFile :: String -> String -> Bool -> IO () -createDirectory :: String -> Maybe LPSECURITY_ATTRIBUTES -> IO () -createDirectoryEx :: String -> String -> Maybe LPSECURITY_ATTRIBUTES -> IO () -createFile :: String -> AccessMode -> ShareMode -> Maybe LPSECURITY_ATTRIBUTES -> CreateMode -> FileAttributeOrFlag -> Maybe HANDLE -> IO HANDLE -dDD_EXACT_MATCH_ON_REMOVE :: DefineDosDeviceFlags -dDD_RAW_TARGET_PATH :: DefineDosDeviceFlags -dDD_REMOVE_DEFINITION :: DefineDosDeviceFlags -dELETE :: AccessMode -dRIVE_CDROM :: DriveType -dRIVE_FIXED :: DriveType -dRIVE_NO_ROOT_DIR :: DriveType -dRIVE_RAMDISK :: DriveType -dRIVE_REMOTE :: DriveType -dRIVE_REMOVABLE :: DriveType -dRIVE_UNKNOWN :: DriveType -defineDosDevice :: DefineDosDeviceFlags -> String -> String -> IO () -deleteFile :: String -> IO () -fILE_ATTRIBUTE_ARCHIVE :: FileAttributeOrFlag -fILE_ATTRIBUTE_COMPRESSED :: FileAttributeOrFlag -fILE_ATTRIBUTE_DIRECTORY :: FileAttributeOrFlag -fILE_ATTRIBUTE_HIDDEN :: FileAttributeOrFlag -fILE_ATTRIBUTE_NORMAL :: FileAttributeOrFlag -fILE_ATTRIBUTE_READONLY :: FileAttributeOrFlag -fILE_ATTRIBUTE_SYSTEM :: FileAttributeOrFlag -fILE_ATTRIBUTE_TEMPORARY :: FileAttributeOrFlag -fILE_BEGIN :: FilePtrDirection -fILE_CURRENT :: FilePtrDirection -fILE_END :: FilePtrDirection -fILE_FLAG_BACKUP_SEMANTICS :: FileAttributeOrFlag -fILE_FLAG_DELETE_ON_CLOSE :: FileAttributeOrFlag -fILE_FLAG_NO_BUFFERING :: FileAttributeOrFlag -fILE_FLAG_OVERLAPPED :: FileAttributeOrFlag -fILE_FLAG_POSIX_SEMANTICS :: FileAttributeOrFlag -fILE_FLAG_RANDOM_ACCESS :: FileAttributeOrFlag -fILE_FLAG_SEQUENTIAL_SCAN :: FileAttributeOrFlag -fILE_FLAG_WRITE_THROUGH :: FileAttributeOrFlag -fILE_NOTIFY_CHANGE_ATTRIBUTES :: FileNotificationFlag -fILE_NOTIFY_CHANGE_DIR_NAME :: FileNotificationFlag -fILE_NOTIFY_CHANGE_FILE_NAME :: FileNotificationFlag -fILE_NOTIFY_CHANGE_LAST_WRITE :: FileNotificationFlag -fILE_NOTIFY_CHANGE_SECURITY :: FileNotificationFlag -fILE_NOTIFY_CHANGE_SIZE :: FileNotificationFlag -fILE_SHARE_NONE :: ShareMode -fILE_SHARE_READ :: ShareMode -fILE_SHARE_WRITE :: ShareMode -fILE_TYPE_CHAR :: FileType -fILE_TYPE_DISK :: FileType -fILE_TYPE_PIPE :: FileType -fILE_TYPE_REMOTE :: FileType -fILE_TYPE_UNKNOWN :: FileType -findCloseChangeNotification :: HANDLE -> IO () -findFirstChangeNotification :: String -> Bool -> FileNotificationFlag -> IO HANDLE -findNextChangeNotification :: HANDLE -> IO () -flushFileBuffers :: HANDLE -> IO () -gENERIC_ALL :: AccessMode -gENERIC_EXECUTE :: AccessMode -gENERIC_NONE :: AccessMode -gENERIC_READ :: AccessMode -gENERIC_WRITE :: AccessMode -getBinaryType :: String -> IO BinaryType -getDiskFreeSpace :: Maybe String -> IO (DWORD, DWORD, DWORD, DWORD) -getFileAttributes :: String -> IO FileAttributeOrFlag -getFileType :: HANDLE -> IO FileType -getLogicalDrives :: IO DWORD -mAXIMUM_ALLOWED :: AccessMode -mOVEFILE_COPY_ALLOWED :: MoveFileFlag -mOVEFILE_DELAY_UNTIL_REBOOT :: MoveFileFlag -mOVEFILE_REPLACE_EXISTING :: MoveFileFlag -moveFile :: String -> String -> IO () -moveFileEx :: String -> String -> MoveFileFlag -> IO () -oPEN_ALWAYS :: CreateMode -oPEN_EXISTING :: CreateMode -rEAD_CONTROL :: AccessMode -removeDirectory :: String -> IO () -sCS_32BIT_BINARY :: BinaryType -sCS_DOS_BINARY :: BinaryType -sCS_OS216_BINARY :: BinaryType -sCS_PIF_BINARY :: BinaryType -sCS_POSIX_BINARY :: BinaryType -sCS_WOW_BINARY :: BinaryType -sECURITY_ANONYMOUS :: FileAttributeOrFlag -sECURITY_CONTEXT_TRACKING :: FileAttributeOrFlag -sECURITY_DELEGATION :: FileAttributeOrFlag -sECURITY_EFFECTIVE_ONLY :: FileAttributeOrFlag -sECURITY_IDENTIFICATION :: FileAttributeOrFlag -sECURITY_IMPERSONATION :: FileAttributeOrFlag -sECURITY_SQOS_PRESENT :: FileAttributeOrFlag -sECURITY_VALID_SQOS_FLAGS :: FileAttributeOrFlag -sPECIFIC_RIGHTS_ALL :: AccessMode -sTANDARD_RIGHTS_ALL :: AccessMode -sTANDARD_RIGHTS_EXECUTE :: AccessMode -sTANDARD_RIGHTS_READ :: AccessMode -sTANDARD_RIGHTS_REQUIRED :: AccessMode -sTANDARD_RIGHTS_WRITE :: AccessMode -sYNCHRONIZE :: AccessMode -setCurrentDirectory :: String -> IO () -setEndOfFile :: HANDLE -> IO () -setFileApisToANSI :: IO () -setFileApisToOEM :: IO () -setFileAttributes :: String -> FileAttributeOrFlag -> IO () -setHandleCount :: UINT -> IO UINT -setVolumeLabel :: String -> String -> IO () -tRUNCATE_EXISTING :: CreateMode -type AccessMode = UINT -type BinaryType = DWORD -type CreateMode = UINT -type DefineDosDeviceFlags = DWORD -type DriveType = UINT -type FileAttributeOrFlag = UINT -type FileNotificationFlag = DWORD -type FilePtrDirection = DWORD -type FileType = DWORD -type LPOVERLAPPED = Ptr () -type LPSECURITY_ATTRIBUTES = Ptr () -type MbLPOVERLAPPED = Maybe LPOVERLAPPED -type MbLPSECURITY_ATTRIBUTES = Maybe LPSECURITY_ATTRIBUTES -type MoveFileFlag = DWORD -type ShareMode = UINT -wRITE_DAC :: AccessMode -wRITE_OWNER :: AccessMode -win32_ReadFile :: HANDLE -> Ptr a -> DWORD -> Maybe LPOVERLAPPED -> IO DWORD -win32_WriteFile :: HANDLE -> Ptr a -> DWORD -> Maybe LPOVERLAPPED -> IO DWORD - -module System.Win32.Info -cOLOR_ACTIVEBORDER :: SystemColor -cOLOR_ACTIVECAPTION :: SystemColor -cOLOR_APPWORKSPACE :: SystemColor -cOLOR_BACKGROUND :: SystemColor -cOLOR_BTNFACE :: SystemColor -cOLOR_BTNHIGHLIGHT :: SystemColor -cOLOR_BTNSHADOW :: SystemColor -cOLOR_BTNTEXT :: SystemColor -cOLOR_CAPTIONTEXT :: SystemColor -cOLOR_GRAYTEXT :: SystemColor -cOLOR_HIGHLIGHT :: SystemColor -cOLOR_HIGHLIGHTTEXT :: SystemColor -cOLOR_INACTIVEBORDER :: SystemColor -cOLOR_INACTIVECAPTION :: SystemColor -cOLOR_INACTIVECAPTIONTEXT :: SystemColor -cOLOR_MENU :: SystemColor -cOLOR_MENUTEXT :: SystemColor -cOLOR_SCROLLBAR :: SystemColor -cOLOR_WINDOW :: SystemColor -cOLOR_WINDOWFRAME :: SystemColor -cOLOR_WINDOWTEXT :: SystemColor -sM_ARRANGE :: SMSetting -sM_CLEANBOOT :: SMSetting -sM_CMETRICS :: SMSetting -sM_CMOUSEBUTTONS :: SMSetting -sM_CXBORDER :: SMSetting -sM_CXCURSOR :: SMSetting -sM_CXDLGFRAME :: SMSetting -sM_CXDOUBLECLK :: SMSetting -sM_CXDRAG :: SMSetting -sM_CXEDGE :: SMSetting -sM_CXFRAME :: SMSetting -sM_CXFULLSCREEN :: SMSetting -sM_CXHSCROLL :: SMSetting -sM_CXICON :: SMSetting -sM_CXICONSPACING :: SMSetting -sM_CXMAXIMIZED :: SMSetting -sM_CXMENUCHECK :: SMSetting -sM_CXMENUSIZE :: SMSetting -sM_CXMIN :: SMSetting -sM_CXMINIMIZED :: SMSetting -sM_CXMINTRACK :: SMSetting -sM_CXSCREEN :: SMSetting -sM_CXSIZE :: SMSetting -sM_CXSIZEFRAME :: SMSetting -sM_CXSMICON :: SMSetting -sM_CXSMSIZE :: SMSetting -sM_CXVSCROLL :: SMSetting -sM_CYBORDER :: SMSetting -sM_CYCAPTION :: SMSetting -sM_CYCURSOR :: SMSetting -sM_CYDLGFRAME :: SMSetting -sM_CYDOUBLECLK :: SMSetting -sM_CYDRAG :: SMSetting -sM_CYEDGE :: SMSetting -sM_CYFRAME :: SMSetting -sM_CYFULLSCREEN :: SMSetting -sM_CYHSCROLL :: SMSetting -sM_CYICON :: SMSetting -sM_CYICONSPACING :: SMSetting -sM_CYKANJIWINDOW :: SMSetting -sM_CYMAXIMIZED :: SMSetting -sM_CYMENU :: SMSetting -sM_CYMENUCHECK :: SMSetting -sM_CYMENUSIZE :: SMSetting -sM_CYMIN :: SMSetting -sM_CYMINIMIZED :: SMSetting -sM_CYMINTRACK :: SMSetting -sM_CYSCREEN :: SMSetting -sM_CYSIZE :: SMSetting -sM_CYSIZEFRAME :: SMSetting -sM_CYSMCAPTION :: SMSetting -sM_CYSMICON :: SMSetting -sM_CYSMSIZE :: SMSetting -sM_CYVSCROLL :: SMSetting -sM_CYVTHUMB :: SMSetting -sM_DBCSENABLED :: SMSetting -sM_DEBUG :: SMSetting -sM_MENUDROPALIGNMENT :: SMSetting -sM_MIDEASTENABLED :: SMSetting -sM_MOUSEPRESENT :: SMSetting -sM_NETWORK :: SMSetting -sM_PENWINDOWS :: SMSetting -sM_SECURE :: SMSetting -sM_SHOWSOUNDS :: SMSetting -sM_SLOWMACHINE :: SMSetting -sM_SWAPBUTTON :: SMSetting -type SMSetting = UINT -type SystemColor = UINT - -module System.Win32.Mem -c_GlobalAlloc :: GlobalAllocFlags -> DWORD -> IO HGLOBAL -c_GlobalFlags :: HGLOBAL -> IO GlobalAllocFlags -c_GlobalFree :: HGLOBAL -> IO HGLOBAL -c_GlobalHandle :: Addr -> IO HGLOBAL -c_GlobalLock :: HGLOBAL -> IO Addr -c_GlobalReAlloc :: HGLOBAL -> DWORD -> GlobalAllocFlags -> IO HGLOBAL -c_GlobalSize :: HGLOBAL -> IO DWORD -c_GlobalUnlock :: HGLOBAL -> IO Bool -c_HeapAlloc :: HANDLE -> HeapAllocFlags -> DWORD -> IO Addr -c_HeapCompact :: HANDLE -> HeapAllocFlags -> IO UINT -c_HeapCreate :: HeapAllocFlags -> DWORD -> DWORD -> IO HANDLE -c_HeapDestroy :: HANDLE -> IO Bool -c_HeapFree :: HANDLE -> HeapAllocFlags -> Addr -> IO Bool -c_HeapLock :: HANDLE -> IO Bool -c_HeapReAlloc :: HANDLE -> HeapAllocFlags -> Addr -> DWORD -> IO Addr -c_HeapSize :: HANDLE -> HeapAllocFlags -> Addr -> IO DWORD -c_HeapUnlock :: HANDLE -> IO Bool -c_VirtualAlloc :: Addr -> DWORD -> DWORD -> DWORD -> IO Addr -c_VirtualFree :: Addr -> DWORD -> FreeFlags -> IO Bool -c_VirtualLock :: Addr -> DWORD -> IO Bool -c_VirtualProtect :: Addr -> DWORD -> DWORD -> Ptr DWORD -> IO Bool -c_VirtualProtectEx :: HANDLE -> Addr -> DWORD -> DWORD -> Ptr DWORD -> IO Bool -c_VirtualUnlock :: Addr -> DWORD -> IO Bool -copyMemory :: Ptr a -> Ptr a -> DWORD -> IO () -fillMemory :: Ptr a -> DWORD -> BYTE -> IO () -gHND :: GlobalAllocFlags -gMEM_DDESHARE :: GlobalAllocFlags -gMEM_FIXED :: GlobalAllocFlags -gMEM_INVALID_HANDLE :: GlobalAllocFlags -gMEM_LOWER :: GlobalAllocFlags -gMEM_MOVEABLE :: GlobalAllocFlags -gMEM_NOCOMPACT :: GlobalAllocFlags -gMEM_NODISCARD :: GlobalAllocFlags -gMEM_NOTIFY :: GlobalAllocFlags -gMEM_NOT_BANKED :: GlobalAllocFlags -gMEM_SHARE :: GlobalAllocFlags -gMEM_ZEROINIT :: GlobalAllocFlags -gPTR :: GlobalAllocFlags -getProcessHeap :: IO HANDLE -getProcessHeaps :: DWORD -> Addr -> IO DWORD -globalAlloc :: GlobalAllocFlags -> DWORD -> IO HGLOBAL -globalFlags :: HGLOBAL -> IO GlobalAllocFlags -globalFree :: HGLOBAL -> IO HGLOBAL -globalHandle :: Addr -> IO HGLOBAL -globalLock :: HGLOBAL -> IO Addr -globalReAlloc :: HGLOBAL -> DWORD -> GlobalAllocFlags -> IO HGLOBAL -globalSize :: HGLOBAL -> IO DWORD -globalUnlock :: HGLOBAL -> IO () -hEAP_GENERATE_EXCEPTIONS :: HeapAllocFlags -hEAP_NO_SERIALIZE :: HeapAllocFlags -hEAP_ZERO_MEMORY :: HeapAllocFlags -heapAlloc :: HANDLE -> HeapAllocFlags -> DWORD -> IO Addr -heapCompact :: HANDLE -> HeapAllocFlags -> IO UINT -heapCreate :: HeapAllocFlags -> DWORD -> DWORD -> IO HANDLE -heapDestroy :: HANDLE -> IO () -heapFree :: HANDLE -> HeapAllocFlags -> Addr -> IO () -heapLock :: HANDLE -> IO () -heapReAlloc :: HANDLE -> HeapAllocFlags -> Addr -> DWORD -> IO Addr -heapSize :: HANDLE -> HeapAllocFlags -> Addr -> IO DWORD -heapUnlock :: HANDLE -> IO () -heapValidate :: HANDLE -> HeapAllocFlags -> Addr -> IO Bool -mEM_COMMIT :: VirtualAllocFlags -mEM_DECOMMIT :: FreeFlags -mEM_RELEASE :: FreeFlags -mEM_RESERVE :: VirtualAllocFlags -memset :: Ptr a -> CInt -> CSize -> IO () -moveMemory :: Ptr a -> Ptr a -> DWORD -> IO () -pAGE_EXECUTE :: ProtectFlags -pAGE_EXECUTE_READ :: ProtectFlags -pAGE_EXECUTE_READWRITE :: ProtectFlags -pAGE_GUARD :: ProtectFlags -pAGE_NOACCESS :: ProtectFlags -pAGE_NOCACHE :: ProtectFlags -pAGE_READONLY :: ProtectFlags -pAGE_READWRITE :: ProtectFlags -type FreeFlags = DWORD -type GlobalAllocFlags = UINT -type HGLOBAL = Addr -type HeapAllocFlags = DWORD -type ProtectFlags = DWORD -type VirtualAllocFlags = DWORD -virtualAlloc :: Addr -> DWORD -> VirtualAllocFlags -> ProtectFlags -> IO Addr -virtualFree :: Addr -> DWORD -> FreeFlags -> IO () -virtualLock :: Addr -> DWORD -> IO () -virtualProtect :: Addr -> DWORD -> ProtectFlags -> IO ProtectFlags -virtualProtectEx :: HANDLE -> Addr -> DWORD -> ProtectFlags -> IO ProtectFlags -virtualUnlock :: Addr -> DWORD -> IO () -zeroMemory :: Ptr a -> DWORD -> IO () - -module System.Win32.NLS -cP_ACP :: CodePage -cP_MACCP :: CodePage -cP_OEMCP :: CodePage -c_LCMapString :: LCID -> LCMapFlags -> LPCTSTR -> Int -> LPCTSTR -> Int -> IO Int -c_SetLocaleInfo :: LCID -> LCTYPE -> LPCTSTR -> IO Bool -convertDefaultLocale :: LCID -> IO LCID -getACP :: IO CodePage -getOEMCP :: CodePage -getSystemDefaultLCID :: LCID -getSystemDefaultLangID :: LANGID -getThreadLocale :: IO LCID -getUserDefaultLCID :: LCID -getUserDefaultLangID :: LANGID -isValidCodePage :: CodePage -> IO Bool -isValidLocale :: LCID -> LocaleTestFlags -> IO Bool -lANGIDFROMLCID :: LCID -> LANGID -lANG_AFRIKAANS :: PrimaryLANGID -lANG_ALBANIAN :: PrimaryLANGID -lANG_ARABIC :: PrimaryLANGID -lANG_ARMENIAN :: PrimaryLANGID -lANG_ASSAMESE :: PrimaryLANGID -lANG_AZERI :: PrimaryLANGID -lANG_BASQUE :: PrimaryLANGID -lANG_BELARUSIAN :: PrimaryLANGID -lANG_BENGALI :: PrimaryLANGID -lANG_BULGARIAN :: PrimaryLANGID -lANG_CATALAN :: PrimaryLANGID -lANG_CHINESE :: PrimaryLANGID -lANG_CROATIAN :: PrimaryLANGID -lANG_CZECH :: PrimaryLANGID -lANG_DANISH :: PrimaryLANGID -lANG_DUTCH :: PrimaryLANGID -lANG_ENGLISH :: PrimaryLANGID -lANG_ESTONIAN :: PrimaryLANGID -lANG_FAEROESE :: PrimaryLANGID -lANG_FARSI :: PrimaryLANGID -lANG_FINNISH :: PrimaryLANGID -lANG_FRENCH :: PrimaryLANGID -lANG_GEORGIAN :: PrimaryLANGID -lANG_GERMAN :: PrimaryLANGID -lANG_GREEK :: PrimaryLANGID -lANG_GUJARATI :: PrimaryLANGID -lANG_HEBREW :: PrimaryLANGID -lANG_HINDI :: PrimaryLANGID -lANG_HUNGARIAN :: PrimaryLANGID -lANG_ICELANDIC :: PrimaryLANGID -lANG_INDONESIAN :: PrimaryLANGID -lANG_ITALIAN :: PrimaryLANGID -lANG_JAPANESE :: PrimaryLANGID -lANG_KANNADA :: PrimaryLANGID -lANG_KASHMIRI :: PrimaryLANGID -lANG_KAZAK :: PrimaryLANGID -lANG_KONKANI :: PrimaryLANGID -lANG_KOREAN :: PrimaryLANGID -lANG_LATVIAN :: PrimaryLANGID -lANG_LITHUANIAN :: PrimaryLANGID -lANG_MACEDONIAN :: PrimaryLANGID -lANG_MALAY :: PrimaryLANGID -lANG_MALAYALAM :: PrimaryLANGID -lANG_MANIPURI :: PrimaryLANGID -lANG_MARATHI :: PrimaryLANGID -lANG_NEPALI :: PrimaryLANGID -lANG_NEUTRAL :: PrimaryLANGID -lANG_NORWEGIAN :: PrimaryLANGID -lANG_ORIYA :: PrimaryLANGID -lANG_POLISH :: PrimaryLANGID -lANG_PORTUGUESE :: PrimaryLANGID -lANG_PUNJABI :: PrimaryLANGID -lANG_ROMANIAN :: PrimaryLANGID -lANG_RUSSIAN :: PrimaryLANGID -lANG_SANSKRIT :: PrimaryLANGID -lANG_SERBIAN :: PrimaryLANGID -lANG_SINDHI :: PrimaryLANGID -lANG_SLOVAK :: PrimaryLANGID -lANG_SLOVENIAN :: PrimaryLANGID -lANG_SPANISH :: PrimaryLANGID -lANG_SWAHILI :: PrimaryLANGID -lANG_SWEDISH :: PrimaryLANGID -lANG_TAMIL :: PrimaryLANGID -lANG_TATAR :: PrimaryLANGID -lANG_TELUGU :: PrimaryLANGID -lANG_THAI :: PrimaryLANGID -lANG_TURKISH :: PrimaryLANGID -lANG_URDU :: PrimaryLANGID -lANG_UZBEK :: PrimaryLANGID -lANG_VIETNAMESE :: PrimaryLANGID -lCID_INSTALLED :: LocaleTestFlags -lCID_SUPPORTED :: LocaleTestFlags -lCMAP_BYTEREV :: LCMapFlags -lCMAP_FULLWIDTH :: LCMapFlags -lCMAP_HALFWIDTH :: LCMapFlags -lCMAP_HIRAGANA :: LCMapFlags -lCMAP_KATAKANA :: LCMapFlags -lCMAP_LINGUISTIC_CASING :: LCMapFlags -lCMAP_LOWERCASE :: LCMapFlags -lCMAP_SIMPLIFIED_CHINESE :: LCMapFlags -lCMAP_SORTKEY :: LCMapFlags -lCMAP_TRADITIONAL_CHINESE :: LCMapFlags -lCMAP_UPPERCASE :: LCMapFlags -lCMapString :: LCID -> LCMapFlags -> String -> Int -> IO String -lOCALE_ICALENDARTYPE :: LCTYPE -lOCALE_ICURRDIGITS :: LCTYPE -lOCALE_ICURRENCY :: LCTYPE -lOCALE_IDIGITS :: LCTYPE -lOCALE_IFIRSTDAYOFWEEK :: LCTYPE -lOCALE_IFIRSTWEEKOFYEAR :: LCTYPE -lOCALE_ILZERO :: LCTYPE -lOCALE_IMEASURE :: LCTYPE -lOCALE_INEGCURR :: LCTYPE -lOCALE_INEGNUMBER :: LCTYPE -lOCALE_ITIME :: LCTYPE -lOCALE_NEUTRAL :: LCID -lOCALE_S1159 :: LCTYPE -lOCALE_S2359 :: LCTYPE -lOCALE_SCURRENCY :: LCTYPE -lOCALE_SDATE :: LCTYPE -lOCALE_SDECIMAL :: LCTYPE -lOCALE_SGROUPING :: LCTYPE -lOCALE_SLIST :: LCTYPE -lOCALE_SLONGDATE :: LCTYPE -lOCALE_SMONDECIMALSEP :: LCTYPE -lOCALE_SMONGROUPING :: LCTYPE -lOCALE_SMONTHOUSANDSEP :: LCTYPE -lOCALE_SNEGATIVESIGN :: LCTYPE -lOCALE_SPOSITIVESIGN :: LCTYPE -lOCALE_SSHORTDATE :: LCTYPE -lOCALE_STHOUSAND :: LCTYPE -lOCALE_STIME :: LCTYPE -lOCALE_STIMEFORMAT :: LCTYPE -lOCALE_SYSTEM_DEFAULT :: LCID -lOCALE_USER_DEFAULT :: LCID -mAKELANGID :: PrimaryLANGID -> SubLANGID -> LANGID -mAKELCID :: LANGID -> SortID -> LCID -nORM_IGNORECASE :: LCMapFlags -nORM_IGNOREKANATYPE :: LCMapFlags -nORM_IGNORENONSPACE :: LCMapFlags -nORM_IGNORESYMBOLS :: LCMapFlags -nORM_IGNOREWIDTH :: LCMapFlags -pRIMARYLANGID :: LANGID -> PrimaryLANGID -sORTIDFROMLCID :: LCID -> SortID -sORT_CHINESE_BIG5 :: SortID -sORT_CHINESE_UNICODE :: SortID -sORT_DEFAULT :: SortID -sORT_JAPANESE_UNICODE :: SortID -sORT_JAPANESE_XJIS :: SortID -sORT_KOREAN_KSC :: SortID -sORT_KOREAN_UNICODE :: SortID -sORT_STRINGSORT :: LCMapFlags -sUBLANGID :: LANGID -> SubLANGID -sUBLANG_ARABIC_ALGERIA :: SubLANGID -sUBLANG_ARABIC_BAHRAIN :: SubLANGID -sUBLANG_ARABIC_EGYPT :: SubLANGID -sUBLANG_ARABIC_IRAQ :: SubLANGID -sUBLANG_ARABIC_JORDAN :: SubLANGID -sUBLANG_ARABIC_KUWAIT :: SubLANGID -sUBLANG_ARABIC_LEBANON :: SubLANGID -sUBLANG_ARABIC_LIBYA :: SubLANGID -sUBLANG_ARABIC_MOROCCO :: SubLANGID -sUBLANG_ARABIC_OMAN :: SubLANGID -sUBLANG_ARABIC_QATAR :: SubLANGID -sUBLANG_ARABIC_SAUDI_ARABIA :: SubLANGID -sUBLANG_ARABIC_SYRIA :: SubLANGID -sUBLANG_ARABIC_TUNISIA :: SubLANGID -sUBLANG_ARABIC_UAE :: SubLANGID -sUBLANG_ARABIC_YEMEN :: SubLANGID -sUBLANG_AZERI_CYRILLIC :: SubLANGID -sUBLANG_AZERI_LATIN :: SubLANGID -sUBLANG_CHINESE_HONGKONG :: SubLANGID -sUBLANG_CHINESE_MACAU :: SubLANGID -sUBLANG_CHINESE_SIMPLIFIED :: SubLANGID -sUBLANG_CHINESE_SINGAPORE :: SubLANGID -sUBLANG_CHINESE_TRADITIONAL :: SubLANGID -sUBLANG_DEFAULT :: SubLANGID -sUBLANG_DUTCH :: SubLANGID -sUBLANG_DUTCH_BELGIAN :: SubLANGID -sUBLANG_ENGLISH_AUS :: SubLANGID -sUBLANG_ENGLISH_BELIZE :: SubLANGID -sUBLANG_ENGLISH_CAN :: SubLANGID -sUBLANG_ENGLISH_CARIBBEAN :: SubLANGID -sUBLANG_ENGLISH_EIRE :: SubLANGID -sUBLANG_ENGLISH_JAMAICA :: SubLANGID -sUBLANG_ENGLISH_NZ :: SubLANGID -sUBLANG_ENGLISH_PHILIPPINES :: SubLANGID -sUBLANG_ENGLISH_SOUTH_AFRICA :: SubLANGID -sUBLANG_ENGLISH_TRINIDAD :: SubLANGID -sUBLANG_ENGLISH_UK :: SubLANGID -sUBLANG_ENGLISH_US :: SubLANGID -sUBLANG_ENGLISH_ZIMBABWE :: SubLANGID -sUBLANG_FRENCH :: SubLANGID -sUBLANG_FRENCH_BELGIAN :: SubLANGID -sUBLANG_FRENCH_CANADIAN :: SubLANGID -sUBLANG_FRENCH_LUXEMBOURG :: SubLANGID -sUBLANG_FRENCH_MONACO :: SubLANGID -sUBLANG_FRENCH_SWISS :: SubLANGID -sUBLANG_GERMAN :: SubLANGID -sUBLANG_GERMAN_AUSTRIAN :: SubLANGID -sUBLANG_GERMAN_LIECHTENSTEIN :: SubLANGID -sUBLANG_GERMAN_LUXEMBOURG :: SubLANGID -sUBLANG_GERMAN_SWISS :: SubLANGID -sUBLANG_ITALIAN :: SubLANGID -sUBLANG_ITALIAN_SWISS :: SubLANGID -sUBLANG_KASHMIRI_INDIA :: SubLANGID -sUBLANG_KOREAN :: SubLANGID -sUBLANG_LITHUANIAN :: SubLANGID -sUBLANG_MALAY_BRUNEI_DARUSSALAM :: SubLANGID -sUBLANG_MALAY_MALAYSIA :: SubLANGID -sUBLANG_NEPALI_INDIA :: SubLANGID -sUBLANG_NEUTRAL :: SubLANGID -sUBLANG_NORWEGIAN_BOKMAL :: SubLANGID -sUBLANG_NORWEGIAN_NYNORSK :: SubLANGID -sUBLANG_PORTUGUESE :: SubLANGID -sUBLANG_PORTUGUESE_BRAZILIAN :: SubLANGID -sUBLANG_SERBIAN_CYRILLIC :: SubLANGID -sUBLANG_SERBIAN_LATIN :: SubLANGID -sUBLANG_SPANISH :: SubLANGID -sUBLANG_SPANISH_ARGENTINA :: SubLANGID -sUBLANG_SPANISH_BOLIVIA :: SubLANGID -sUBLANG_SPANISH_CHILE :: SubLANGID -sUBLANG_SPANISH_COLOMBIA :: SubLANGID -sUBLANG_SPANISH_COSTA_RICA :: SubLANGID -sUBLANG_SPANISH_DOMINICAN_REPUBLIC :: SubLANGID -sUBLANG_SPANISH_ECUADOR :: SubLANGID -sUBLANG_SPANISH_EL_SALVADOR :: SubLANGID -sUBLANG_SPANISH_GUATEMALA :: SubLANGID -sUBLANG_SPANISH_HONDURAS :: SubLANGID -sUBLANG_SPANISH_MEXICAN :: SubLANGID -sUBLANG_SPANISH_MODERN :: SubLANGID -sUBLANG_SPANISH_NICARAGUA :: SubLANGID -sUBLANG_SPANISH_PANAMA :: SubLANGID -sUBLANG_SPANISH_PARAGUAY :: SubLANGID -sUBLANG_SPANISH_PERU :: SubLANGID -sUBLANG_SPANISH_PUERTO_RICO :: SubLANGID -sUBLANG_SPANISH_URUGUAY :: SubLANGID -sUBLANG_SPANISH_VENEZUELA :: SubLANGID -sUBLANG_SWEDISH :: SubLANGID -sUBLANG_SWEDISH_FINLAND :: SubLANGID -sUBLANG_SYS_DEFAULT :: SubLANGID -sUBLANG_URDU_INDIA :: SubLANGID -sUBLANG_URDU_PAKISTAN :: SubLANGID -sUBLANG_UZBEK_CYRILLIC :: SubLANGID -sUBLANG_UZBEK_LATIN :: SubLANGID -setLocaleInfo :: LCID -> LCTYPE -> String -> IO () -setThreadLocale :: LCID -> IO () -type CodePage = UINT -type LANGID = WORD -type LCID = DWORD -type LCMapFlags = DWORD -type LCTYPE = UINT -type LocaleTestFlags = DWORD -type PrimaryLANGID = WORD -type SortID = WORD -type SubLANGID = WORD - -module System.Win32.Process -iNFINITE :: DWORD -sleep :: DWORD -> IO () - -module System.Win32.Registry -RegInfoKey :: String -> Int -> Word32 -> Word32 -> Word32 -> Word32 -> Word32 -> Word32 -> Int -> Word32 -> Word32 -> RegInfoKey -c_RegCloseKey :: PKEY -> IO ErrCode -c_RegConnectRegistry :: LPCTSTR -> PKEY -> Ptr PKEY -> IO ErrCode -c_RegCreateKey :: PKEY -> LPCTSTR -> Ptr PKEY -> IO ErrCode -c_RegCreateKeyEx :: PKEY -> LPCTSTR -> DWORD -> LPCTSTR -> RegCreateOptions -> REGSAM -> LPSECURITY_ATTRIBUTES -> Ptr PKEY -> Ptr DWORD -> IO ErrCode -c_RegDeleteKey :: PKEY -> LPCTSTR -> IO ErrCode -c_RegDeleteValue :: PKEY -> LPCTSTR -> IO ErrCode -c_RegEnumKey :: PKEY -> DWORD -> LPTSTR -> DWORD -> IO ErrCode -c_RegEnumValue :: PKEY -> DWORD -> LPTSTR -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> LPBYTE -> Ptr DWORD -> IO ErrCode -c_RegFlushKey :: PKEY -> IO ErrCode -c_RegLoadKey :: PKEY -> LPCTSTR -> LPCTSTR -> IO ErrCode -c_RegNotifyChangeKeyValue :: PKEY -> Bool -> RegNotifyOptions -> HANDLE -> Bool -> IO ErrCode -c_RegOpenKey :: PKEY -> LPCTSTR -> Ptr PKEY -> IO ErrCode -c_RegOpenKeyEx :: PKEY -> LPCTSTR -> DWORD -> REGSAM -> Ptr PKEY -> IO ErrCode -c_RegQueryInfoKey :: PKEY -> LPTSTR -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr DWORD -> Ptr FILETIME -> IO ErrCode -c_RegQueryValue :: PKEY -> LPCTSTR -> LPTSTR -> Ptr LONG -> IO ErrCode -c_RegQueryValueEx :: PKEY -> LPCTSTR -> Ptr DWORD -> Ptr DWORD -> LPBYTE -> Ptr DWORD -> IO ErrCode -c_RegReplaceKey :: PKEY -> LPCTSTR -> LPCTSTR -> LPCTSTR -> IO ErrCode -c_RegRestoreKey :: PKEY -> LPCTSTR -> RegRestoreFlags -> IO ErrCode -c_RegSaveKey :: PKEY -> LPCTSTR -> LPSECURITY_ATTRIBUTES -> IO ErrCode -c_RegSetValue :: PKEY -> LPCTSTR -> DWORD -> LPCTSTR -> Int -> IO ErrCode -c_RegSetValueEx :: PKEY -> LPCTSTR -> DWORD -> RegValueType -> LPTSTR -> Int -> IO ErrCode -c_RegUnLoadKey :: PKEY -> LPCTSTR -> IO ErrCode -class_id :: RegInfoKey -> Int -class_string :: RegInfoKey -> String -data RegInfoKey -eRROR_NO_MORE_ITEMS :: ErrCode -hKEY_CLASSES_ROOT :: HKEY -hKEY_CURRENT_CONFIG :: HKEY -hKEY_CURRENT_USER :: HKEY -hKEY_LOCAL_MACHINE :: HKEY -hKEY_USERS :: HKEY -kEY_ALL_ACCESS :: REGSAM -kEY_CREATE_LINK :: REGSAM -kEY_CREATE_SUB_KEY :: REGSAM -kEY_ENUMERATE_SUB_KEYS :: REGSAM -kEY_EXECUTE :: REGSAM -kEY_NOTIFY :: REGSAM -kEY_QUERY_VALUE :: REGSAM -kEY_READ :: REGSAM -kEY_SET_VALUE :: REGSAM -kEY_WRITE :: REGSAM -lastWrite_hi :: RegInfoKey -> Word32 -lastWrite_lo :: RegInfoKey -> Word32 -max_class_len :: RegInfoKey -> Word32 -max_subkey_len :: RegInfoKey -> Word32 -max_value_len :: RegInfoKey -> Word32 -max_value_name_len :: RegInfoKey -> Word32 -rEG_BINARY :: RegValueType -rEG_DWORD :: RegValueType -rEG_DWORD_BIG_ENDIAN :: RegValueType -rEG_DWORD_LITTLE_ENDIAN :: RegValueType -rEG_EXPAND_SZ :: RegValueType -rEG_LINK :: RegValueType -rEG_MULTI_SZ :: RegValueType -rEG_NONE :: RegValueType -rEG_NOTIFY_CHANGE_ATTRIBUTES :: RegNotifyOptions -rEG_NOTIFY_CHANGE_LAST_SET :: RegNotifyOptions -rEG_NOTIFY_CHANGE_NAME :: RegNotifyOptions -rEG_NOTIFY_CHANGE_SECURITY :: RegNotifyOptions -rEG_NO_LAZY_FLUSH :: RegRestoreFlags -rEG_OPTION_NON_VOLATILE :: RegCreateOptions -rEG_OPTION_VOLATILE :: RegCreateOptions -rEG_REFRESH_HIVE :: RegRestoreFlags -rEG_RESOURCE_LIST :: RegValueType -rEG_SZ :: RegValueType -rEG_WHOLE_HIVE_VOLATILE :: RegRestoreFlags -regCloseKey :: HKEY -> IO () -regConnectRegistry :: Maybe String -> HKEY -> IO HKEY -regCreateKey :: HKEY -> String -> IO HKEY -regCreateKeyEx :: HKEY -> String -> String -> RegCreateOptions -> REGSAM -> Maybe LPSECURITY_ATTRIBUTES -> IO (HKEY, Bool) -regDeleteKey :: HKEY -> String -> IO () -regDeleteValue :: HKEY -> String -> IO () -regEnumKey :: HKEY -> DWORD -> LPTSTR -> DWORD -> IO (String, Int) -regEnumKeyVals :: HKEY -> IO [(String, String, RegValueType)] -regEnumKeys :: HKEY -> IO [String] -regEnumValue :: HKEY -> DWORD -> LPTSTR -> DWORD -> LPBYTE -> DWORD -> IO (RegValueType, String, Int) -regFlushKey :: HKEY -> IO () -regLoadKey :: HKEY -> String -> String -> IO () -regNotifyChangeKeyValue :: HKEY -> Bool -> RegNotifyOptions -> HANDLE -> Bool -> IO () -regOpenKey :: HKEY -> String -> IO HKEY -regOpenKeyEx :: HKEY -> String -> REGSAM -> IO HKEY -regQueryInfoKey :: HKEY -> IO RegInfoKey -regQueryValue :: HKEY -> Maybe String -> IO String -regQueryValueEx :: HKEY -> String -> LPBYTE -> Int -> IO RegValueType -regQueryValueKey :: HKEY -> Maybe String -> IO String -regReplaceKey :: HKEY -> String -> String -> String -> IO () -regRestoreKey :: HKEY -> String -> RegRestoreFlags -> IO () -regSaveKey :: HKEY -> String -> Maybe LPSECURITY_ATTRIBUTES -> IO () -regSetStringValue :: HKEY -> String -> String -> IO () -regSetValue :: HKEY -> String -> String -> IO () -regSetValueEx :: HKEY -> String -> RegValueType -> LPTSTR -> Int -> IO () -regUnLoadKey :: HKEY -> String -> IO () -sec_len :: RegInfoKey -> Int -subkeys :: RegInfoKey -> Word32 -type FILETIME = () -type REGSAM = Word32 -type RegCreateOptions = DWORD -type RegNotifyOptions = DWORD -type RegRestoreFlags = DWORD -type RegValueType = DWORD -values :: RegInfoKey -> Word32 - -module System.Win32.Types -castFunPtrToLONG :: FunPtr a -> LONG -castPtrToUINT :: Ptr s -> UINT -castUINTToPtr :: UINT -> Ptr a -deleteObject_p :: FunPtr (HANDLE -> IO ()) -errorWin :: String -> IO a -failIf :: (a -> Bool) -> String -> IO a -> IO a -failIfFalse_ :: String -> IO Bool -> IO () -failIfNull :: String -> IO (Ptr a) -> IO (Ptr a) -failIfZero :: Num a => String -> IO a -> IO a -failIf_ :: (a -> Bool) -> String -> IO a -> IO () -failUnlessSuccess :: String -> IO ErrCode -> IO () -failUnlessSuccessOr :: ErrCode -> String -> IO ErrCode -> IO Bool -failWith :: String -> ErrCode -> IO a -getErrorMessage :: DWORD -> IO LPWSTR -getLastError :: IO ErrCode -hIWORD :: DWORD -> WORD -handleToWord :: HANDLE -> UINT -lOWORD :: DWORD -> WORD -localFree :: Ptr a -> IO (Ptr a) -maybeNum :: Num a => Maybe a -> a -maybePtr :: Maybe (Ptr a) -> Ptr a -newForeignHANDLE :: HANDLE -> IO ForeignHANDLE -newTString :: String -> IO LPCTSTR -nullFinalHANDLE :: ForeignPtr a -nullHANDLE :: HANDLE -nullPtr -numToMaybe :: Num a => a -> Maybe a -peekTString :: LPCTSTR -> IO String -peekTStringLen :: (LPCTSTR, Int) -> IO String -ptrToMaybe :: Ptr a -> Maybe (Ptr a) -type ATOM = UINT -type Addr = Ptr () -type BOOL = Bool -type BYTE = Word8 -type DWORD = Word32 -type ErrCode = DWORD -type FLOAT = Float -type ForeignHANDLE = ForeignPtr () -type HANDLE = Ptr () -type HINSTANCE = Ptr () -type HKEY = ForeignHANDLE -type HMODULE = Ptr () -type INT = Int32 -type LONG = Int32 -type LPARAM = LONG -type LPBYTE = Ptr BYTE -type LPCSTR = LPSTR -type LPCTSTR = LPTSTR -type LPCTSTR_ = LPCTSTR -type LPCWSTR = LPWSTR -type LPSTR = Ptr CChar -type LPTSTR = Ptr TCHAR -type LPVOID = Ptr () -type LPWSTR = Ptr CWchar -type LRESULT = LONG -type MbATOM = Maybe ATOM -type MbHANDLE = Maybe HANDLE -type MbHINSTANCE = Maybe HINSTANCE -type MbHMODULE = Maybe HMODULE -type MbINT = Maybe INT -type MbLPCSTR = Maybe LPCSTR -type MbLPCTSTR = Maybe LPCTSTR -type MbLPVOID = Maybe LPVOID -type MbString = Maybe String -type PKEY = HANDLE -type TCHAR = CWchar -type UINT = Word32 -type USHORT = Word16 -type WORD = Word16 -type WPARAM = UINT -withTString :: String -> (LPTSTR -> IO a) -> IO a -withTStringLen :: String -> ((LPTSTR, Int) -> IO a) -> IO a - -module Test.HUnit.Base -(@=?) :: (Eq a, Show a) => a -> a -> Assertion -(@?) :: AssertionPredicable t => t -> String -> Assertion -(@?=) :: (Eq a, Show a) => a -> a -> Assertion -(~:) :: Testable t => String -> t -> Test -(~=?) :: (Eq a, Show a) => a -> a -> Test -(~?) :: AssertionPredicable t => t -> String -> Test -(~?=) :: (Eq a, Show a) => a -> a -> Test -Counts :: Int -> Int -> Int -> Int -> Counts -Label :: String -> Node -ListItem :: Int -> Node -State :: Path -> Counts -> State -TestCase :: Assertion -> Test -TestLabel :: String -> Test -> Test -TestList :: [Test] -> Test -assert :: Assertable t => t -> Assertion -assertBool :: String -> Bool -> Assertion -assertEqual :: (Eq a, Show a) => String -> a -> a -> Assertion -assertFailure :: String -> Assertion -assertString :: String -> Assertion -assertionPredicate :: AssertionPredicable t => t -> AssertionPredicate -cases :: Counts -> Int -class Assertable t -class AssertionPredicable t -class ListAssertable t -class Testable t -counts :: State -> Counts -data Counts -data Node -data State -data Test -errors :: Counts -> Int -failures :: Counts -> Int -instance Eq Counts -instance Eq Node -instance Eq State -instance Read Counts -instance Read Node -instance Read State -instance Show Counts -instance Show Node -instance Show State -instance Show Test -instance Testable Test -listAssert :: ListAssertable t => [t] -> Assertion -path :: State -> Path -performTest :: ReportStart us -> ReportProblem us -> ReportProblem us -> us -> Test -> IO (Counts, us) -test :: Testable t => t -> Test -testCaseCount :: Test -> Int -testCasePaths :: Test -> [Path] -tried :: Counts -> Int -type Assertion = IO () -type AssertionPredicate = IO Bool -type Path = [Node] -type ReportProblem us = String -> State -> us -> IO us -type ReportStart us = State -> us -> IO us - -module Test.HUnit.Lang -performTestCase :: Assertion -> IO (Maybe (Bool, String)) - -module Test.HUnit.Terminal -terminalAppearance :: String -> String - -module Test.HUnit.Text -PutText :: (String -> Bool -> st -> IO st) -> st -> PutText st -data PutText st -putTextToHandle :: Handle -> Bool -> PutText Int -putTextToShowS :: PutText ShowS -runTestTT :: Test -> IO Counts -runTestText :: PutText st -> Test -> IO (Counts, st) -showCounts :: Counts -> String -showPath :: Path -> String - -module Test.QuickCheck -(==>) :: Testable a => Bool -> a -> Property -Config :: Int -> Int -> Int -> Int -> Int -> [String] -> String -> Config -Result :: Maybe Bool -> [String] -> [String] -> Result -arbitrary :: Arbitrary a => Gen a -arguments :: Result -> [String] -check :: Testable a => Config -> a -> IO () -choose :: Random a => (a, a) -> Gen a -class Arbitrary a -class Testable a -classify :: Testable a => Bool -> String -> a -> Property -coarbitrary :: Arbitrary a => a -> Gen b -> Gen b -collect :: (Show a, Testable b) => a -> b -> Property -configEvery :: Config -> Int -> [String] -> String -configMaxFail :: Config -> Int -configMaxTest :: Config -> Int -configSize :: Config -> Int -> Int -data Config -data Gen a -data Property -data Result -defaultConfig :: Config -elements :: [a] -> Gen a -evaluate :: Testable a => a -> Gen Result -forAll :: (Show a, Testable b) => Gen a -> (a -> b) -> Property -four :: Monad m => m a -> m (a, a, a, a) -frequency :: [(Int, Gen a)] -> Gen a -generate :: Int -> StdGen -> Gen a -> a -instance Functor Gen -instance Monad Gen -instance Testable Property -instance Testable Result -label :: Testable a => String -> a -> Property -ok :: Result -> Maybe Bool -oneof :: [Gen a] -> Gen a -promote :: (a -> Gen b) -> Gen (a -> b) -property :: Testable a => a -> Property -quickCheck :: Testable a => a -> IO () -rand :: Gen StdGen -resize :: Int -> Gen a -> Gen a -sized :: (Int -> Gen a) -> Gen a -stamp :: Result -> [String] -test :: Testable a => a -> IO () -three :: Monad m => m a -> m (a, a, a) -trivial :: Testable a => Bool -> a -> Property -two :: Monad m => m a -> m (a, a) -variant :: Int -> Gen a -> Gen a -vector :: Arbitrary a => Int -> Gen [a] -verboseCheck :: Testable a => a -> IO () - -module Test.QuickCheck.Batch -TestAborted :: Exception -> TestResult -TestExausted :: String -> Int -> [[String]] -> TestResult -TestFailed :: [String] -> Int -> TestResult -TestOk :: String -> Int -> [[String]] -> TestResult -TestOptions :: Int -> Int -> Bool -> TestOptions -bottom :: a -data TestOptions -data TestResult -debug_tests :: TestOptions -> Bool -defOpt :: TestOptions -isBottom :: a -> Bool -length_of_tests :: TestOptions -> Int -no_of_tests :: TestOptions -> Int -run :: Testable a => a -> TestOptions -> IO TestResult -runTests :: String -> TestOptions -> [TestOptions -> IO TestResult] -> IO () - -module Test.QuickCheck.Poly -type ALPHA = Poly ALPHA_ -type BETA = Poly BETA_ -type GAMMA = Poly GAMMA_ -type OrdALPHA = Poly OrdALPHA_ -type OrdBETA = Poly OrdBETA_ -type OrdGAMMA = Poly OrdGAMMA_ - -module Test.QuickCheck.Utils -isAssociative :: (Arbitrary a, Show a, Eq a) => (a -> a -> a) -> Property -isAssociativeBy :: (Show a, Testable prop) => (a -> a -> prop) -> Gen a -> (a -> a -> a) -> Property -isCommutable :: (Arbitrary a, Show a, Eq b) => (a -> a -> b) -> Property -isCommutableBy :: (Show a, Testable prop) => (b -> b -> prop) -> Gen a -> (a -> a -> b) -> Property -isTotalOrder :: (Arbitrary a, Show a, Ord a) => a -> a -> Property - -module Text.Html -(!) :: ADDATTRS a => a -> [HtmlAttr] -> a -(+++) :: (HTML a, HTML b) => a -> b -> Html -(<->) :: (HTMLTABLE ht1, HTMLTABLE ht2) => ht1 -> ht2 -> HtmlTable -() :: (HTMLTABLE ht1, HTMLTABLE ht2) => ht1 -> ht2 -> HtmlTable -(<<) :: HTML a => (Html -> b) -> a -> b -HotLink :: URL -> [Html] -> [HtmlAttr] -> HotLink -Html :: [HtmlElement] -> Html -HtmlAttr :: String -> String -> HtmlAttr -HtmlLeaf :: Html -> HtmlTree -HtmlNode :: Html -> [HtmlTree] -> Html -> HtmlTree -HtmlString :: String -> HtmlElement -HtmlTable :: (BlockTable (Int -> Int -> Html)) -> HtmlTable -HtmlTag :: String -> [HtmlAttr] -> Html -> HtmlElement -above :: (HTMLTABLE ht1, HTMLTABLE ht2) => ht1 -> ht2 -> HtmlTable -aboves :: HTMLTABLE ht => [ht] -> HtmlTable -action :: String -> HtmlAttr -address :: Html -> Html -afile :: String -> Html -align :: String -> HtmlAttr -alink :: String -> HtmlAttr -alt :: String -> HtmlAttr -altcode :: String -> HtmlAttr -anchor :: Html -> Html -applet :: Html -> Html -aqua :: String -archive :: String -> HtmlAttr -area :: Html -background :: String -> HtmlAttr -base :: String -> HtmlAttr -basefont :: Html -beside :: (HTMLTABLE ht1, HTMLTABLE ht2) => ht1 -> ht2 -> HtmlTable -besides :: HTMLTABLE ht => [ht] -> HtmlTable -bgcolor :: String -> HtmlAttr -big :: Html -> Html -black :: String -blockquote :: Html -> Html -blue :: String -body :: Html -> Html -bold :: Html -> Html -border :: Int -> HtmlAttr -bordercolor :: String -> HtmlAttr -br :: Html -bullet :: Html -caption :: Html -> Html -cell :: HTMLTABLE ht => ht -> HtmlTable -cellpadding :: Int -> HtmlAttr -cellspacing :: Int -> HtmlAttr -center :: Html -> Html -checkbox :: String -> String -> Html -checked :: HtmlAttr -cite :: Html -> Html -class ADDATTRS a -class HTML a -class HTMLTABLE ht -clear :: String -> HtmlAttr -clickmap :: String -> Html -code :: String -> HtmlAttr -codebase :: String -> HtmlAttr -color :: String -> HtmlAttr -cols :: String -> HtmlAttr -colspan :: Int -> HtmlAttr -compact :: HtmlAttr -concatHtml :: HTML a => [a] -> Html -content :: String -> HtmlAttr -coords :: String -> HtmlAttr -copyright :: Html -data HotLink -data HtmlAttr -data HtmlElement -data HtmlTree -ddef :: Html -> Html -debugHtml :: HTML a => a -> Html -defList :: (HTML a, HTML b) => [(a, b)] -> Html -define :: Html -> Html -dlist :: Html -> Html -dterm :: Html -> Html -emphasize :: Html -> Html -emptyAttr :: String -> HtmlAttr -enctype :: String -> HtmlAttr -face :: String -> HtmlAttr -fieldset :: Html -> Html -font :: Html -> Html -form :: Html -> Html -frame :: Html -> Html -frameborder :: Int -> HtmlAttr -frameset :: Html -> Html -fuchsia :: String -getHtmlElements :: Html -> [HtmlElement] -gray :: String -green :: String -gui :: String -> Html -> Html -h1 :: Html -> Html -h2 :: Html -> Html -h3 :: Html -> Html -h4 :: Html -> Html -h5 :: Html -> Html -h6 :: Html -> Html -header :: Html -> Html -height :: Int -> HtmlAttr -hidden :: String -> String -> Html -hotLinkAttributes :: HotLink -> [HtmlAttr] -hotLinkContents :: HotLink -> [Html] -hotLinkURL :: HotLink -> URL -hotlink :: URL -> [Html] -> HotLink -hr :: Html -href :: String -> HtmlAttr -hspace :: Int -> HtmlAttr -httpequiv :: String -> HtmlAttr -identifier :: String -> HtmlAttr -image :: Html -input :: Html -instance ADDATTRS Html -instance HTML HotLink -instance HTML Html -instance HTML HtmlTable -instance HTML HtmlTree -instance HTMLTABLE Html -instance HTMLTABLE HtmlTable -instance Show HotLink -instance Show Html -instance Show HtmlAttr -instance Show HtmlTable -intAttr :: String -> Int -> HtmlAttr -ismap :: HtmlAttr -itag :: String -> Html -italics :: Html -> Html -keyboard :: Html -> Html -lang :: String -> HtmlAttr -legend :: Html -> Html -li :: Html -> Html -lime :: String -lineToHtml :: String -> Html -linesToHtml :: [String] -> Html -link :: String -> HtmlAttr -marginheight :: Int -> HtmlAttr -marginwidth :: Int -> HtmlAttr -markupAttrs :: HtmlElement -> [HtmlAttr] -markupContent :: HtmlElement -> Html -markupTag :: HtmlElement -> String -maroon :: String -maxlength :: Int -> HtmlAttr -menu :: String -> [Html] -> Html -meta :: Html -method :: String -> HtmlAttr -mkHtmlTable :: BlockTable (Int -> Int -> Html) -> HtmlTable -multiple :: HtmlAttr -name :: String -> HtmlAttr -navy :: String -newtype Html -newtype HtmlTable -noHtml :: Html -noframes :: Html -> Html -nohref :: HtmlAttr -noresize :: HtmlAttr -noshade :: HtmlAttr -nowrap :: HtmlAttr -olist :: Html -> Html -olive :: String -option :: Html -> Html -ordList :: HTML a => [a] -> Html -p :: Html -> Html -paragraph :: Html -> Html -param :: Html -password :: String -> Html -pre :: Html -> Html -prettyHtml :: HTML html => html -> String -prettyHtml' :: HtmlElement -> [String] -primHtml :: String -> Html -primHtmlChar :: String -> Html -purple :: String -radio :: String -> String -> Html -red :: String -rel :: String -> HtmlAttr -renderHtml :: HTML html => html -> String -renderHtml' :: Int -> HtmlElement -> ShowS -renderTable :: BlockTable (Int -> Int -> Html) -> Html -renderTag :: Bool -> String -> [HtmlAttr] -> Int -> ShowS -reset :: String -> String -> Html -rev :: String -> HtmlAttr -rows :: String -> HtmlAttr -rowspan :: Int -> HtmlAttr -rules :: String -> HtmlAttr -sample :: Html -> Html -scrolling :: String -> HtmlAttr -select :: Html -> Html -selected :: HtmlAttr -shape :: String -> HtmlAttr -silver :: String -simpleTable :: [HtmlAttr] -> [HtmlAttr] -> [[Html]] -> Html -size :: String -> HtmlAttr -small :: Html -> Html -spaceHtml :: Html -src :: String -> HtmlAttr -start :: Int -> HtmlAttr -strAttr :: String -> String -> HtmlAttr -stringToHtml :: String -> Html -stringToHtmlString :: String -> String -strong :: Html -> Html -style :: Html -> Html -sub :: Html -> Html -submit :: String -> String -> Html -sup :: Html -> Html -table :: Html -> Html -tag :: String -> Html -> Html -target :: String -> HtmlAttr -td :: Html -> Html -teal :: String -text :: String -> HtmlAttr -textarea :: Html -> Html -textfield :: String -> Html -th :: Html -> Html -thebase :: Html -theclass :: String -> HtmlAttr -thecode :: Html -> Html -thediv :: Html -> Html -thehtml :: Html -> Html -thelink :: Html -> Html -themap :: Html -> Html -thespan :: Html -> Html -thestyle :: String -> HtmlAttr -thetitle :: Html -> Html -thetype :: String -> HtmlAttr -title :: String -> HtmlAttr -toHtml :: HTML a => a -> Html -toHtmlFromList :: HTML a => [a] -> Html -tr :: Html -> Html -treeHtml :: [String] -> HtmlTree -> Html -tt :: Html -> Html -type URL = String -ulist :: Html -> Html -underline :: Html -> Html -unordList :: HTML a => [a] -> Html -usemap :: String -> HtmlAttr -validHtmlAttrs :: [String] -validHtmlITags :: [String] -validHtmlTags :: [String] -valign :: String -> HtmlAttr -value :: String -> HtmlAttr -variable :: Html -> Html -version :: String -> HtmlAttr -vlink :: String -> HtmlAttr -vspace :: Int -> HtmlAttr -white :: String -widget :: String -> String -> [HtmlAttr] -> Html -width :: String -> HtmlAttr -yellow :: String - -module Text.Html.BlockTable -above :: BlockTable a -> BlockTable a -> BlockTable a -beside :: BlockTable a -> BlockTable a -> BlockTable a -data BlockTable a -getMatrix :: BlockTable a -> [[(a, (Int, Int))]] -instance Show a => Show (BlockTable a) -showTable :: Show a => BlockTable a -> String -showsTable :: Show a => BlockTable a -> ShowS -single :: a -> BlockTable a - -module Text.ParserCombinators.Parsec -data ParseError -data SourcePos -errorPos :: ParseError -> SourcePos -incSourceColumn :: SourcePos -> Column -> SourcePos -incSourceLine :: SourcePos -> Line -> SourcePos -instance Eq SourcePos -instance Ord SourcePos -instance Show ParseError -instance Show SourcePos -setSourceColumn :: SourcePos -> Column -> SourcePos -setSourceLine :: SourcePos -> Line -> SourcePos -setSourceName :: SourcePos -> SourceName -> SourcePos -sourceColumn :: SourcePos -> Column -sourceLine :: SourcePos -> Line -sourceName :: SourcePos -> SourceName -type Column = Int -type Line = Int -type SourceName = String - -module Text.ParserCombinators.Parsec.Char -alphaNum :: CharParser st Char -anyChar :: CharParser st Char -char :: Char -> CharParser st Char -digit :: CharParser st Char -hexDigit :: CharParser st Char -letter :: CharParser st Char -lower :: CharParser st Char -newline :: CharParser st Char -noneOf :: [Char] -> CharParser st Char -octDigit :: CharParser st Char -oneOf :: [Char] -> CharParser st Char -satisfy :: (Char -> Bool) -> CharParser st Char -space :: CharParser st Char -spaces :: CharParser st () -string :: String -> CharParser st String -tab :: CharParser st Char -type CharParser st a = GenParser Char st a -upper :: CharParser st Char - -module Text.ParserCombinators.Parsec.Combinator -anyToken :: Show tok => GenParser tok st tok -between :: GenParser tok st open -> GenParser tok st close -> GenParser tok st a -> GenParser tok st a -chainl :: GenParser tok st a -> GenParser tok st (a -> a -> a) -> a -> GenParser tok st a -chainl1 :: GenParser tok st a -> GenParser tok st (a -> a -> a) -> GenParser tok st a -chainr :: GenParser tok st a -> GenParser tok st (a -> a -> a) -> a -> GenParser tok st a -chainr1 :: GenParser tok st a -> GenParser tok st (a -> a -> a) -> GenParser tok st a -choice :: [GenParser tok st a] -> GenParser tok st a -count :: Int -> GenParser tok st a -> GenParser tok st [a] -endBy :: GenParser tok st a -> GenParser tok st sep -> GenParser tok st [a] -endBy1 :: GenParser tok st a -> GenParser tok st sep -> GenParser tok st [a] -eof :: Show tok => GenParser tok st () -lookAhead :: GenParser tok st a -> GenParser tok st a -many1 :: GenParser tok st a -> GenParser tok st [a] -manyTill :: GenParser tok st a -> GenParser tok st end -> GenParser tok st [a] -notFollowedBy :: Show tok => GenParser tok st tok -> GenParser tok st () -option :: a -> GenParser tok st a -> GenParser tok st a -optional :: GenParser tok st a -> GenParser tok st () -sepBy :: GenParser tok st a -> GenParser tok st sep -> GenParser tok st [a] -sepBy1 :: GenParser tok st a -> GenParser tok st sep -> GenParser tok st [a] -sepEndBy :: GenParser tok st a -> GenParser tok st sep -> GenParser tok st [a] -sepEndBy1 :: GenParser tok st a -> GenParser tok st sep -> GenParser tok st [a] -skipMany1 :: GenParser tok st a -> GenParser tok st () - -module Text.ParserCombinators.Parsec.Error -Expect :: !String -> Message -Message :: !String -> Message -SysUnExpect :: !String -> Message -UnExpect :: !String -> Message -addErrorMessage :: Message -> ParseError -> ParseError -data Message -errorIsUnknown :: ParseError -> Bool -errorMessages :: ParseError -> [Message] -mergeError :: ParseError -> ParseError -> ParseError -messageCompare :: Message -> Message -> Ordering -messageEq :: Message -> Message -> Bool -messageString :: Message -> String -newErrorMessage :: Message -> SourcePos -> ParseError -newErrorUnknown :: SourcePos -> ParseError -setErrorMessage :: Message -> ParseError -> ParseError -setErrorPos :: SourcePos -> ParseError -> ParseError -showErrorMessages :: String -> String -> String -> String -> String -> [Message] -> String - -module Text.ParserCombinators.Parsec.Expr -AssocLeft :: Assoc -AssocNone :: Assoc -AssocRight :: Assoc -Infix :: (GenParser t st (a -> a -> a)) -> Assoc -> Operator t st a -Postfix :: (GenParser t st (a -> a)) -> Operator t st a -Prefix :: (GenParser t st (a -> a)) -> Operator t st a -buildExpressionParser :: OperatorTable tok st a -> GenParser tok st a -> GenParser tok st a -data Assoc -data Operator t st a -type OperatorTable t st a = [[Operator t st a]] - -module Text.ParserCombinators.Parsec.Language -LanguageDef :: String -> String -> String -> Bool -> CharParser st Char -> CharParser st Char -> CharParser st Char -> CharParser st Char -> [String] -> [String] -> Bool -> LanguageDef st -caseSensitive :: LanguageDef st -> Bool -commentEnd :: LanguageDef st -> String -commentLine :: LanguageDef st -> String -commentStart :: LanguageDef st -> String -data LanguageDef st -emptyDef :: LanguageDef st -haskell :: TokenParser st -haskellDef :: LanguageDef st -haskellStyle :: LanguageDef st -identLetter :: LanguageDef st -> CharParser st Char -identStart :: LanguageDef st -> CharParser st Char -javaStyle :: LanguageDef st -mondrian :: TokenParser st -mondrianDef :: LanguageDef st -nestedComments :: LanguageDef st -> Bool -opLetter :: LanguageDef st -> CharParser st Char -opStart :: LanguageDef st -> CharParser st Char -reservedNames :: LanguageDef st -> [String] -reservedOpNames :: LanguageDef st -> [String] - -module Text.ParserCombinators.Parsec.Perm -(<$$>) :: (a -> b) -> GenParser tok st a -> PermParser tok st b -(<$?>) :: (a -> b) -> (a, GenParser tok st a) -> PermParser tok st b -(<|?>) :: PermParser tok st (a -> b) -> (a, GenParser tok st a) -> PermParser tok st b -(<||>) :: PermParser tok st (a -> b) -> GenParser tok st a -> PermParser tok st b -data PermParser tok st a -permute :: PermParser tok st a -> GenParser tok st a - -module Text.ParserCombinators.Parsec.Pos -initialPos :: SourceName -> SourcePos -newPos :: SourceName -> Line -> Column -> SourcePos -updatePosChar :: SourcePos -> Char -> SourcePos -updatePosString :: SourcePos -> String -> SourcePos - -module Text.ParserCombinators.Parsec.Prim -() :: GenParser tok st a -> String -> GenParser tok st a -(<|>) :: GenParser tok st a -> GenParser tok st a -> GenParser tok st a -State :: [tok] -> !SourcePos -> !st -> State tok st -data GenParser tok st a -data State tok st -getInput :: GenParser tok st [tok] -getParserState :: GenParser tok st (State tok st) -getPosition :: GenParser tok st SourcePos -getState :: GenParser tok st st -instance Functor (GenParser tok st) -instance Monad (GenParser tok st) -instance MonadPlus (GenParser tok st) -label :: GenParser tok st a -> String -> GenParser tok st a -labels :: GenParser tok st a -> [String] -> GenParser tok st a -many :: GenParser tok st a -> GenParser tok st [a] -parse :: GenParser tok () a -> SourceName -> [tok] -> Either ParseError a -parseFromFile :: Parser a -> SourceName -> IO (Either ParseError a) -parseTest :: Show a => GenParser tok () a -> [tok] -> IO () -pzero :: GenParser tok st a -runParser :: GenParser tok st a -> st -> SourceName -> [tok] -> Either ParseError a -setInput :: [tok] -> GenParser tok st () -setParserState :: State tok st -> GenParser tok st (State tok st) -setPosition :: SourcePos -> GenParser tok st () -setState :: st -> GenParser tok st () -skipMany :: GenParser tok st a -> GenParser tok st () -stateInput :: State tok st -> [tok] -statePos :: State tok st -> !SourcePos -stateUser :: State tok st -> !st -token :: (tok -> String) -> (tok -> SourcePos) -> (tok -> Maybe a) -> GenParser tok st a -tokenPrim :: (tok -> String) -> (SourcePos -> tok -> [tok] -> SourcePos) -> (tok -> Maybe a) -> GenParser tok st a -tokenPrimEx :: (tok -> String) -> (SourcePos -> tok -> [tok] -> SourcePos) -> Maybe (SourcePos -> tok -> [tok] -> st -> st) -> (tok -> Maybe a) -> GenParser tok st a -tokens :: Eq tok => ([tok] -> String) -> (SourcePos -> [tok] -> SourcePos) -> [tok] -> GenParser tok st [tok] -try :: GenParser tok st a -> GenParser tok st a -type Parser a = GenParser Char () a -unexpected :: String -> GenParser tok st a -updateState :: (st -> st) -> GenParser tok st () - -module Text.ParserCombinators.Parsec.Token -TokenParser :: CharParser st String -> (String -> CharParser st ()) -> CharParser st String -> (String -> CharParser st ()) -> CharParser st Char -> CharParser st String -> CharParser st Integer -> CharParser st Integer -> CharParser st Double -> (CharParser st (Either Integer Double)) -> CharParser st Integer -> CharParser st Integer -> CharParser st Integer -> String -> CharParser st String -> CharParser st a -> CharParser st a -> (CharParser st ()) -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st a -> CharParser st String -> CharParser st String -> CharParser st String -> CharParser st String -> CharParser st a -> CharParser st [a] -> CharParser st a -> CharParser st [a] -> CharParser st a -> CharParser st [a] -> CharParser st a -> CharParser st [a] -> TokenParser st -angles :: TokenParser st -> CharParser st a -> CharParser st a -braces :: TokenParser st -> CharParser st a -> CharParser st a -brackets :: TokenParser st -> CharParser st a -> CharParser st a -charLiteral :: TokenParser st -> CharParser st Char -colon :: TokenParser st -> CharParser st String -comma :: TokenParser st -> CharParser st String -commaSep :: TokenParser st -> CharParser st a -> CharParser st [a] -commaSep1 :: TokenParser st -> CharParser st a -> CharParser st [a] -data TokenParser st -decimal :: TokenParser st -> CharParser st Integer -dot :: TokenParser st -> CharParser st String -float :: TokenParser st -> CharParser st Double -hexadecimal :: TokenParser st -> CharParser st Integer -identifier :: TokenParser st -> CharParser st String -integer :: TokenParser st -> CharParser st Integer -lexeme :: TokenParser st -> CharParser st a -> CharParser st a -makeTokenParser :: LanguageDef st -> TokenParser st -natural :: TokenParser st -> CharParser st Integer -naturalOrFloat :: TokenParser st -> (CharParser st (Either Integer Double)) -octal :: TokenParser st -> CharParser st Integer -operator :: TokenParser st -> CharParser st String -parens :: TokenParser st -> CharParser st a -> CharParser st a -reserved :: TokenParser st -> (String -> CharParser st ()) -reservedOp :: TokenParser st -> (String -> CharParser st ()) -semi :: TokenParser st -> CharParser st String -semiSep :: TokenParser st -> CharParser st a -> CharParser st [a] -semiSep1 :: TokenParser st -> CharParser st a -> CharParser st [a] -squares :: TokenParser st -> CharParser st a -> CharParser st a -stringLiteral :: TokenParser st -> CharParser st String -symbol :: TokenParser st -> String -> CharParser st String -whiteSpace :: TokenParser st -> (CharParser st ()) - -module Text.ParserCombinators.ReadP -(+++) :: ReadP a -> ReadP a -> ReadP a -(<++) :: ReadP a -> ReadP a -> ReadP a -between :: ReadP open -> ReadP close -> ReadP a -> ReadP a -chainl :: ReadP a -> ReadP (a -> a -> a) -> a -> ReadP a -chainl1 :: ReadP a -> ReadP (a -> a -> a) -> ReadP a -chainr :: ReadP a -> ReadP (a -> a -> a) -> a -> ReadP a -chainr1 :: ReadP a -> ReadP (a -> a -> a) -> ReadP a -char :: Char -> ReadP Char -choice :: [ReadP a] -> ReadP a -count :: Int -> ReadP a -> ReadP [a] -data ReadP a -endBy :: ReadP a -> ReadP sep -> ReadP [a] -endBy1 :: ReadP a -> ReadP sep -> ReadP [a] -gather :: ReadP a -> ReadP (String, a) -get :: ReadP Char -instance Functor ReadP -instance Monad ReadP -instance MonadPlus ReadP -look :: ReadP String -many :: ReadP a -> ReadP [a] -many1 :: ReadP a -> ReadP [a] -manyTill :: ReadP a -> ReadP end -> ReadP [a] -munch :: (Char -> Bool) -> ReadP String -munch1 :: (Char -> Bool) -> ReadP String -option :: a -> ReadP a -> ReadP a -optional :: ReadP a -> ReadP () -pfail :: ReadP a -readP_to_S :: ReadP a -> ReadS a -readS_to_P :: ReadS a -> ReadP a -satisfy :: (Char -> Bool) -> ReadP Char -sepBy :: ReadP a -> ReadP sep -> ReadP [a] -sepBy1 :: ReadP a -> ReadP sep -> ReadP [a] -skipMany :: ReadP a -> ReadP () -skipMany1 :: ReadP a -> ReadP () -skipSpaces :: ReadP () -string :: String -> ReadP String - -module Text.ParserCombinators.ReadPrec -(+++) :: ReadPrec a -> ReadPrec a -> ReadPrec a -(<++) :: ReadPrec a -> ReadPrec a -> ReadPrec a -choice :: [ReadPrec a] -> ReadPrec a -data ReadPrec a -get :: ReadPrec Char -instance Functor ReadPrec -instance Monad ReadPrec -instance MonadPlus ReadPrec -lift :: ReadP a -> ReadPrec a -look :: ReadPrec String -minPrec :: Prec -pfail :: ReadPrec a -prec :: Prec -> ReadPrec a -> ReadPrec a -readP_to_Prec :: (Int -> ReadP a) -> ReadPrec a -readPrec_to_P :: ReadPrec a -> Int -> ReadP a -readPrec_to_S :: ReadPrec a -> Int -> ReadS a -readS_to_Prec :: (Int -> ReadS a) -> ReadPrec a -reset :: ReadPrec a -> ReadPrec a -step :: ReadPrec a -> ReadPrec a -type Prec = Int - -module Text.PrettyPrint.HughesPJ -($$) :: Doc -> Doc -> Doc -($+$) :: Doc -> Doc -> Doc -(<+>) :: Doc -> Doc -> Doc -(<>) :: Doc -> Doc -> Doc -Chr :: Char -> TextDetails -LeftMode :: Mode -OneLineMode :: Mode -PStr :: String -> TextDetails -PageMode :: Mode -Str :: String -> TextDetails -Style :: Mode -> Int -> Float -> Style -ZigZagMode :: Mode -braces :: Doc -> Doc -brackets :: Doc -> Doc -cat :: [Doc] -> Doc -char :: Char -> Doc -colon :: Doc -comma :: Doc -data Doc -data Mode -data Style -data TextDetails -double :: Double -> Doc -doubleQuotes :: Doc -> Doc -empty :: Doc -equals :: Doc -fcat :: [Doc] -> Doc -float :: Float -> Doc -fsep :: [Doc] -> Doc -fullRender :: Mode -> Int -> Float -> (TextDetails -> a -> a) -> a -> Doc -> a -hang :: Doc -> Int -> Doc -> Doc -hcat :: [Doc] -> Doc -hsep :: [Doc] -> Doc -instance Show Doc -int :: Int -> Doc -integer :: Integer -> Doc -isEmpty :: Doc -> Bool -lbrace :: Doc -lbrack :: Doc -lineLength :: Style -> Int -lparen :: Doc -mode :: Style -> Mode -nest :: Int -> Doc -> Doc -parens :: Doc -> Doc -ptext :: String -> Doc -punctuate :: Doc -> [Doc] -> [Doc] -quotes :: Doc -> Doc -rational :: Rational -> Doc -rbrace :: Doc -rbrack :: Doc -render :: Doc -> String -renderStyle :: Style -> Doc -> String -ribbonsPerLine :: Style -> Float -rparen :: Doc -semi :: Doc -sep :: [Doc] -> Doc -space :: Doc -style :: Style -text :: String -> Doc -vcat :: [Doc] -> Doc - -module Text.Printf -class HPrint -class I -class Prin -class Print -hPrintf :: HPrintfType r => Handle -> String -> r -printf :: PrintfType r => String -> r - -module Text.Read -Char :: Char -> Lexeme -EOF :: Lexeme -Ident :: String -> Lexeme -Int :: Integer -> Lexeme -Punc :: String -> Lexeme -Rat :: Rational -> Lexeme -String :: String -> Lexeme -Symbol :: String -> Lexeme -data Lexeme -instance Eq Lexeme -instance Read Lexeme -instance Show Lexeme -lexP :: ReadPrec Lexeme -readListDefault :: Read a => ReadS [a] -readListPrec :: Read a => ReadPrec [a] -readListPrecDefault :: Read a => ReadPrec [a] -readPrec :: Read a => ReadPrec a - -module Text.Read.Lex -hsLex :: ReadP String -lex :: ReadP Lexeme -lexChar :: ReadP Char -readDecP :: Num a => ReadP a -readHexP :: Num a => ReadP a -readIntP :: Num a => a -> (Char -> Bool) -> (Char -> Int) -> ReadP a -readOctP :: Num a => ReadP a - -module Text.Regex -data Regex -matchRegex :: Regex -> String -> Maybe [String] -matchRegexAll :: Regex -> String -> Maybe (String, String, String, [String]) -mkRegex :: String -> Regex -mkRegexWithOpts :: String -> Bool -> Bool -> Regex -splitRegex :: Regex -> String -> [String] -subRegex :: Regex -> String -> String -> String - -module Text.Regex.Posix -regExtended :: Int -regIgnoreCase :: Int -regNewline :: Int -regcomp :: String -> Int -> IO Regex -regexec :: Regex -> String -> IO (Maybe (String, String, String, [String])) - -module Text.Show -showListWith :: (a -> ShowS) -> [a] -> ShowS - -module Time -addToClockTime :: TimeDiff -> ClockTime -> ClockTime -calendarTimeToString :: CalendarTime -> String -diffClockTimes :: ClockTime -> ClockTime -> TimeDiff -formatCalendarTime :: TimeLocale -> String -> CalendarTime -> String -getClockTime :: IO ClockTime -toCalendarTime :: ClockTime -> IO CalendarTime -toClockTime :: CalendarTime -> ClockTime -toUTCTime :: ClockTime -> CalendarTime rmfile ./scripts/hoogle/src/hoogle.txt rmdir ./scripts/hoogle/src hunk ./scripts/hoogle/README.txt 1 -README FOR HOOGLE -================= - -A Haskell API search. To invoke it type - - hoogle "[a] -# [b]" - -Where -# is used instead of -> so it does not conflict with the console. - - -Web Version ------------ - -A web version is available at http://www.haskell.org/hoogle - -All the appropriate documentation/credits/reference material is on the Haskell wiki at -http://www.haskell.org/haskellwiki/Hoogle - - -Building --------- - -To build the source type "ghc --make" on the files. - -Folders -------- - -The folders in the distribution, and their meaning are: - -data - programs that generate a hoogle data file -docs - documentation on hoogle -src - source code to the hoogle front ends, and the main code -test - regression tests -web - additional front end stuff for the web module rmfile ./scripts/hoogle/README.txt binary ./scripts/hoogle/misc/logo/hoogle.ppt oldhex *d0cf11e0a1b11ae1000000000000000000000000000000003e000300feff090006000000000000 *0000000000010000000100000000000000001000000200000001000000feffffff000000000000 *0000ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *fffffffffffdffffff37000000feffffff04000000050000000600000007000000080000000900 *00000a0000000b000000feffffff0d0000000e0000000f00000010000000110000001200000013 *0000001400000015000000160000001700000018000000190000001a0000001b0000001c000000 *1d0000001e0000001f000000200000002100000022000000230000002400000025000000260000 *002700000028000000290000002a0000002b0000002c0000002d0000002e0000002f0000003000 *0000310000003200000033000000340000003500000036000000fefffffffeffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffff52006f006f007400200045006e00740072007900000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000016000500 *ffffffffffffffff01000000108d81649b4fcf1186ea00aa00b929e80000000000000000000000 *0050fd823a426dc60103000000001200000000000050006f0077006500720050006f0069006e00 *7400200044006f00630075006d0065006e00740000000000000000000000000000000000000000 *00000000000000280002010200000003000000ffffffff00000000000000000000000000000000 *0000000000000000000000000000000000000000000000007f0f0000000000000500530075006d *006d0061007200790049006e0066006f0072006d006100740069006f006e000000000000000000 *0000000000000000000000000000000000002800020104000000ffffffffffffffff0000000000 *000000000000000000000000000000000000000000000000000000000000000c000000e4540000 *00000000050044006f00630075006d0065006e007400530075006d006d0061007200790049006e *0066006f0072006d006100740069006f006e000000000000000000000038000201ffffffffffff *ffffffffffff000000000000000000000000000000000000000000000000000000000000000000 *0000003e000000e001000000000000010000000200000003000000040000000500000006000000 *0700000008000000090000000a0000000b0000000c0000000d0000000e0000000f000000100000 *001100000012000000130000001400000015000000160000001700000018000000190000001a00 *00001b0000001c0000001d0000001e0000001f0000002000000021000000220000002300000024 *00000025000000260000002700000028000000290000002a0000002b0000002c0000002d000000 *2e0000002f00000030000000310000003200000033000000340000003500000036000000370000 *0038000000390000003a0000003b0000003c0000003d000000feffffff3f000000400000004100 *000042000000430000004400000045000000feffffff47000000feffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffff0f00e8039b0300000100e90328000000801600 *00e0100000e010000080160000050000000a000000000000000000000001000000000000010f00 *f203140100002f00c80f0c0000003000d20f04000000010000000f00d5074c0000000000b70f44 *00000041007200690061006c000000bc9613005f3e0b30bc961300000000003000d20f54a91300 *54a91300f46d9200dc961300783a0b30dc961300000000000f00d507000004220000a40f080000 *00800040000000ffff0000a50f0c000000000000082e000000070000000000a90f0a0000000700 *00000200090800004000a30f6e0000000500fffd3f000000222000006400000000ff0000640000 *0000000000000040020000000007000000ffffef0000000000ffffffffffff1200000000010000 *000500002001200100000000000500004002400200000000000500006003600300000000000500 *0080048004000000000f000b04800000000f0000f078000000000006f020000000050800000300 *000008000000020000000100000007000000020000000500000083000bf0300000008101040000 *08830100000008864100000000bf0110001000c00101000008c54100000000ff01080008000102 *0200000840001ef110000000040000080100000802000008f70000101f00f00f1c0000000000f3 *031400000002000000000000000000000000000080000000000f00d007330100001f0014041c00 *00000000150414000000ba93b0f600ca9a3bad0794c700ca9a3b010100000f00fa036700000000 *00fe03030000000001000000fd0334000000430000006400000043000000640000000000000090 *0b2801f4961300783a0b30000000000000000070ffffff9affffff010013007000fb0308000000 *00000000700800007000fb030800000001000000400b00001f0013043c0000000000fd03340000 *00640000006400000064000000640000002097130012f40a3054a91300d06d9200000000000000 *00000000000000000000000113001f00ff0314000000020000040c000000000000000000000002 *0000000f008813380000000f008a13300000000000ba0f100000005f005f005f00500050005400 *3100300000008b131000000000000d040800000070b5000070b500000f00f00f580000000000f3 *0314000000030000000400000002000000000100000000000000009f0f04000000060000000000 *aa0f0a0000000100000001000000000010009f0f04000000050000000000aa0f0a000000010000 *000100000000000000ea03000000000f00f803a40900000200ef03180000000100000001020709 *08000000000000000000000000000b306000f00720000000ffffff000000000080808000000000 *00bbe0e300333399000099990099cc00006000f00720000000ffffff0000000000969696000000 *0000fbdf5300ff996600cc330000996600006000f00720000000ffffff00000000008080800000 *00000099ccff00ccccff003333cc00af67ff006000f00720000000def6f1000000000096969600 *00000000ffffff008dc6ff000066cc0000a800006000f00720000000ffffd90000000000777777 *0000000000fffff70033cccc00ff505000ff9900006000f0072000000000808000ffffff00005a *5800ffff9900006462006d6fc70000ffff0000ff00006000f0072000000080000000ffffff005c *1f0000dfd29300cc330000be796000ffff9900d3a219006000f0072000000000009900ffffff00 *00336600ccffff003366cc0000b0000066ccff00ffe701006000f0072000000000000000ffffff *0033669900e3ebf10000339900468a4b0066ccff00f0e500006000f00720000000686b5d00ffff *ff0077777700d1d1cb0090908200809ea800ffcc6600e9dcb9006000f0072000000066669900ff *ffff003e3e5c00ffffff0060597b006666ff0099ccff00ffff99006000f00720000000523e2600 *ffffff002d201500dfc08d008c7b70008f5f2f00ccb400008c9ea0000000a30f3e0000000100ff *fd3f000000222000006400000000ff01006400000000000000000040020000000007000000ffff *ef0000000000ffffffffffff2c000000000300001000a30f7c0000000500fffd3f000100222000 *006400000000ff0000640014000000d800000040020000000007000000ffffef0000000000ffff *ffffffff2000000000010000800500001320d4012001000002001c00800500002220d002400200 *0002001800800500001320f003600300000200140080050000bb0010058004000000002000a30f *6e0000000500fffd3f000000222000006400000000ff000064001e000000000000004002000000 *0007000000ffffef0000000000ffffffffffff0c00000000010000000500002001200100000000 *0005000040024002000000000005000060036003000000000005000080048004000000005000a3 *0f5200000005000000010900000000010000000000000001000109000000000100200100000000 *020001090000000001004002000000000300010900000000010060030000000004000109000000 *0001008004000000006000a30f0c0000000100000000000000000000007000a30f3e0000000500 *000000000000000002001c00010000000000000002001800020000000000000002001400030000 *0000000000020012000400000000000000020012008000a30f3e00000005000000000000000000 *020018000100000000000000020014000200000000000000020012000300000000000000020010 *000400000000000000020010000f000c04d60400000f0002f0ce040000100008f0080000000600 *0000060400000f0003f0660400000f0004f028000000010009f010000000000000000000000000 *0000000000000002000af00800000000040000050000000f0004f0d200000012000af008000000 *02040000000a000093000bf0360000007f0001000500800078a992008700010000008101040000 *08830100000008bf0101001100c00101000008ff0101000900010202000008000010f008000000 *ad00200160157d030f0011f0100000000000c30b0800000000000000010092000f000df0540000 *0000009f0f04000000000000000000a80f20000000436c69636b20746f2065646974204d617374 *6572207469746c65207374796c650000a20f060000002100000000000000aa0f0a000000210000 *000100000000000f0004f01601000012000af00800000003040000000a000083000bf030000000 *7f0001000500800014d49200810104000008830100000008bf0101001100c00101000008ff0101 *000900010202000008000010f008000000f00320016015130f0f0011f0100000000000c30b0800 *000001000000020092000f000df09e00000000009f0f04000000010000000000a80f5200000043 *6c69636b20746f2065646974204d61737465722074657874207374796c65730d5365636f6e6420 *6c6576656c0d5468697264206c6576656c0d466f75727468206c6576656c0d4669667468206c65 *76656c0000a20f1e0000002100000000000d00000001000c00000002000d00000003000c000000 *04000000aa0f0a000000530000000100000000000f0004f0b600000012000af008000000040400 *00000a000083000bf0300000007f000100050080000cdd9200810104000008830100000008bf01 *01001100c00101000008ff0101000900010202000008000010f0080000005e0f200160068a100f *0011f0100000000000c30b0800000002000000070192000f000df03e00000000009f0f04000000 *040000000000a00f020000002a000000a10f140000000200000000000000000002000000000002 *000e000000f80f04000000000000000f0004f0b800000012000af00800000005040000000a0000 *83000bf0300000007f0001000500800084e69200810104000008830100000008bf0101001100c0 *0101000008ff0101000900010202000008000010f0080000005e0fb007d00e8a100f0011f01000 *00000000c30b0800000003000000090292000f000df04000000000009f0f040000000400000000 *00a00f020000002a000000a10f1600000002000000000000080000010002000000000002000e00 *0000fa0f04000000000000000f0004f0b800000012000af00800000006040000000a000083000b *f0300000007f00010005008000a0ed9200810104000008830100000008bf0101001100c0010100 *0008ff0101000900010202000008000010f0080000005e0f201060158a100f0011f01000000000 *00c30b0800000004000000080292000f000df04000000000009f0f04000000040000000000a00f *020000002a000000a10f1600000002000000000000080000020002000000000002000e000000d8 *0f04000000000000000f0004f04800000012000af00800000001040000000c000083000bf03000 *000081010000000883010500000893018e9f8b009401debd6800bf0112001200ff010000080004 *03090000003f03010001001000f00720000000ffffff00000000008080800000000000bbe0e300 *333399000099990099cc00000f008813380000000f008a13300000000000ba0f100000005f005f *005f005000500054003100300000008b13100000000000eb2e08000000416dc601f01c7c1e2000 *ba0f1c000000440065006600610075006c0074002000440065007300690067006e000f00ee03ec *0100000200ef0318000000000000000f10000000000000000000800000000007000b300f000c04 *5c0100000f0002f054010000200008f00800000002000000040800000f0003f0ec0000000f0004 *f028000000010009f0100000000000000000000000000000000000000002000af0080000000008 *0000050000000f0004f0b4000000020a0af00800000004080000000a000033010bf08c000000c0 *c00e000000c5c00c000000ff002057ffff4801302a000080010700000081016600cc008301cc00 *cc008c0164000000bf0110001000c001cc99ff00ff010800080001029999ff000402cdcc000005 *02d49400000602d49400003f02020003007f0200000100bf0201000f00ff0216001f0048006f00 *6f006700bb036500000041007200690061006c000000000010f00800000097042701d114be0a0f *0004f04800000012000af00800000001080000000c000083000bf0300000008101000000088301 *0500000893018e9f8b009401debd6800bf0112001200ff01000008000403090000003f03010001 *001000f00720000000ffffff00000000008080800000000000bbe0e300333399000099990099cc *00000f008813380000000f008a13300000000000ba0f100000005f005f005f0050005000540031 *00300000008b13100000000000eb2e08000000416dc601e048831e000072171000000001003000 *00000000a30300004f0d00000000f50f1c00000000010000a419000300000000430f0000010000 *00030000000100c53100feff000005010200000000000000000000000000000000000100000002 *d5cdd59c2e1b10939708002b2cf9ae30000000b001000010000000010000008800000003000000 *900000000f000000a800000004000000c400000006000000cc00000007000000d4000000080000 *00dc00000009000000e40000000a000000ec00000017000000f40000000b000000fc0000001000 *000004010000130000000c01000016000000140100000d0000001c0100000c0000004d01000002 *000000e40400001e000000100000004f6e2d73637265656e2053686f7700001e00000014000000 *556e6976657273697479206f6620596f726b0000030000007f0f00000300000000000000030000 *000100000003000000000000000300000000000000030000000000000003000000a8190b000b00 *0000000000000b000000000000000b000000000000000b000000000000001e1000000300000006 *000000417269616c000f00000044656661756c742044657369676e0008000000536c6964652031 *000c100000060000001e0000000b000000466f6e747320557365640003000000010000001e0000 *001000000044657369676e2054656d706c6174650003000000010000001e0000000d000000536c *696465205469746c65730003000000010000000000000000000000000000000000000000000000 *0000000000000000000000000000000000f60f25000000140000005fc091e35b0f00000d00f403 *030000004e65696c204d69746368656c6c080000004e00650069006c0020004d00690074006300 *680065006c006c0000000000000000000000000000000000000000000000000000000000000000 *0000000000000000000000000000000000000000000000000000feff0000050102000000000000 *000000000000000000000001000000e0859ff2f94f6810ab9108002b27b3d930000000b4540000 *0b0000000100000060000000020000006800000004000000780000000800000090000000090000 *00a800000012000000b40000000a000000d80000000c000000e40000000d000000f00000000f00 *0000fc000000110000000401000002000000e40400001e00000008000000536c6964652031001e *000000100000004e65696c204d69746368656c6c0000001e000000100000004e65696c204d6974 *6368656c6c0000001e00000004000000320000001e0000001c0000004d6963726f736f6674204f *666669636520506f776572506f696e7400400000005031c15300000000400000002092aee6416d *c6014000000070c36f3a426dc601030000000000000047000000a8530000ffffffff0300000008 *008910670c0000010009000003cc2900000100a127000000000400000003010800050000000b02 *00000000050000000c02d102c10309020000f70000030201000000008000000000800000808000 *00000080008000800000808000c0c0c000c0dcc000a6caf00004040400080808000c0c0c001111 *1100161616001c1c1c002222220029292900555555004d4d4d004242420039393900ff7c8000ff *505000d6009300ccecff00efd6c600e7e7d600ada99000330000006600000099000000cc000000 *00330000333300006633000099330000cc330000ff330000006600003366000066660000996600 *00cc660000ff66000000990000339900006699000099990000cc990000ff99000000cc000033cc *000066cc000099cc0000cccc0000ffcc000066ff000099ff0000ccff0000000033003300330066 *00330099003300cc003300ff00330000333300333333006633330099333300cc333300ff333300 *00663300336633006666330099663300cc663300ff663300009933003399330066993300999933 *00cc993300ff99330000cc330033cc330066cc330099cc3300cccc3300ffcc330033ff330066ff *330099ff3300ccff3300ffff330000006600330066006600660099006600cc006600ff00660000 *336600333366006633660099336600cc336600ff33660000666600336666006666660099666600 *cc66660000996600339966006699660099996600cc996600ff99660000cc660033cc660099cc66 *00cccc6600ffcc660000ff660033ff660099ff6600ccff6600ff00cc00cc00ff00009999009933 *990099009900cc009900000099003333990066009900cc339900ff009900006699003366990066 *33990099669900cc669900ff339900339999006699990099999900cc999900ff99990000cc9900 *33cc990066cc660099cc9900cccc9900ffcc990000ff990033ff990066cc990099ff9900ccff99 *00ffff99000000cc00330099006600cc009900cc00cc00cc00003399003333cc006633cc009933 *cc00cc33cc00ff33cc000066cc003366cc00666699009966cc00cc66cc00ff6699000099cc0033 *99cc006699cc009999cc00cc99cc00ff99cc0000cccc0033cccc0066cccc0099cccc00cccccc00 *ffcccc0000ffcc0033ffcc0066ff990099ffcc00ccffcc00ffffcc003300cc006600ff009900ff *000033cc003333ff006633ff009933ff00cc33ff00ff33ff000066ff003366ff006666cc009966 *ff00cc66ff00ff66cc000099ff003399ff006699ff009999ff00cc99ff00ff99ff0000ccff0033 *ccff0066ccff0099ccff00ccccff00ffccff0033ffff0066ffcc0099ffff00ccffff00ff666600 *66ff6600ffff66006666ff00ff66ff0066ffff00a50021005f5f5f007777770086868600969696 *00cbcbcb00b2b2b200d7d7d700dddddd00e3e3e300eaeaea00f1f1f100f8f8f800fffbf000a0a0 *a40080808000ff00000000ff0000ffff00000000ff00ff00ff00ffffff0000000000ccffff00ff *66660004000000340200000400000007010300a1270000410b2000cc007800a00000000000d002 *c0030000000028000000a0000000780000000100080000000000004b0000000000000000000000 *0000000000000000000000000080000080000000808000800000008000800080800000c0c0c000 *c0dcc000f0caa60004040400080808000c0c0c0011111100161616001c1c1c0022222200292929 *00555555004d4d4d004242420039393900807cff005050ff009300d600ffeccc00c6d6ef00d6e7 *e70090a9ad000000330000006600000099000000cc000033000000333300003366000033990000 *33cc000033ff00006600000066330000666600006699000066cc000066ff000099000000993300 *00996600009999000099cc000099ff0000cc000000cc330000cc660000cc990000cccc0000ccff *0000ff660000ff990000ffcc00330000003300330033006600330099003300cc003300ff003333 *00003333330033336600333399003333cc003333ff003366000033663300336666003366990033 *66cc003366ff00339900003399330033996600339999003399cc003399ff0033cc000033cc3300 *33cc660033cc990033cccc0033ccff0033ff330033ff660033ff990033ffcc0033ffff00660000 *006600330066006600660099006600cc006600ff00663300006633330066336600663399006633 *cc006633ff00666600006666330066666600666699006666cc0066990000669933006699660066 *9999006699cc006699ff0066cc000066cc330066cc990066cccc0066ccff0066ff000066ff3300 *66ff990066ffcc00cc00ff00ff00cc009999000099339900990099009900cc0099000000993333 *00990066009933cc009900ff00996600009966330099336600996699009966cc009933ff009999 *330099996600999999009999cc009999ff0099cc000099cc330066cc660099cc990099cccc0099 *ccff0099ff000099ff330099cc660099ff990099ffcc0099ffff00cc00000099003300cc006600 *cc009900cc00cc0099330000cc333300cc336600cc339900cc33cc00cc33ff00cc660000cc6633 *0099666600cc669900cc66cc009966ff00cc990000cc993300cc996600cc999900cc99cc00cc99 *ff00cccc0000cccc3300cccc6600cccc9900cccccc00ccccff00ccff0000ccff330099ff6600cc *ff9900ccffcc00ccffff00cc003300ff006600ff009900cc330000ff333300ff336600ff339900 *ff33cc00ff33ff00ff660000ff663300cc666600ff669900ff66cc00cc66ff00ff990000ff9933 *00ff996600ff999900ff99cc00ff99ff00ffcc0000ffcc3300ffcc6600ffcc9900ffcccc00ffcc *ff00ffff3300ccff6600ffff9900ffffcc006666ff0066ff660066ffff00ff666600ff66ff00ff *ff66002100a5005f5f5f00777777008686860096969600cbcbcb00b2b2b200d7d7d700dddddd00 *e3e3e300eaeaea00f1f1f100f8f8f800f0fbff00a4a0a000808080000000ff0000ff000000ffff *00ff000000ff00ff00ffff0000ffffff00ffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffd7d7d7d7d6ddffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffd7d7d7d7a5a5a5a5d7d7d7d7ffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffd7a5a5a5a5a5a5a5a5a5a5a5a5d7ddffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffd7a5a5a5a5a5a5a5a5a5a5a5a5a5a5d7ddffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffd7a5a5a5a5a5a5a5a5a5a5a5a5a5a5a5d7ddffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffd7a5a5a5a4a5a5a5a4d7d7a5a4a5a5a5a4a5d7 *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffd7a5a5a5a5a5d7d7d7ffffd7d7a5a5 *a5a5a5d7ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7a5a4a5a5a5d7ffffffff *ffffd7a4a5a5a5d7d6ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7d7d7d7d7d7ff *ffffffffffffd7a5a5a5a5a5d7ffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffd6ddffffffffffffffffffffffffffffff *ffffffffffffffffffffd7a5a5a4a5a5d7ffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *d7d7d7d7d7d6ffffffffffffffffffffffffffffffffd7d7d7d7d7d7d7d7ddffffffffffffffff *ffffffffffffffd7d7d7d7ddffffd7a5a5a5a5a5d7ffffffd6ddd6ffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffddd6ffffffffffffffffff *ffd7d7d7a4a5a4a5a5d7d7ddffffffffffffffffffffffffd7d7a4a5a4a5a4a5a5a5d7d7d6ffff *ffffffffffffffffffd7d7a4a5a4a5d7d7ffd7a4a5a4a5a4d7ffffd7d7d7d7d7d7d6ffffffffff *ffffffffd7d7d7ddd6d6ffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffd7d7d7d7d7d7d7ffffffffff *ffffffffd7a5a5a5a5a5a5a5a5a5a5d7ddffffffffffffffffffffd7a5a5a5a5a5a5a5a5a5a5a5 *a5d7d6ffffffffffffffffffd7a5a5a5a5a5a5a5a5d7d7a5a5a5a5a5d7ffffd7a5a5a5a5a5d7ff *ffffffffffffffd7a5a5a5d7d7d7ffffffffffffffd7d7d7d7d7d7d6ddffffffffffffffffffff *ffffffffffffffffffffffffffffffd7d7d7d7d7d7ffffffffffffffffffffd7a5a4a5a4a5d7ff *ffffffffffffd7d7a4a5a4a5a4a5a4a5a4a5a4a5d7d6ffffffffffffffffd7a5a4a5a4a5a4a5a4 *a5a4a5a4a5a4d7ffffffffffffffffd7a5a4a5a4a5a4a5a4a5a4d7a4a5a4a5a4d7ffffffd7a4a5 *a4a5d7ffffffffffffffffd7a4a5a4a5d7ffffffffffd7d7d7a5a4a5a4a5a4d7d7d7d6ffffffff *ffffffffffffffffffffffffffffffffffffffd7a4a5a5a5d7ffffffffffffffffffffd7a4a5a5 *a5a4d7ffffffffffffd7a5a5a5a4a5a5a5a4a5a5a5a4a5a5a5d7ddffffffffffffd7a5a5a5a4a5 *a5a5a4a5a5a5a4a5a5a5d7ddffffffffffffd7a5a5a5a4a5a5a5a4a5a5a5d7a5a5a5a4a5d7ffff *ffd7a5a4a5a5d7d6ffffffffffffd7a4a5a5a5a4d7ffffffffd7a5a4a5a5a5a4a5a5a5a4a5a5d7 *d6ffffffffffffffffffffffffffffffffffffffffffffd7a5a4a5a4d7ffffffffffffffffffff *d7a5a4a5a4a5d7ffffffffffffd7a4a5a4a5a4a5d7d7d7a5a4a5a4a5a4a5d7ffffffffffd7a5a4 *a5a4a5a4a5d7d7d7d7a4a5a4a5a4a5d7ffffffffffffd7a4a5a4a5a4a5a4d7a4a5a4a5a4a5a4a5 *a4d7ffffffd7a4a5a4a5a4d7ffffffffffffd7a5a4a5a4a5d7ffffffffd7a4a5a4a5a4a5a4a5a4 *a5a4a5a4d7d6ffffffffffffffffffffffffffffffffffffffffffd7a4a5a4a5d7ffffffffffff *ffffffffd7a4a5a4a5a5d7ffffffffffd7a5a5a4a5a4a5d7ffffffd7d7a4a5a4a5a5d7d6ffffff *ffd7a5a5a4a5a4a5d7ffffffffd7a4a5a4a5a5d7d6ffffffffd7a5a5a4a5a4a5d7d7ffd7d7a5a4 *a5a4a5a5a5d7ffffffffd7a5a5a4a5d7ffffffffffffd7a4a5a4a5d7ffffffffd7a4a5a5a5a4a5 *d7d7d7d7a5a5a4a5a4d7ffffffffffffffffffffffffffffffffffffffffffd7a5a4a5a4d7ffff *ffffffffffffffffd7a5a4a5a4a5d7ffffffffffd7a5a4a5a4a5d7ffffffffffffd7a4a5a4a5a4 *d7ffffffffd7a5a4a5a4a5d7ffffffffffffd7a4a5a4a5a4d7ffffffffd7a5a4a5a4a5d7ffffff *ffffd7a5a4a5a4a5a4d7ffffffffd7a5a4a5a4d7d6ffffffffd7a4a5a4a5a4d7ffffffffd7a5a4 *a5a4d7d7ffffffffd7a4a5a4a5a4d7ffffffffffffffffffffffffffffffffffffffffd7a4a5a4 *a5d7ffffffffffffffffffffd7a4a5a4a5a4d7ffffffffd7a5a4a5a4a5d7ffffffffffffffd7a5 *a4a5a4a5d7ffffffd7a5a4a5a4a5d7ffffffffffffffd7a5a4a5a4a5d7ddffffd7a5a4a5a4a5d7 *ffffffffffffffd7a5a4a5a4a5d7ffffffffd7a4a5a4a5a4d7ffffffffd7a5a4a5a4a5d7ffffff *d7a5a4a5a4a5d7ffffffffffd7a5a4d7d7d7d7ffffffffffffffffffffffffffffffffffffffff *d7a5a4a4a4d7ffffffffffffffffffffd7a5a4a4a4a5d7ffffffffd7a4a5a4a4a4d7ffffffffff *ffffffd7a4a4a5a4d7d6ffffd7a4a5a4a4a4d7ffffffffffffffffd7a4a4a5a4d7d6ffffd7a4a5 *a4a4a4d7ffffffffffffffd7a4a4a4a5a4d7ffffffffffd7a4a4a4a5d7ffffffffd7a4a5a4a4d7 *ffffffffd7a4a4a4a5d7ffffffffffffffd7d7ffffffffffffffffffffffffffffffffffffffff *ffffffffd7a4a5a4a5d7ffffffffffffffffffffd7a4a5a4a5a4d7ffffffffd7a5a4a5a4d7d6ff *ffffffffffffffd7a4a5a4a5d7ddffffd7a5a4a5a4a5d7ffffffffffffffffd7a4a5a4a5a4d7ff *ffd7a5a4a5a4a5d7ffffffffffffffd7a5a4a5a4a5d7ffffffffffd7a5a4a5a4d7d6ffffd7a4a5 *a4a5a4d7ffffffffd7a5a4a5a4d7ffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffd7a4a4a4a4d7ffffffffffffffffffffd7a4a4a4a4a4d7ffffffffd7a4a4a4 *a4d7ffffffffffffffffffd7a4a4a4a4a4d7ffffd7a4a4a4a4d7d6ffffffffffffffffd7a4a4a4 *a4a4d7ffffd7a4a4a4a4a4d7ffffffffffffffd7a4a4a4a4a4d7ffffffffffd7a4a4a4a4a4d7ff *ffd7a4a4a4a4d7ffffffffffd7a4a4a4a4d7d7d7d7d7d7d7d7d7d7d7d7d7d7d6ffffffffffffff *ffffffffffffffffffffffffd7a4a5a4a4d7ffffffffffffffffffffd7a4a5a4a4a4d7ffffffff *d7a4a4a5a4d7ffffffffffffffffffd7a4a4a4a5a4d7ffffd7a4a4a5a4d7ffffffffffffffffff *d7a4a4a4a5a4d7ffffd7a4a4a5a4a4d7ffffffffffffffd7a5a4a4a4a5d7ffffffffffffd7a4a4 *a4a5d7ffffd7a4a4a4a5d7ffffffffffd7a5a4a4a4a5a4a4a4a5a4a4a4a5a4a4a4a5d7ffffffff *ffffffffffffffffffffffffffffffffd7a4a4a4a4d7ffffffffffffffffffffd7a4a4a4a4a4d7 *ffffffffd7a4a4a4a4d7ddffffffffffffffffd7a4a4a4a4a4d7ffffd7a4a4a4a4d7ddffffffff *ffffffffd7a4a4a4a4a4d7ffffd7a4a4a4a4d7ddffffffffffffffffd7a4a4a4a4d7ffffffffff *ffd7a4a4a4a4d7d6d7a4a4a4a4a4d7ffffffffffd7a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4d7 *ffffffffffffffffffffffffffffffffffffffffd7a4a4a4a4d7d7d7d7d7d7d7d7d7d7d7d7a4a4 *a4a4a4d7ffffffffd7a4a4a4a4d7d6ffffffffffffffffd7a4a4a4a4d7ddffffd7a4a4a4a4a4d7 *ffffffffffffffffd7a4a4a4a4a4d7ffffd7a4a4a4a4a4d7ffffffffffffffd7a4a4a4a4a4d7ff *ffffffffffd7a4a4a4a4a4d7d7a4a4a4a4d7ffffffffffffd7a4a4a4a4d7d7d7d7d7d7d7d7d7a4 *a4a4a4d7ffffffffffffffffffffffffffffffffffffffffd7a4a4a4a3a4a4a4a3a4a4a4a3a4a4 *a4a3a4a4a4a3a4d7ffffffffd7a3a4a4a4a3d7ffffffffffffffffd7a4a3a4a4d7ffffffd7a3a4 *a4a4a3d7ffffffffffffffffd7a4a3a4a4d7d6ffffd7a3a4a4a4a3d7ffffffffffffffd7a4a4a3 *a4a4d7ffffffffffffffd7a3a4a4a4d7d7a4a4a3a4d7ffffffffffffd7a4a4a3a4d7ddffffffff *ffffd7a4a3a4a4d7ffffffffffffffffffffffffffffffffffffffffd7a4a4a4a4a4a4a4a4a4a4 *a4a4a4a4a4a4a4a4a4a4a4d7ffffffffd7a4a4a4a4a4d7ffffffffffffffffd7a4a4a4a4d7ffff *ffd7a4a4a4a4a4d7ffffffffffffffffd7a4a4a4a4d7ffffffd7a4a4a4a4a4d7ffffffffffffff *d7a4a4a4a4a4d7ffffffffffffffd7a4a4a4a4d7a4a4a4a4a4d7ffffffffffffd7a4a4a4a4a4d7 *ffffffffffffd7a4a4a4a4d7ffffffffffffffffffffffffffffffffffffffffd7a4a3a4a3a4a3 *a4a3a4a3a4a3a4a3a4a3a4a3a4a3a4d7ffffffffffd7a4a3a4a3d7d6ffffffffffffd7a3a4a3a4 *a3d7ffffffd7a3a4a3a4a3d7d6ffffffffffffd7a3a4a3a4a3d7ffffffd7a3a4a3a4a3d7d6ffff *ffffffffd7a3a4a3a4a3d7ffffffffffffffd7a3a4a3a4a3a4a3a4a3d7ffffffffffffffd7a3a4 *a3a4a3d7d6ffffffffd7a3a4a3a4d7ffffffffffffffffffffffffffffffffffffffffffd7a4a4 *a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4a4d7ffffffffffd7a4a4a4a4a4d7d6ffffffffd7a4 *a4a4a4a4a4d7ffffffffd7a4a4a4a4a4d7d6ffffffffffd7a4a4a4a4a4d7ffffffffd7a4a4a4a4 *a4d7ffffffffffd7a4a4a4a4a4a4d7ffffffffffffffffd7a4a4a4a4a4a4a4a4d7ffffffffffff *ffffd7a4a4a4a4a4d7d7d7d7d7a4a4a4a4a4d7ffffffffffffffffffffffffffffffffffffffff *ffd7a4a3a4a3d7d7d7d7d7d7d7d7d7d7d7d7a4a3a4a3a4d7ffffffffffffd7a3a4a3a4a3d7d7d7 *d7d7a3a4a3a4a3a4d7ffffffffffd7a4a3a4a3a4a3d7d7d6ffd7d7a4a3a4a3a4d7ffffffffffd7 *a4a3a4a3a4a3d7d6ffffd7a3a4a3a4a3a4a3d7ffffffffffffffffd7a4a3a4a3a4a3a4a3d7ffff *ffffffffffffffd7a3a4a3a4a3a4a3a4a3a4a3a4a3d7ffffffffffffffffffffffffffffffffff *ffffffffffd7a3a4a3a4d7ffffffffffffffffffffd7a3a4a3a4a3d7ffffffffffffd7a4a3a4a3 *a4a3a4a3a4a3a4a3a4a3a4d7ffffffffffffffd7a4a3a4a3a4a3a4d7d7a3a4a3a4a3a4a3d7ffff *ffffffffd7a4a3a4a3a4a3d7d7d7a3a4a3a4a3a4a3a4d7ffffffffffffffffd7a3a4a3a4a3a4a3 *d7ffffffffffffffffffffd7a4a3a4a3a4a3a4a3a4a3a4a3d7ffffffffffffffffffffffffffff *ffffffffffffffffffd7a4a3a4a3d7ffffffffffffffffffffd7a4a3a4a3a4d7ffffffffffffff *d7a4a3a4a3a4a3a4a3a4a3a4a3a4a3d7ffffffffffffffd7a3a4a3a4a3a4a3a4a3a4a3a4a3a4a3 *d7ffffffffffffffd7a3a4a3a4a3a4a3a4a3a4a3a4d7a4a3a4a3d7ffffffffffffffffffd7a3a4 *a3a4a3a4d7ffffffffffffffffffffffd7d7a3a4a3a4a3a4a3a4d7d7ffffffffffffffffffffff *ffffffffffffffffffffffffffd7a3a4a3a4d7ffffffffffffffffffffd7a3a4a3a4a3d7ffffff *ffffffffffd7a4a3a4a3a4a3a4a3a4a3a4a3d7ffffffffffffffffffd7a3a4a3a4a3a4a3a4a3a4 *a3a4a3d7ffffffffffffffffffd7a3a4a3a4a3a4a3a4a3a4d7d7a3a4a3a4d7ffffffffffffffff *ffd7a4a3a4a3a4d7ffffffffffffffffffffffffffffd7d7d7d7d7d7d7d7ffffffffffffffffff *ffffffffffffffffffffffffffffffffffd7a3a3a4a3d7ffffffffffffffffffffd7a3a3a4a3a3 *d7ffffffffffffffffffd7d7a3a4a3a3a3a3a3a3d7d7ffffffffffffffffffffffd7d7a3a3a4a3 *a3a3a3a3a3a3d7ffffffffffffffffffffffd7a3a3a3a4a3a3a3a3d7ffd7a4a3a3a3d7ffffffff *ffffffffffd7a3a4a3a3a3d7ffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffd7a3a4a3a4d7ffffffffffffffffffffd7a3 *a4a3a4a3d7ffffffffffffffffffffffd7d7d7d7d7d7d7d7ffffffffffffffffffffffffffffff *d7d7a3a4a3a4a3a4d7d7ffffffffffffffffffffffffffd7d7a4a3a4a3d7d7ffffd7d7d7d7d7d7 *ffffffffffffffffffd7a4a3a4a3a4d7ffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffd7a3a3a3a3d7ffffffffffffffff *ffffd7a3a3a3a3a3d7ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffd7d7d7d7d7d7ffffffffffffffffffffffffffffffffffd7d7d7d7ffffffffffff *ffffffffffffffffffffffffffd7a3a3a3a3d7ffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7a3a4a3a4d7ffffffff *ffffffffffffd7a3a4a3a4a3d7ffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffd7a4a3a4a3d7ffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7a3a3a3a3d7 *ffffffffffffffffffffd7a3a3a3a3a3d7ffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffd7a3a3a3a3a3d7ffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7d7 *d7d7a3d7ffffffffffffffffffffd7a3a3a3a3a3d7ffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffd7a3a3a3a3d7ffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffd7d7ffffffffffffffffffffd7a3a3a3a3a3d7ffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7a3a3a3a3d7ffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffd7d7a3a3a4a3d7ffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7a3a3a3a3a4d7ff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7d7d7d7d7ffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffd7a3a3a3 *a3d7ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *d7d7d7d7d7d7ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffff03000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *00000000000000430075007200720065006e007400200055007300650072000000000000000000 *00000000000000000000000000000000000000000000000000000000000000001a000200ffffff *ffffffffffffffffff000000000000000000000000000000000000000000000000000000000000 *000000000000460000004700000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *0000000000000000ffffffffffffffffffffffff00000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *00000000000000000000000000000000000000ffffffffffffffffffffffff0000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000ffffffffffffffffff *ffffff000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000 newhex * rmfile ./scripts/hoogle/misc/logo/hoogle.ppt binary ./scripts/hoogle/misc/logo/hoogle.xar oldhex *58415241a3a30d0a020000002900000043584e93cb000000000000000000005861726120580033 *2e3000302e3236323620284d61726b4729003d000000fb0b00004749463837617d005200f70000 *fffffff7f6f7e7e6e7efedefdedddeb5b4b5c5c5c5cecccebcbcbdc6bebdac1400c61800d6d4d6 *aeaeae8e1100a4a4a41849b59c9c9c113c94103484efba00184dc6d624086176cf5770d6085108 *a1a3b3acb8ec1845ade74931f7f3ef4a7de7dedfe7eff2f93c55c708246373a3f13041ad2159d6 *ffcf00f4f6fd536bcce63c222a52b31096183553d16b0c00ff7563d7ad01939394fefcf8c69e00 *bd96003971de738cdf8894c81851cebde2beb0c8f6013cbd115114ef59420136ab598af06989dc *f76952ad86004f6db06b2c21e6b601ada6ad324dc0cdeacecbced6944131b52410c7d7fb794d44 *8486965a697cdbe0ee85d48c093ca52f6df3eef8efbdb6bd5b7ae48b8f8df5a59a3165d6947900 *a58200778acb848eb7f385752b426d7cd6807313059c655a6696f14a6194a5867b012d8e97de9d *4b5771435bc7de30187b8f7c6351001045b50140ca4193467a83ae6bd5736a7690757c770145db *8d7103f9e8e5cdc7c784aaf72e4ac8fccfc95560a63aa642e7ebfa6f75a4a5beefc6c7ceaa958c *2a953129499494928ce1dccc94aede65c36d22a82acf958e4959a65bb4623961b4c0ceefb58e00 *18a221bec5e2e4cbc8849ad6016404a3b6a3e6f5e74e97535c865f8cc590929bcb9cd2a2bd2c18 *b0aaa5c0c4d6b4b6bbd13824c9cfe28469007d88be616db8aee0b2a5a7ad7e9be598adeff8fcfe *e7eaefffdd0cdee3e7b5a68cf3cf29b3b8cc73b0770d4cd5d3cccc326ae533a23bf1eee2273bb1 *37783aaf3727fff7ffb2ceb46e5908efe7e79c8642fff784b5594a7379a9007d084d7d507b6552 *01319c7bbf80969eb9f79684dae5fc8c2010f7df5ad7b9b77b2519ffef08bd9e10ddf0de847d73 *a7b2d850a3558495845369531b3877a5716a4a63ce1e9d2740ae48aa8910b5a2636c896dbec6be *1856dc7b8dd3bcbdc5d6dbddb5b2adefebe78eaf905981d601267891ba936775bb95c598f5fbf6 *aa9231c6756b63d363468d4ac4d6c52187285f705f51bb5afff3b58da4e9e7dbde1c31afd6dbf4 *a5aebdded7d6d6655ab54531d0d2d0ceae299eb09f142c608475392c000000007d0052000008ff *0001081c48b0a0c18308132a5cc8b0a1c38710234a9c48b1a2c58b1825a2cac8b1a347855d6c00 *110500141720de5c7d5cc992a3b5233204766a4152e2a1592d11761b3284ce0f8a94260df098e2 *c840282d6e48a472a99db99c0443502b30200001290d266ae2f1b1e8d1a412038470d60eeac06e *4608120830310a57a2794ec99d07d64b81020b1209cc56e0018c985310c092730700927703b120 *68b0806dc763e52a1db48b572f00be7ed301986260b03b305c1533765cb1e8dd021a92ca083394 *808254aa1e082c5247071a1904760c5d746da00301769665ed38c60c6981a856b77e1d1b800cda *b671eb060de077f0e1a58d0a447a034b98812a1a14ff3120b0501d206604eed8e7ec91a55c0002 *38885580c047503e86224781c2cb7781e18d57de79e901b00303a0c977407d3159e4d5764945e2 *80639f88178840b4e822c030a6907045008bd8e28e25b820a1807d2b0540c7100321300535ca4c *28d0270514712100196ed8e187099ec81106790c04490b5ca0a24035ce35918a0134b005430c00 *88e3497e5420d20f0082c431ce2d0ad80140241f15e00610038de14f0047c6d784004c3a09a538 *05f8200e00ec4c0200975e825951268a28c20500508ca2c81e900c104303f5098440040814c0d6 *142b48b0432e9708d44f30010410c11c0f08b012025f98e1032311440080a177a1b868a39a412a *690007c4ff7080a69c7a6a1642b23c20ce0043c871ab41e90820807e0de53a00afbefeea901bb6 *3201a5b216312b10138440dbd0033ed0e14601b65a3b11b6da72eb2d4302ecb3d6b8150970008a *e8b6ebeebbf0c62befbcf4d66befbdf8e6abefbefcf6ebefbf00072cf0c004176c7043313578f0 *bbd08c62c5c325ec51953da360f0b0357b74729c47959c81c9c6040fe0cd05f518714055f14192 *421a4e202000c81cc521081fdb106bf00617d462806403f58181081a80931312d234208d20052c *0c00ce251860330a3f6bc0ee4a391c400500d85ca134d34e130435d0f840e518316b745b30d736 *871035bb58a8a14207f41cd40b05149cb0cb4121e8a0c31f7848ff421029971466d00b0b58d081 *1afca2ed75d44203f0490806241088050b1404c3000720c00a05331044c21003dc930504071cd0 *ed196f6037500f20445e80050aec8bb33540d860fbed17006d5f0f91b335803e0b38808b402700 *92c05003f003c31602e121417d201453c104dd56124534aa03f0820b0578109f052e4c6def0618 *94709701e81bf04d0ababf808c11a47900fb2a0030a30527a40d408110f6913002030209800924 *c0ae33bc621673b0591088601f3d58a00c8cd217d300f1b4b5bdc0010928480714d084009c2014 *1924c80968f00f197c6004ddfac0041020102a44c116afd8060007d20164f8420121480002c437 *be0b94801b15d45d10ff1c401e82bc60094418c009b450c481b462066c10200107f283110ce70c *c49803252cc1421a3a8000a5f35ee27cd8b5817c4d6a1b0ce1408cb104610880025b50a3409241 *83670ca0021c18c4405610810300201d60780355f8602af028000400539c19a3860fcac9682017 *8c400038a7058501a015a188800752418609e0800459c087a350410a4cc0a300b8388434869283 *002c2078c3f317ce7466339fa5a1186b59000e09d281266430003370442a084201618450007751 *61150672bd06380317e8e00302d2b106770ce095951b881ef0858b00982205792806031c8302f2 *a5e11c7708c11d14a000c7a8410c0fd0cf01b6e008c750e019f12448006a00ff0108088414e898 *c6702ac18745c4630ee449820314804d2588d15e8dc844177ee1875f88e2657d90281cfce00738 *7462000688801294a00c06882b808088002fd4718705998d0403940004a400004c04e30a330400 *37de000f49c6c700a52084110ae0b27c0540584845590006805461b1c50349380003cc36900144 *f50088a4a204f06100043c400a1090404236e6011010000430531a44fc678471c6e700d3a3aa5a *6ff5812fe454209298801fe70a2d1350af201f40c35ef9fa2b2970c09f03d1c104f249d85f09c0 *0932ad40580590001e363627946dc050ab70b2cb8e2bad9e0dad68475b904698a09f590085b234 *c18e380023964afb000123978052ff40c00415f815011e9181261eac064e28800108702cca460a *0d0f6d092e109101cb0aec075f602c4106f004e9b62400cc752ec048308108c855209d350b1578 *fbdd809dd0b70c09820554d0038424836e2740c831f4c6b73fb527036653c1dbee06802a24a0bc *f2c2c30a9e00e08260e1445d5d82059640905ef02f73cda0403308528324ec821159e000036685 *0416e057203d10c3011220060b6c223eb8b099bd48c001278096207ad844016675d4578a4120f2 *a0c18c33050218cc401b02190319764800c99261281dfeb0311c5000b40e400d2e0841bf6ac081 *27bc78205e7041170542000b386028cc60c396012080e555e50384184a8a713001247bd8ff532f *20c20c3be08208248d5f3868439b1bd283f0c136001d70801f4fc006f1ed0f107f308195077242 *3fe6e0cd00e8011142608175300001a6eb17392a30458330e1d38d80c600e82cbe213ec0031408 *455607720221748acdc43a2f001efde14083800195bd72bd70c0812e1404055165c00f24700054 *a8c0017705c010b342012d247b890d08401ba4d0c4ee7a8ad64339b65b05d606087020b9a72200 *016ab04200c08e13050902f77041011a84a320844625012620811a906005c21508b6cdbd002584 *acdb8835880afd78075d0600b64b880000ef3003211cc7110a17083838d1852c7c61b0b4f61408 *5e6919811140021ca880df08828a158c803c01e028033b07b2892a1420260160851068309019b8 *c251fa3cad2106e2da49a048e50ccdc70bda09b0c7d21b0215c0010e381d830814710005288312 *7c01820454217e0520042fb4c126049006053fe0f46157104023f4d1531ef04413884004f46937 *5f0268d4030a80a8044cf538ea92ea77f37e806106f00370388001aad080c326213e490d200122 *9769d246640c4fa80f5b029000088c40d78e8f8821f868365498008599f788212a30888d99c0bb *a1ef480038c0014650180e384f3d47184006095440b283104015542cfb8bc4dd08a520eab67bef *914c11fff8c847484000003b280000000000000001000000000000001210000004000000ee0200 *00141000000500000001000000001e00000004000000630000000b6060601000e2feef0c0c21cf *181938a7b1311c9ac4cac005146301e20ffc0c70f61524f64d24f62324f66324f62524f66524f6 *1724f657205b93010218a1b4161a5f17880581f8803a27c385bb6c0c0ca738c0e24ca640428201 *063ed8fffdffff3f8cfd05c8de0f345c062a6b04b5106e30d4746d34cb0ca096f1fa3024325432 *a432143128301802058c81581ea28689013780299359a2ca0c17bc7fef1e43785818c3b5ab5719 *8c25589194b1f6f2615726c92a83a4cc23f736429976fa76869de5931852572aa359caa3be0fa1 *ecc8e1c30c2b57ac6058d627c0f024d58066a651c7a72025a0680500c491cdf191020000440000 *008b3d00004200690074006d0061007000000089504e470d0a1a0a0000000d4948445200000133 *00000071080200000036ddd3da0000000970485973000000000000000001ea6516a40000200049 *444154789cec5d5f6c1b477a9fd40c6eb64735bb29dd725bbbd506d155542cf468c445a483819a *851facd40758460e880517680417e8c997079f50a0819a87832e0f819c87d43ea0499400779002 *c490f260587e30423db82715b56ba67062ea20f75680849bbd88ed4c23063b453670bf6f66b924 *f52f92f5c792b23fcbc4925c2e6767e637df6fbef9e6e3630f1e3c203162c4d861f89d475d8018 *31622c8398993162ec44c4cc8c1163272266668c183b11313363c4d88988991923c64e44cccc18 *3176226266c688b113113333468c9d8898993162ec44c4cc8c11632722f1a80b1023c6d7233f97 *cfcbc9e8a9901c1eb964f8c435a2d72f1e1b48a7cc6d2fdd9660273253064408e296882f859054 *fa327a8b1ad4a4121e9c14319384d24758cc18db01e0e4a81893445012520e8e5dc15ce6f21217 *4ce04b9ecc6572974ebebd676849760e33a524135362729a7e5a74a7e6882813bf2c48c0c37783 *f034aacb9bb08ca409ccb4d3966dd35c33c9ec97ce016a9a7ba761bee110528cdc1f1b648332f0 *ad06cb316d935a95b7e081554f55b4fce8ef3fc26389ff6882ee987efdf078ecd1ee02f34a64e2 *be1c2bc83b05c64a5296b1c6817e6241acf411b341d12f619144d5621a9402519b0f90bf3e42b2 *4d9673c0dc1bcdf38d0598ca8257800393dafa1521193725e85810b1c579d79d71d1607a929668 *fe423ed39c91525204f40dba075aff913173728a8cdc12c56959bc8f86112da464c29794e053bb *813c693e78823e4693d830c0d8ff950ffe473cc6035b28714b0d93aa41148c67ed657d095a97a6 *d3b4eb2839dd66a5d3b115ddfd003b589643de685e5e83672ef75cf837cd342d9d6466e8e5413c *2d01131cd3481af08804dde5cc7c04c5074e0e8e8b7bd31caa1b542b952e9b77e1f5670e3e686e *b4b24dcee18c6d266934870429bb8ffcc917721f0c8a9cfbae270bd37c6ae6d7ff55fa23646910 *9a504d51a02590d39d91fd33e4e215d979c4ed3a6e670fa5b7ff36636c1cd0e224804e2249d907 *9b099c84173dc164d9075a46a7b1794661acb60c49a5418c95afb79bb0adcc9cfe0df9978fd04e *f2b20fb49425972b4e9e3e6a761e7b2ae3a4b138aa25049850d0b35ffafa837ee50a162556233d *dcf414bce57a227ff7c1c4c72e185242b82fb896b886e234f013fe86c6e1cf3df62cffa73356e6 *e9989fbb0fc04ded017429ce7460da09cdaa1d3f60302be748e839466050ad63c1c82676bd6f70 *9b980955373a29aedd860924d252cc14d14e4a71fa7863f7f75b40730251bd92477ce420fe0f96 *bf8ea6a82ca3e205bbda7994e65a8dfc5d1fafec4bb3015eb6fc727dc304fcc31beef8bfd2f327 *e98fcfe5f6c00ce41b086d070d835607e90ab2e90c309124d59304fe51ba17a630dbd149b5a964 *1ed292799ccd14252f3ed3f4c42b67db324d365848d745cb893378426b0b6518069a4d63b13e31 *d4091ca58ee2671b6d73d87be3fe7fcc12d350b40c948b88202dc108e3c57971e0e764e8ba7bed *cd0ee769671bee3ac6a6006635162a296a0a2b4d4de844c6b26b6530c9344d831a7b66e4ddf29b *c87f2c8627895f56d672ee8e3bed4aafd0f342a6eb07df032abad34c2ae654d908ec6cb070e453 *55bc8f3cfe78e2f7abc554b6143e089fb21433fd2f5118db69fbc229315678a0ccb208fdb78a96 *d267540a2990fc4e6b161a0f8780bdd27e7b1b404b682c939aa857b16f18a0b3563c3b117e64bb *4ab7b5d8daee39fa6f720c5ddfc4651c15ec6c0118d2f752b6e3443b9fe73099048600c7707a40 *2958488a8b1fa62e9495b4a09271253320da158e34ab3c45af00d012e7921239ca394f989d6d24 *63bb83e30e2b232de1d3404b52a1e5b1ac397021e7c3c7e1b354d2e45ed03c7b1e9a6974e57963 *0bb569925a0d160dd74cf608b69099c3e3223f8507f7a6abb4ec7f39db7ee4309b6560e8a04209 *519e6ec3002902b56a001b13e1921451ed11861604aaa4817aaacc663a899e741aa070459f2d7c *a82ce502cf3cedfc98b28bd76d771e06575e4bcbf367dbd93c33ca82a4d296095a57c4e4dc3b80 *594f802be17aa07fd4a5d9046c1533c15a6a5a3226235a8288cd1eca3097a9400d78935a490ada *156708c91a8319f27049316b1fe1c3f059422bebcb94c36112f909c7fd2f88be5f70365fa5e5e9 *131915e907b40cc5304d98755f148bdb1d0c8cedf95a202d89a9cde6ee6fd32d29bb12b12a868a *49f7933b9a969dc7ed8e6359cff3941c45002dcdfd36982f7c92ac89dba867e0ea08054c82d838 *27017ea2f9540d130670212d8f6750fa067e9dda8173e83abe28c62344e81a5c1686f2e7a19bd0 *a85acbdddfa69b7f07d3bf219a967e99a02776de055a3a07e9e9e3484ba08791308087f67e1b4c *6548cb0d476cd4f0d396497971f88e3698301ce48e34ea11141d7795d96cb8eab54a7bc7d84908 *dd84cb81262b47814fc8de999e6c3233a5c40512a268599c66b840a2a21fbb4f6522f71a1052d3 *1214ac5a7dda3437a9e667fe633631653dd3c4ffb2b5a3fd100111eb131c0e7020b0ac742aad95 *b39ee5c6d825907ae7175131244bdfa6186162e8f5ccbd814dbe8f8b5731e00e201630c447f222 *517ad249d95cf2881e66cab654fcdd56f8609cb431f2fa61cbc860ec3363940a8aa455b44ca7ab *719531f6042846fce0812f7d93547c07bb1f9b7913a063dd9234932062ab3a165e7ffe68484bed *dd46ab4549d5c7bdd993751d85274a60ba999120e8164aa0fb1768b959e239c676630dee56b499 *7b089bd9433ff825d2126ca6cb38184cbd280c06d34e391cd735304a438b58b45ac92d9caccb8a *e0a10d16c6392baf6f4ccbdd8b557cb38b63f1f64ae36eda7d4c4ea9703935c394651919ccef65 *9d8ac144c34593d63689c904012a82c2098f55dc423cb7dcfb88d56c2d6440f27725f47d50b3b5 *06d339885b257199c40c75acb52ddc8874721841b23513da18db0fdf5fcefd4368e8fb09f68ebb *7d739839fb191a4c60666430f5ebd966b5b959c51983bd42a768729bf69b4766794bbeae2ce49c *4b665d72bf4804afbe6e5ac44cd3a616d2e890d4766e3a5399596491240ad2bb57fb064db79020 *4b688624f66c1c3f6add153627adf50a5e91dc2d921227c20b1b5435254959a435435399af8d48 *39ffc3f3faa0e7e51e4aad8baff70fbc31007dcf9d732fbe7e118fd7a91337a7cfdefa95005a02 *39b54b96a0931b1f5b526af5124a6a852236e4c9b6488ecdd7cc254fdeb8466e8e8919d7676abb *60596d14545be9c37354303d352d964c3bd91671fc4c7a0bb7b608222f031571696aa1b8f46d73 *3f9e129e2a333cd16d3576995b39644007985fa0a5cf0913cb18b7da646b6ea9a675443894f332 *9e70b8999e3991a9fd20574b26e1dc6415acb36bc9a902191f9337f372160be097fdb01d1bea14 *163f9081a694a7bacdf4f25507dda0ffb5febe57fa3a4f763a076ce661690b93136dc772185aa3 *fc91e903ebabf64de087570a6b5994a1667dacdc48ca1ec4fad58b877aa17f5df13d3b0738a6be *37286ee68190d00c0274014a7433743f047002770846c963c3369852706bd665b7f2e4ad4bc523 *39eb1ffa37999f812be7faa81816f3849531d560d8e72bee108308d3c4b76cb5100f14356991cc *f712deeb929cd1f24efa8f37ad3c5292c20c4e67eecde0d01cbd6e36804aaa3b33dc72a4f6cd87 *49d8f05eb84efb44a50be5ef7fc9e9686baf064eaeb7abaced7ce0247df7b298cc730f47586850 *aee73b6589eda8295ae1a7559c74c7472934e54bbdd9733d4b5518b47b45a1a9619acaf6a3edf9 *f1b1b6a339bde5f821b00914b93727b4bad75276d1e5b58eadde4c54d7bb65a60e76f2caa0b83a *a23959141208699ded76a0f7d88e9920026e10de92424c4ef8d7476c8fd1cad00b8f300c8babc3 *647cd43dd59d79a5bf2e30f82121e44c0f7052ce93c21ce160358174a9d3766beedba9efc0db5f *c87dc895c075dd3c0d46aa46b3028be4d9bf3fe51f1cb09b7b36e8a9864179705c4edc15c5fb3c *a45925339399545f4542726aa7bd46959695cc4f18cf4ccd9ececcf9b3ed605b22d7fa9aea2a51 *9967921537dcd7011af4ed013dc816cb2a0ecc71ac935df6019be2763321e6189fccd3bb77b029 *2b6a080e501fbdd69bbf3a74f867232b8db3d1ba4ddb91b6899b1363d7c7daa19f5c196525f628 *6ca692e5da310b358e1baf141a533a2c431a8f1b7ab9a26eb0d915b4bc3d29df1d10770b8c5056 *96c580b6bfda9f3ed169fda12dff0f77a0115cdd26e24f959fe9cfb2fe89ce89f707edf131a7a2 *7289cabd807bd67e71d99dcc9b6f8f38cd9987bff7f21809c054168a2e2e1a0b69d2745fb6add3 *322d95950308e9d3842449a8e7acfd6456fef68c3b376c0598c0caae375f72b6b7383b68ffc5b5 *87339e3220a337c5d0b80c3929597b33c965a995c6abb973e4cedd62e17e06730227a99534749f *d0d69279c249f15cabf416b43d815a32bbbfdf923de4404579739eceb515edd15dfcd5e57a2b14 *8406008fbfb662eb1bd43de8b4ffa8d73eda41bf45b14171f7922f5b1fd0bfea609f16dcb707ac *bb054c49a569a900afdc3bd5eebf37ea3cdbb6f4f2aee7b5e1edbb99a733c04920a49932ed1465 *b32cfbddecba6a78a3b9f3a0a22f5ec7036066715ac5afab34223a66f5f4d12c86c802d2361471 *7745dec8f707e5d561d0a56c41ba5345d69a6d7fedb2f34c96ff96490d1dcc0972e571ccbda0fb *0b8c9a0c94d21bfd5659981547b4a84809904cce9b4399131d0f55a09f12d94f6624d0b23845be *4a66fffcf85b7f907a9a0bae8b139e05075f56251494877b052afb6d13fb96e627d3715aa08189 *79a0edc6779a9f5d574174928a8902e658633345e0e43ffe6de65093ad77cfe236daaf7cce6561 *9a5dba2add52981c58d543258d7020fb5ea41d47918a5118ba4ee7034f718f9e2267b4ca552815 *06bd21ae927415efdf8bf259c25b974e5e72d28e7dd0b65296da4bb8621f933746e57b97a306e5 *a7cee45ebd0846839758a4f574ede1d1e306f709bb72a9e5eaf0a27684890c4c385b3e9c586a39 *eb36e557ac3d0ee0d019d699a57aa3966bf673ca25ba7fc249a624d1ae73db54c35e92d685fbec *12290bb42437c7e020a265c75b235066f757c52a2109b61fee7250e44425a328613667c5853efe *463f51032db46b6836b16e44f16f9e273fbf86e45cd71eb47a5a7292cb9d78075e7667dc450304 *96275149d0e2fbb8533c95f54a9789e80172b272dd55613a3a377e84905b6b27a74e7d88fa5dd1 *b2fb18e9fb510e27de1e0f47ab200c40cf1cb4facff2cb1fb2fc14d855ab7a099568a2ef678279 *32f71ca6800a7b7342e597494047e294429f52fb6f136bd0a8f5292f96afbf1ba3e4c321526950 *4d4b14781eabab405d6d049b9206c43ed9c5a111c7c7cc702f71d88ec2f3eefcf0746e344f1275 *dbb5ebc68568bb227d98d4441b66e667d8f9a04dc24966b0789ea9a56c18b9be695fbbb5d0b404 *16b9b32c3fc7dcb4d3fdfa20b49f984551a61388e9dddee13e5dd3dc47bef82af8b60c2834a75c *e04673965de8233fe9253506330290535e9dc83ea7e4d05aaaa28696854f88bbd0d67166005820 *e6ebca83355c99d287e5c1ac104895743a2dbd3e217a97cd62ffc9f5e384acc9726a5afa6a14d6 *d6b2f75c7bc84965b4b5dd0b4bbd00b691749fc06d3d404ebd091eec6ad40f2e8f160d628288c5 *fdba01352af2159df9267d982d5d2b9d797b52d3120da6c7609ccd5de8fbb23cf7dfec73b2a802 *b10c26d5e38b013304225feca1b32ef1dcdaebb93004dc2a58ef0d66cff52c6b27378e8d5e4648 *bd9d6a19580db46e77f98eb7931a30b8d2c2a4acb42268bef69f5cfe6a1f755d57ef12c4a05fcb *52bdc78ada83565289c3782f55f61ae7484e9eed81e965edc5ed046a213ced5ca70772a851c9a1 *d52da7a62554f53c5a4b9791ecb1f35f3da0ae72f4639ed525e5a9d5873eca4b5f08214996cf75 *9b6430ba30b054287d4389f8cf1b7ff77bc9b1d5671c2062476ee107c402ee86077bd37b2ac385 *8f0b034a2ca818af3019051a229520063a77d731599c233cb088fefd8b8053c3d61262608c5c6e *948e63879c54527619afc41ab1accd2c79e48341f56de2de2c2b9684fd6a2fe6c198ff1c07d69a *0ad485b79296b6fc612e9b06297fd06dbe3b402a8b641126de40a703ccd4b6c27bb2d12b452b54 *d85ae5154e4a18bb2501043ad36fa0888d5a911fcdb537399fcda945da04465344491816792954 *da6262c1bfa44a800214edece61f4f58770b4bbfa830e7b9aff775bd893da6ea5a5c0a74f9202d *c160deb94f8ab38424dbac83195d1e9424aa57e9dce48bdce0389683900e544ec28421b1db9d91 *62829265563ebf14853be37db95397561a40c1d67df04bed530db72bb437e157c38085fd5b6f7c *4d8459298c048a52ec1a6a50b01aac9e93acffc3cab530ad61959c433748ffcb0ede0235aa7be8 *c9e262c8254ee6108b725f2c9931c92b83baf38102826a570d9a614afee862e3ec3469e9cd4f61 *9a1ba202d7542e1b98c67bd976c3b6f50a360cacaefa4394c4e495c18ef37d4425d6d85cc3b339 *bf9f597588fb6cd5137736a0a768cd53e6d88a65090dd0d2d6e6735f4b35ec79fb6dfb00fe6967 *436d7be85e85662789bf7d0443af997a829ceb5de9dbc495e1e2f551b2eab66012f4e1a3d2b1b8 *6eec11f3e069ce992e0f0c13589e74589ed0ff515b1e2c1296c74ea9f2d860d8fb6a2f0f66d350 *dd167f4b6666b0f8f1a81e5f9662ecb6744b6a8aa58349a40066e28f8c283d0f7316a0166eee33 *2d3b05376ec253fcd294e5343a5080f656fbf943bfc67e1ffe61ce6e2027a1262ebab8dcd2f161 *d1c8b2422f97c192e5c1d5f9707b92aa9ca962c6058e41831adfcdf285507b1b2a172614d24e29 *8399a055a84644c7b269a50fa0b40183e912ead657cec4f070e411dc601cd2226c94996e89ea71 *94979759510d83f2e82ed1b1374729c781190c26b4224a3d509b8d2da28c611cdac91c46e42756 *dbb312b5ab95fc5d27fb1c3f869e58ed07224ad0021cf538f1cf03ac24d023b2dc6e60d4b1cabe *613881873a1660a5ec30f048d1121d925a407e7d7994506c7d8e267376b26e112512b0f70b03a8 *7b97743260e3c4b4d4fed5687f1f4d62c80e409b1decdf695339fcccd0f4553ab79d829ac334fc *d554b1f51a6ae86a31fab9b78d2ad87a61296f8c1035d4b2055950137ea8345966619decaf7874 *9395717649d5a14f55723098a28c8b9d84905a729a6dd9b0c6885c6d845d3f36ca4c98fb630eae *05f4d4f965a147c1f0ad0589f3b26097a44b82d9c8ed096961e1a55a878006301d35584a12a529 *b1536bfd351b6c78b41b4fda2f74456e77b33ea05f160ac5c97cc8cac523ae20127b15184c1de5 *0348a73a315426508b8418f168991526aca13c60c7280c16c2e8d6af2c5ae1047cc60af78af722 *176b58aa80e43f0d4f403f5f65bb027c2b74cac867b3d28015b2f45b56a6c979ae79f9b2b93345 *f4912e7195ad09abb40518cc25432d2e322b0aa16f325999d0ae84b290ef0f1a17ba602e5da763 *1b1df3c5cecc6b03874f74f1050e175feae7db2036ec015ac15a021854c4a6daf72d852c4c402b *0233c59c0be36bb1a6e4daf2eb89d0ba2a0c0552599aad6d22edd07ae75e0476e31a6fcba16f24 *5917cb22bc2133194e08a122d9024ad9744a97a7a254a956866b2f8f49036137e6dc5b19a77271 *10b4be573dc7bdfd53c77947cf9635eb80a730bf8de2a2a333e1191ae164b8f7f5ffa97bfed838 *aaf49ee375f236ecfa66c82eec5c6d9469139acd9d39d622d2c52d42b1949eb2157f24f4a82e06 *a493af7f14a3f40a11ad7a518568749510d09eeef24785e8e90e39d71e22d115e14844382aa9ec *2b445e740ed9e86c31267699295e9847bc641f6162fa7defcdbc9d59ef26f6eee6703f8d56fb63 *76e6cd7beffbfdeb3ac39084039ef18ffae89977b8ec0a8502ade7eb3ef69251b42c5404382564 *8d01cf5e4367099fb9202f2449adfc324ed1c08371959a168918ad8120f6cb9d2902d64d708193 *8090a609f2b00c3b25c29fcf6358f1780d035e1db48a9957166dc789c45e29601cc391fc27f7d6 *7d392cc130113909f1e92b0036f9a318c624324b9b3118c6a891d19d90714f13e86a079b899d1e *731e794cdf91c529aa0a7b30a5be1115445915071ecf98701a868c097a5f8d7d593550515850eb *1d262e2ac0c036812183ba0118c1c50a3af3e34ec9c12d1bb077db817d4dab2e6be59417f42128 *c17ce39c1ed436ff908346c7caa2655b88c9806c6c3b1a2f675dc28d0c5d698572b95b7b39058d *945290e00ad8405e8ab2a42a85722501d56798e726410666632764486d91a1f44473b981bd79ed *eb036242aac694aad58dac2e3670d5d01e11d347cbd04352cd0411857b66a0b4d499eef503ceac *95110c9344e92b424cca819aac90b2d647a0e8412199dd03f15ffa5eec1acbbb5562e6f444a6c7 *d4050990ec823b454a054f13a22c5c81450d93b519026b190f2cd3e789fbc88aad4e834bb9d644 *2693a1659f7dc9c5adbaac0390980cfc47881237424be949bacdd8d1635f5c90df69155edde218 *bae061701cf1e8da3a7955fb91473585058b945da0a752398457d0ed2d3916315a7f02d5f930cb *67c7c8c9517b7242252d58096de0bbc3d93d799aed275ec59ab1b04b5d607ca631bf8e7915c3d7 *8f3ff3ab49f49bd46af6a06a0a5524b4c5d735cfd42cdfb1a1e8ab021a8e91686eb66234de63d2 *5e93cf5b7e9251d909ffee16a6d87df9784c576c8a7be3e1c90a130ae55768de11e5f16e6d1b61 *598d1681214b6d131651dd85cdb9ec1b3c1ef38be85b65adaecbda5de2d7b784d58034b07ccd20 *734c8c5cb66c0bf529414b6f0c091952a8b53f9d744eaa8f9665abd839379c438b55c8b548f44b *547095e20c3049e3fea1dc3e8c49063181956cbee44af55b0fa4a7b8ee972ff7ab31b6d571d2ea *95448d82101d05be1f37a4ef0494076bc1360c034b307beb3b647616191488b22ca0afd59f6258 *f82922f9ac952e825693ca147ab2a6dc1fe50a08b4e1f445cb71faaff0cac68ad2b2a837813fcc *d5d75ee2818ed01c72e266d2881d1bd6487d8f8ee58e9b971fc0f194f13e407a553dc4b0ce8276 *041523b14a418e52b387e8f3489e7882574ad2a3e96be015224aee7b22286ff5d0602d4c6603c3 *ac3b0882515b06bd45fbedc573779cfc3729b8aacc3e63ff90b627afef42c1d52dd932feb152a9 *a80ae62a5a083555c13c6f4697eb562fa6a52298a9fa8e48001185ca9e790ad69f9d16c5cb104d *8dd2d7107436c9392561a6bb07c879c437a0af35022db32cd775a5bce753715e0d4ea89563839a *d7b4b1d36f9543ba0e542a20bd621c0fe7d533c3a63ed056dc129a84d0b2b31652756706f336d9 *522dd1d1931445e5a4dc219c78abdee835d2ac1a0cf305131e5a50b3ec4a9b96f3ea6871725c3f *33f691f8def67c26a912895c114f0b6c3c7c2b5f7015165d55a9e326d5e868f5925913387a582b *0b0c6e42a0fdf5dca60796305aad8a9ceb09277d80f9751bc49738d5ef69474b9d8cb55e93629b *2321d6972b5825b51412e41ab8aa41daf4ffae11e1c099e064103fb76c6c4055936346b5ba4515 *ca9368724cfae3d1ba5cdb8e168c148b3b69e90f7162acf1be9d5d3809809c7644a297a5d6db61 *e1ac891c2ad7d2d90ba7478d595129c6345de08d228a202b9824dd44dd8f98fdbe558d0196634b *ea54f6d189515f708d05d142374d166c15517666d0306b977858d55402edbb339f580ecba571f9 *7c35601d62a617361236b601b606712303921267f549006202884cbc423fd7fc5ce706a26cbbe0 *b6540f9b455593080b2da87e6a649603bc85e91e561e84e50599d015fb1b5dd63c429eac593bbb *dd446d85af9675c86da278a6dfd7b45786615011e8bb76dda791d764055a820412cf98e6fdc3a6 *69aaac31cc0d28f3bab960aa95ab4a4c230db246db0eadde2193d176f4d876a9de6f82b24e4d5b *d9ac0922a2418d9bf43c331f9012e60c105088e28dd36de05716c866dcb572db7559331a29a334 *e2ad58489033d1509196ea4a4be6657a8b5e557b9618893aa6b1c6944c2bbbc649c78dae25f2bc *5a1d0fd5e408c26c13e886156565dc03e2cb651502f58d0a793d35fd457eefda18b8b2336109ff *209633b743d7859b9160c4dcda6dce7e160bbf5e63a200328eadebb810158e9d545989b9fc0a01 *f9359a702b71b21acd2b426a7f970d91db701fe93e0e5db2ea4106187b873e90e718e4bdba895b *13c814dee20c572a909ee0b2fc8c1604b8c8e041cb761d87cbec7bd98bfea567feacee358d80af *4923bb5f83381612e79a5295b1b5a3ae9195545cfe4a682562ca8efe0ad3b624dea19cc9b06401 *ec2b642c2dcc674c046b856ec8c3c115309e4a456ed68c06c4d7554b4ca94eb8afb0bc3bc38a96 *b53b975b3d72da0c0d3dfe7a0586d9812ce6d369b1507df035111d694d6d6c9f3342b28ae53846 *8560f227adc86150d2c102b4c48be8c2f4ad62dc499b8daeab8436dc70603bec5a56ed03e3b955 *81966af6221b2fb807f765daeb870da7d593c0a10ad828377e3c819ef1e05c2ed37c155a0ef469 *a3cf0c69294d66d6099d1e19262edf5254da9cb340c831cd68ea7a537386152be41b9069e7fd2f *5504a6aacb281344b02c4e307c8cd1e144179401ab10942bb51de99a04c0be1c16c2549f83e7c2 *18c0502e320cfba1417ae65cc45ead1496d153f63d7d7700495ca5b6622dfa54d20d6a851fd86b *f8d580c38262d33c53fd51cbd4d51df4e9290e826bd210f63642540bd6406f944cbb51cacbef0c *da906b92dda6995b031952a611107ff1e477a726dfc3a8df4671db6b04a7440ebfc4be75b8387a *12c89fe86b54b228178767195e21abdb88a2e25e18d6eba051115157a0a591d67ef27779581207 *ff2cf921be34d200e9f494f0c45670fc2d862c6b758df8189d2b823983a4931875976a0d2b0a6d *e2254bc4a3555a8e9f8efc1d90df5e8afe2e29057af0f8e0ddfac056206fae281422744e12648a *cc90974f7fd83028bfe696653e31ab6311035e6dae3198db2a1d12415ee6da5db5619e1980a505 *7318505bd3b7d9323e37a5f8443c11078513d448912583893b1865114e79f992224cdb40106026 *87ee2547e7c257d5e5fa899f51e6199bb447be6df8aeaa58f3a112b0fa5317adfe141f7c94de76 *0be9dc04df098676952b2113e6747cc6851dc0125c9651443996a15603443ab70b168c17672d50 *21b07ea9706171d3e4e7a7c2374251d6c3573e5b2415e0ccd48f23bd19901131d6c1c55176d2f3 *848c87ada64ad44467e3e783ade71ca1e563c59752c98c8b2a5b7195842d0636fc606ee219878b *28398cbe00c4c2a041a435a3a7acc19c9ebb3b7bc34eec27def64bf8cb66c7b217b8dc0ce8124c *eac215b1f67b7a240400001d234944415487a9f717d33458c89ea772d601dcd363e637078124c6 *253588c9f9a0fef86b1cc5ff7f792640be2f080352845c25e011444e583c6bc10eb185266f0437 *c9ffb179705f165eefc965737718c6ad3addb8495e19a3fe175db66833d1c4013b5ec3ab83c5dd *f892a5b41acb02e68951056a3cd6d61c52d62556118a87111a1eb72c99eb14c9c068018039db51 *fd103041b47fac367dd033348c96f013480120d062ad90f2a48c5c6d5106096b953501805a1a6d *7538112197e9c00efdc87e178b9754185b6280965adc7f0a6b491f7ede3d3f635fdfa23a79918c *9e412a2993c8002dbfb77fc07fc0585cb587c39239ed40069e126eaaa87a22d9262f14b08a5ac2 *b7bbca1456d2d656aead437b30d3e83186f744dc0f8a674ae4046df3d8890bbeccd30ef100ad85 *8c390cb86285b34ff8928b168bb22812119ca32a0ea3c582479c87152f646ef1b8be1d53072ad1 *a41925fcb0f31364733bb86588846391a1209f2863663917861141c2f1d78eeb15d7e30b45bea1 *e510cda8301c0eee5179523206900645a8f27bfa7195d55f64a95871588bec917fb08e9faa9f4f *03ab70fc0c3b7adc412a592ac2c38f7c3b7bf8bb79df184be3986592d4659d916078cd8a91c1bf *344d2bf664614dd5b2863363ed9747d9153752246d9d417b3013e0c06ebf04b00fc83375df1b2b *149257ceb2d1532831b6ce799423b8e2f9d506303a231ed7d3200e113da96b29ac71aa27ea3754 *94fc4f8671488f96b6d574b3bb39b0d6721d6d13849f6b9f89aa309fb7326612e40aba32b95e82 *b63b0732957c02ec672e228db42da62b230ae4391a0a0bc0368d24be77993f1ed2e24c8a482360 *cec02ddd8a2fcad2cc88684489650a48a8de82982ef2c8fe3b8e3ca889dacd160d05c54be41cf9 *27ebe0d3c5e3a78ac559d0e2191c331f9013bfe68fbdc4815b62caf55c1154fda38fe6860e0c32 *412b255aca1ee4b24a44d502d432fbd2f6e4eb2ea878f482f59f637ea5a275c327c3d036cc34b7 *22dbe4e16c1dc93663d4b7161072ec656bd6b26bebebad1d94315b76cb85a5cda4327080ae92e9 *35e1a34eb961502dd9a0e57b1000592dcc01fae4be3f0d9f12a6afb08a1fcee226e69fb2a6ed2e *e12d1296428dbe810a3617d5643f73da251f90a8fc660942d80bfebe34fee1429148df60ace9c9 *acfe1128861265b35913031ea80a400b4e12ca58576c4b7e977eec5163a04f242da84320279c7c *e61dfe93d3f4e849faec6902c7bfbcc1c60a681bc7fa7aa207f9b127b3f9dda6bd688b7c74542f *318f2c215df94d0993354c2f34603dd7cf336678e66bd8a6fdb1cdbd86ceaa2f17da839932b7e8 *e01e9aed0921672c628a04e40485e4d08f2dbbe446d86673543fe8cba0a3df49d8d6523a08d5a2 *a68b4e7561c300ddac1edba441798e70c686716f1e5691a1f45b679decd3afb1abbcf9d1c2ed60 *5f0ac78c4ccb963c53db3388c99632a588466c63c6b6bc55ced694878553806d22b0312e9464de *a82ada0dc7e34dd00c0a9f52c9940c33933a503b9e905dcaaf5792d0cc8c36b2df38f28806f869 *24856f53e027b62791026a029d82d271252b7a49abcfc881ecee5cd69ab7a5c7022e09624ea417 *7813d058aac7b2a30f0ed75d50b4ed150a53ff7c14a7f1f3f528d0b68d6702c0fc1ef98e2ecb16 *d63d418bd3c20c3bfc7c4106a3f9dfb61096edcba200294d01a65352aead28a511065971387c6b *f823793c52bd2a4c5fd9e931f77fec9654bbc214c6200951567128632fea934a910bec84723c94 *a423e3916c130db77162155fb4e7ad56c6c3842f5156182a06fe5560e06218a19a09245cd11801 *68df16a35b4f68d96de6f03efd89877380a2c37b291c23f7dac3bbeda1bea219b355370ddf18bb *68010e0f7e5343b4142650e496ba68a9aac94a3ccd6af2353c3344f161b4997d7955bed97fc6e0 *716065f593c7ad5fbc08724a7b4bf8b405da869992c4f667cdc7f6112121b811fc14c677905f00 *3941bc39fcfc6b8dfc876bba1d910cb0b9dd5943263d6ede9b97d5b46a00911390eaa7cfa1dda8 *dc8c6a87f572447ebdac13e52b990f8ff80c4ae8c6c837423c0aefbb234f13836445ba09002027 *778ebb68506d663cc0b2b0668248cb9625f9f0765f7f02a89cf0b3a3842945d91a2f884847a4dd *5a0fd6b69288aae986a6f7f719700ce48cc1bb3533452e300371b284722c0615c8f670348bfabd *9840f823b6d4c864fc96aa2dc685079106eabd7c03f7327a4c76e868cde961dbbbfdf4e1c20bc7 *48e300ac2f0bdac933254d3db0c77ce01ee18caea6e710f951ee3c2da98d9eed18fee1042bb584 *9c2d40fdeaa0b85d0e1d71eb75a706e42c9e1a2b9c1a259b68d5bcbc6afb217d7b9c2d58aab434 *11726c6e971fd466a86a9451450bbe64c9a336ab8e47b24d6ce3238a50f2e97199d3b456e4e4a5 *17b18cc622b1e6fc927c20c7664cbfb68d9e504af88a5942295754fa4ae95aef56c3300d21b008 *0f2795027601af892e2ba95e521ec4c7f2a228338745bd7459ba3a853cf3e6a56b20d5f648e6fe *21b7afb6db0f20a7c24f859ceb0ada8c99e88ed7f491033b0777a0e3ab91b1079073fc22cd3f39 *51bc58dfcede7ea817e91e4e7114fb831b5b4df2f411db23f2080320277dfea8f56e01914191e7 *55b06becbd797214d0124b4b7b7ea12773ff41acd82f8dc3c2045213fb22dee37874ed5805fb7c *f907f1a54d1cbc3537622fac7d023d4b32cca959112be7908c3768eecaabf1105554ae2ece04e5 *57b02c60c6c8f49a46da30e0351314bc156e126cafe0b8583a28d80298493f8769a8a2c92455a5 *b49b069ee2664250937a31406ab44068ccbf3e5a97e04afc4414fde161ebd030739c95e7dc600c *4016cf4d920616e056a09d9809b079c3e62ddd9b61c1fee6a19edc760dc34494d93de09cea6371 *810c3ee91c3b69b52731effac0c373477dbf4b94e9490369ffbd43fcf11f34b806b3ff7e842dd8 *b5e9e0d7bb2fa7cf3fc7a60b176469e9121656cc1dfa81da4cd534dc1a361ef3931b68df20d79e *adb92a724e8d6894cd9e1dc67a9084ac818d971f207385c902aa97858b022def3fa854035924f6 *864586e4696813c232b32897028a9a7098a6d6938d288d31ddaf754a415622207d8ba25e58b677 *7533e84385571c5880280e14699dfaf791718aa7d0fbfaf5435582bb92ec02b0578f4fedcd4dfe *f8b9558ab528999f3e01f85c5c748908ae6c2f743ef5d453edbc5c67674747c7171d5f6cf8e2ea *c09d5ee9a3abd3f39c5fe5b49390650f8e183cc106b1e0313d062a96e7befe56e93716d9797b39 *9daa1f56da04580e7ffb3d91627269d1fd98f1a5190c7210368fec1f24efda9e8ec79389cd89f8 *e638dd48abd469195f801f6e31bf7a49bf2d367976e5953dc7599c7a33f6b5bbf49ede1b8fa3e4 *90a3879dc9f10bac22d11284d8fe470f776de8f23c0f767fa23b91de924e6889b496a49b6b6d56 *b1580ca6ae0be64def659f981e7bddf348cdb171d979ffbd37bbd37fa2cbd9db707d62cbf8dc70 *79fa74e1b7d8e272f23c31b7edbe6beff7f932970c13e6247d7b3a7d6b5aeba62bc7b312621b05 *a7df10ebdad8059399ec4eeaddf178172bdae90ed2017bb55cf63c0c9c2cc7ba9270389f764dbf *9718d8e1dd95edc5c7839db03ad6605db64ecc9f2af325f7322bbd5f224e1579fad27d3bcd9d5a *b7d611eb406caf7bc165e2f56e5df84a32bca6e5653c92a1f3bbae94c9d9d7d96b27e63ee55e67 *47bc3b5d6784401a7e53e0bffa79f1c9c7a6ff7d547ffca96a5bb7b6429b319308e4dcb061c3c6 *4d9b3b3bba76deb1bc7c95cd5c629e074b54ee24573b3a37238ac203c36e58e6123fe72ed93f7b *e3da67e572efedd7f4ee1b6f881b0260e6eb6f73fbe3a5f20733fc0af3ca0baad88cc04c033153 *4b2067886226ec76605357ae5c4bfedeef3bb7a7e6a7a7d915ae47d7069093bdf64aa9a32bfd8d *7ed85d8dc60004b5fc8f7f6bfff7c4cc150fbb989479ee3b07fb1ffe2bc0c925be14df28ea9aeb *7a2a95d2d1d249ebafad5cf2cfbcae5b8cf2d5edbcfc96276c28305475e7ee8d0efbe067e45a57 *bcbb3fb6b1f106298ff1f7fe9c5b674054999a41c38fbef589dc9eef7b57ca58ff4e8de7d65432 *91446eddf8d16a006e2a85d898284c904eeab3b3f3f397e3fcaae763664c14118145efa4f0f13f *ce91a49618e84bfa347a15f0dca56313b393a50f17112df159aa1c6ac65be8ed36f4ab207824f4 *449db2b792c079573b7ab37d735f49d4105c899f6114f53e2e017ec65e1dedf8d5cfe7df7a6bf6 *ec99f4b971efbfe09b5fb29ffec87ee6a98b2ffca8f0c638f7bcec2fc6b6df8731ccde32ac2a70 *9dd5129ad540ab9d6d1bc1f2f2f2e5cb97dd926bffeffc9937a7418cb1179954f636c53676746d *f1cfab7662d33977f5947960171fda6b64b735df061766eab957c92ba7310705435edda2424b22 *728e86f6e57410c17a32e8f95c11a58919eea2a43763dcb28aee0bcff2822f3299d133692ea7df *3f94db3bc833a6af253287976c7490bc7adc2d5e909d308a258667fec5e13b77e42ecd1511b144 *0037e83f9a61f83e83c64e7669cfb44b368cc79e2fbab32fc6bd717f005204156a271a87b4acd6 *3b6cf4e449c2089e4bb6913dcee746f97cd12e0b93cf2261deeedcaec7f4deac6d5b328d4ef47a *088da735ab4ce1bc33f2af15d5f51dd6a0264e9d63f73ee3e85f665773a3f185f1a133dfe3e58a *6c688b8f5c0a32e05301f3ccd08c67ec4ca31f3bd3631ee97b22bb235b3387b0a61f2df1ff6bef *0a62db38aee8485c52b312e52e0b192153bbf5b60e60b63550090990a8f0212a72888c1e6a2387 *5a058aa4402fcea14dd01e0a9f0a378720e9a1488aa24050a081d343e1f86044012ac097145680 *149251bb565ab958b556bd8c4565d726a55d89a4d4ffe7cf2e77494aa2644991a379b0098aa296 *c39d79f3ffccfcfffe7f3f1cb55e3d1fee779b4db73ddc196a386e614cfac0243f3bfcdb0be6b1 *7c3d8c61bbf3aa7790990c9d99f2fcdd79b758f8d7cc7ffef897f9abd362bd176cc6846962517e *d273f3887132ef3ff5446ee09038696c67a3a5ca6edf651ffdd37def6f6c6ada265a7694ffeecc *cd1add2bf41e77b1734366320aca2dbb30ad20454b9e7bed8a33361af29345ba937a911fc54190 *ebe514135f101b09d48bf6f1fedc7323f9a787173c767756d24004480434684376ada13dd6ad49 *0e06b024f949a99bb861cb83f24140d1742e433100a5292abe004b7eb09349a3bfa76fc43c3eec *63d90bbbde9e4c866a936c970cdc9b97acf36f53c996182de5163d0a8eb82327565f7be9e4fac5 *982dd71abcfc9dc2b4f82e419de9c6fbd357e74fb6cf3c7fe6fcc8d15331ce8b4de370c2c5096e *ec3d776cb4f93caa99a8f596909d368cdc8fcf0e3dff22dc2e79b840412f54be76ef339305e4f4 *3c6f7e7e1e06ab53b46ffc7bf6d2f8ea3fa6efd5df24582a291a4bbd9114d539cf1fcde4333670 *15ab326558544f840444a66ecba333da0c0c33a4c15476ea7d2b5ef1ab8f767fe59154a64ffffa *614cbe039f070fd3d6662623cb59a48e14e4846bde9ab8393e9eb93e11edceb53a120809741d78 *f664ee8921afca0a0554c79305c584ae796b1aacbd5c416d62d78fb6c72958c0cf82e319da38bd *274ad1e05bc8270b5a7f8f319033877247d6684f9fb1a1f55e1f6ec99f2bf1db775daca40666b9 *e85f78df721ae26fe2dba740cefec78cb77e3140b22f2d31599cbc327385895808a7e0e8b67fd3 *6f516f8eb2db617c8c3c359235b25438507c62fd3d0d139c3d6b5997dfa10ea58cbff5611d3207 *cf9cc93f7b3a9735bd722017aeb130009b6dab60d70e329300fc0472969c927befee9d3b4518ee *5333f6fbd7e3fc64718ab2269636bfd800da01ae3ad0d99c39b95ef64563f52bc62703f96caa33 *65a453d1f7f61ce815c7dc26d6665b9b99be48fe0ac840a5ce81f68e5eb03ccb42d18ab8748899 *cda110db61d3389ae7f9013d8d2953f8e773763840b1177bc58aae3d6b196d0fc3591fcb72e2a3 *28d487ed4145793753763c361ebef9401a1b065464a8be35c472660e1a260a5aba2eda49189732 *9b24cdc3b055d91ed6ee6606b4481c5dba13b354aacc89baafbee7f2b80e7cc3fc4bc613facb3c *685c7c259f3f66367f44f4ebc3c5ad59cbb14577c48b29d09c42f31dbdd25c4d545e872638b887 *4539c1418716ac29efdaa46bb53e7f3280f4d96ca67f20777c10c3fd82eada2c38c027bdfc0799 *d45a62c799c90439617dbcb8b808d3d5dca7739f143e595c5c28cefdcfb2d9cd5bf60c98bba614 *fed0e3f5e1b6eb2d08e97af5c938a4e2237d8f0e3cc6fb8f657207e5a95a69a154be5f5e58c474 *7dbfb2ca931d3da95eecc583b8d7df5070b20174828f5e5f9146b383c9287e90ecafc9c8db0c67 *7420c9b42ecebbe5dfba8ecce78469294c9fd7656a8b0813ddb4f3233e3a3e5988f6f8543346b6 *47da40d6cd7927ce03816283e3d3de5125d69eb05e50fbbaa9d080c9197ee5ba7ff5ba8be92345 *713026e2bd5c910c89f9c85accac855b0ceb90f3bd5f0f98475a5bce70955828169c3947867686 *31c655264370a10b447e0c056cd2796943ff529f8696d32b51356ebc819e4ffa80111d53b8331c *8b5a70cee3a76be22446dc6423c55b7ed08363379849088de71cd0737ebe5c2e95cb0bf03a51d4 *86a156f4668468773351f56465a5eb4b4bd5658ae706127e8177e4b286092bb534330f2115b133 *44a286234a06de2fdf5b5a5a2e7f5a8e45d588a0105106138b3ab6438fa8f1c447329ec25ee1f8 *1205f3a857f46058102169941013c04e722eab89d1b279cb6e0fea412ed5dbe3971c99482dc61c *8fd4d2c4f644bf1a8dad8858a314865b27a8a0e9568c5e63a393fecde9c03cba16f00aaef2b5be *3bc78e64a03bcc431c1ef901ce5704014486ba35e3e016a0503369b172a9a23c02b8b5a3af0eb6 *dc53089919ce472c9e7a4eddca82b986e29005615afb447e900a4f736e949fd018afb978aec856 *437311dcde7092dd215ab2dd642613e45c5e5ea69be2899283923ff7cb95da72adb2823987d813 *2eebd0bb529d5e25b1bcb20cee6877772726316aacef40baab2b95d2ba12a9049ea125135ea556 *59aed45692704fe145b8cc6a47a552c1252e5cb0ba22e73af82bbdbb3bd999ec39d053ebd432e9 *eecd3993649d448df7058f555cb4095ea8a915581b0c94278404903e0fa3f66f97cf434b26518c *a4b13dd1c56abd3da249f5f6a431814ece11edb567fc6376f12330923835c8dc110c5267a74ee4 *4e3e6d9a870ddea5a38b51f31ca1254bad12fe330e7aafecbd3bee5f9d0e9ca026b3c97debeca9 *fcb99f0e49adbae8970d0c1d66c99333b94e08043932421e566e98afbb5a8121375ff22b0b6ee8 *e1e3eb2ca82d1058e630e50027d9c04fde94afb159ec2a3359b02d04ce2db0a7e255e0d6dc5fbc *bfb4b454be5746bf6fa50acfc33757962a705f2a1dcbc9c40a260776253b3ba1c589d58eda5205 *b398938964a2039fd45693296da5d691c42c478d55b5543a99c0a24f094debc02914480b0c4f74 *2518b214c89ddaec0da5951e13c1ed0c05139012895a8b7891b0179958f0b030d6675bb5d86474 *782483bc757ba29922f895753d2d9ddef6dd5720d5958f19892a39b31353d3b8243b3b9c1bf95e *1e46272cd5b01e7339204c3035602d109f52d5e4581f9df42e7ee0369053fc894fb1b563bf19fa *66de6c6e58ece68bd98412564229ca7a8637fd8af30dbf60487826e42c1a05652ad2724a972750 *d6a3fd1e9a64d9b66ef93460b7991922465101e848b0787ea04842ebece52a12158c243c8231ac *ad746a1d09b28d30bcc0d4a6f51eadab4e3f7c732a9548e093644712cf7e3b3be1151a2ef0a473 *451c063774587b311c229a4f4eab2ca004181f61ac421748d7b5fa4e7add02ecc0b42a5b151fb5 *a8b722db832dc181251e43f5d44df9d260f1de1ce316ad326cdfba3161df9e44fdc19fe54dd314 *fb288e1e986b5da807c5bc7a018f44ae91a5eee40d1b3c5bab142127dd520f15614e3f73e4b597 *4ed6bdebb8371ee321699a85ca660d1267db71f758e8d6ca66e8b17bb8c3aad09f19335940ce10 *c05278a556ab812dadac56e009b8beb5959a903c5de55a77a2133de164ea801e8d449793190383 *09885eb0218a05a334340d882a7e7820aa90072b479ed8801153387d6a38dac28c8d5d821c64a1 *2d12435966966da93d30139dfb934b1241755af6da6ffd72042ee5cc39f26ae4c9e3ff7a45ca86 *007d3247b4a8b30ad6eb97734e39da549f98099cbff0ca602e6be2226e1705d1c33937bc81f50d *d868b7eea4916cc02e0e9c2648920440cb46e8d9918fab5f9f3de8f79633a7ec2d9a451b3a6c97 *fa2ff691d8aaf8d648fdc7adb4e7f54bb26802f8b1e0c492e6ddb99786c1d3b3c57168e8156056 *17ed4e6b54fb41cfa4e3464f38418e26734dce3de79eff33b7cb284a86a108c1bbec3977ca720c *236754d73d24db6e443263779b816be1b364a6c25ec6f8c718bf61a4a52e815bb0fcc2e4a96772 *d93ec31625d264964cafd89c4cd7a5cde59689d6785c41efa7e2456060cf7ed73f7f49ec4869f5 *fc182c0b3f6bf8f99c5bce18da5e2d51b52bd8afdf5b61235cb92e155bc08f7567a6f04c92b181 *7c5694e871685b5206336db411ca222628a3a15a8253e483bafba382fdd647a690938ee87d8a9a *f39ee69175ddb7e4dc975f5a61234cde28383e4a6c81d974ca1e1d99622d3d61f428ae10436dd3 *1863d8fe36af58e872528707e60d3de98d5a5c14920372ca101c3c8e0eb0cb0bf53d85fdfabd15 *d6c5d41c9a38584a7ac28251e109d64b91cc3ac985102d37ab4b201567e419927fec1078cbdc8b *84d7667ab957c1829cacc5ea7d1f619b350d143e1f70023979b784359da2bf0af77b2836758b73 *3b3744b06eee1bcd7199e9605fb45a2f91b60fa198a9d008ccb3a9226350c527283dc00d1171ae *05da96e92002be5182b0ad8fa0a3080355bc79a83f0a6659169fdeaf6c8c423153a111c837d7a2 *8ac018b05a95b93e18cf5c0d15a299542a6bb0996d9b50ceebb2f319cd21a1a6237d3cc3e3a233 *fb75bda598a9d01a54498d9e4b892d587f5a2e468d6fdfb1bb5ba45047b9cefc76bfe9ef825cdb *c300c54c8538a8ac431fc7b0f5b2efc6ab338c5ec3ed9958aaf7030016b1576f67e0236887e9e9 *7e239be55855250830563b400a0a31e44d248c5df43d92ff0c2a4cdb25f6ce981d2f43b4758cfe *d522a96872654f3f931785347512a4159fab7680141408826c83c7d893c74410a9c88aa6a30e20 *27fcbbf041c73bef5bd1624d5bc3f41df6c618a76c320cfa7ba15fd48fc0cba2c38c82b4bb1a3a *bbd7a098a9d0029c1b3f18e242772f56088309c982372efbe7dfb6a868f7d600b4fcc9ef0ad6ad *02d2b23079f6b9fc538fe7a5232d04e0753acedcc750cc54680158610e7d2bf3e2b38c0aef7156 *d7daa7e25117c6ece19f5f1dfd702bfafaef7ee8fff0356be29ae53b13e0c7befcc23016ba2d63 *6d523ce43c1854ecdbafd692f059668129ec659006e4af7e7f15dc577a2526c88449709829621e *cd8e9c60c34fe852ee6c6d00db476fb08b1ff8e39336aa783913b95e76eef9dce3c7bf3c6bddc7 *1cb1aa6f18587f7a1bc5351f5e28662ab446a80179e1f2d49ba331c5ad98968fd01f85756136cb *070fbb283ecafd6c2e47e2a39eef161c6615f9cd193c83b166d002bb0e56923f7dc278f9cc00d0 *af705b8a5f6200c3c10c70731d4dc3fd03c54c85d6a8eb62150b135337ff30e6d585481b84f002 *71e03511d71c1d7c8c9dfdfec060bf69171dd7b6433d041e91e1dde7b4648a990aeb40169220e9 *64c799bc615d9d6651a1fd18391b10d63516d278a43c2ae5bc8e602c915db0a552891f680b2a5a *46a098a9b01ea2d2c9a8fe582e5805ac5a3b55e054a9daa936aa5492ce25131572e1317fc82711 *60f3b01193f30a946fa5ecad61ec849ef2c30bc54c850dd04c4e7188c2450501d767dc2f338fc9 *9c115db0d148b38cc18db49ee99511f0a1e49a5f721ae4bca870433b6a77fb0aea36286c00ac30 *cdfc400d1d03e6a4567d5ac4eb00fad065c5105a920bac865223289a47da96512d2f164a63f340 *b2798715221f4628662a6c0cf43635712222c8e9f766c8f449cddb701009b16cac2b214e26e5df *a284814f11b052f0b29787ead852215e99ca26286f56a15dc4b5a7511e5efe082c65524eb6aefe *18eaf7883a0ea1846c2890ddb222904208c54c85cd412e17c3622a42ae1e7fb156a49ec6c2dc11 *522aa9175f51581b8a990a5b04094f47436a699b872847d50de4ebdada7aca0f26c9fd398662a6 *c23620265aafece17640315341612f42e59a28b4816ae4b1f947851d80b2990a7b1591f295fb10 *8a990a0a7b11ca9b55d84528afb86d289ba9a0b017f17fd8048f3a5830dcec0000000049454e44 *ae4260821e000000040000006300000013166060e06160605003624606083806c42a20c63b2686 *24436686ac4236381df28c112c0ea291f5cc00621628fb20032a9007620e200600c6e82d026c00 *000044000000742200004200690074006d00610070003100000089504e470d0a1a0a0000000d49 *484452000000910000005408020000000d9f42730000000970485973000000000000000001ea65 *16a40000200049444154789cec5b7f6c1bd77d7f924ece3bf9a8bcb34987975881aeb35d538992 *3258024b59b05945b245dd2f3b488bd96b864efb2bee8aa133826cd386a0530a0c4833609bff58 *172dc006bb400bbbc032db408dc940b349409c994394984625ecb848c95d2d26f71a5dcc57fbec *ecfb7def8e3c52a44449c90603fe9a61c8bbe3bbef7d3fdfdfefab8e4f3ef984dca65b8a3affbf *19b84deba6db98dd7a741bb35b8f6e6376ebd16dcc6e3dba8dd9ad47dac67f1a70b1e8900587cc *1709f76bc799495896ee1e20fd36496737cf62dbc449e81351245a417897922768768084794273 *44b3ff0ff9f9aca863ddf559d913e74e93d7cff09253715d3820020eefd460baa147d7a4181e61 *a66b64edfc007ffc5076d767272c4ec43100497805b25c5c799a6512978a9caf8d99fd87d967a9 *4c7c592c2dd3f247c4e562e55951a91d74ca34f13347fddf0ff08287f6d2434fe69aaebf0ecc84 *5724af4ef2d7a7002ac08907c20d01184669746321844d44049e848d2cf34a50c1530f8f98cf4d *7ccac8858e581ca7fc045f226e40382791342853e775c299fc6819f8aec0838b817c32a20fbc92 *bde753e34708522891a95971a92400b3ea7196a2ba517765254050fda02202c103f8cae5b3f87c *59aabe7080ff89dfb70f1f1866066bea07dbc30c6ceb0793fcb5930aad2217009579e0301d1a26 *96cd34c2354ae194e06266ba72f6a42578d2ec0036cff39841f981b1dc9f4e44ac849b71cc5c94 *8e28b48a8bc4074b238ca69fb2ec91ade93d70fa63d185520c1dd799a2e1498ba138ac7ad901cc *b4ef256bef11d4b94d8408af4c26cf8be9595e9cf72300405d0c541666102b6b566183af1224c4 *ccf5fc0830e1f28aa0a04582035a4746adaf7f7538bb330b0640b5e68cb581d99b33e21f5fe2b3 *059750d7738b2119fee678f6c983e65d96f83918ba006b47295e8b94cbffa9eb7c6fd23a7f066c *8e489f49a4ffe4d2e4e9ae1cfb8793f6dee656df16056748384e4a85a2435c0fd063343b9e1b3a *68321378417e427893cc6844dc24e2a7aebf78c20c27c1e692b00166c818c9598f9cde98c18990 *9c7a9d1f3f2f22b4843bbc978ce4a999c5d59c457271b65828e7002a6a5033d6606561aec7edb4 *3fb25b78cb95ea8263bf3990bfdf4641498556cabd12b9353013df9b14af9d10dc77978573b9e8 *0ee687bf7dccbe2f0fc00845a1944ea542ba7572bda2ee0fdcb9970bf4e50933e0605e6a298519 *326d30fb6f8ee79e1cdd8098887891880952120058f132b961e41f7cfcbb3bd2bb7cee2b76a2ab *e043cc8ce2c7f70a544c240d4e61861e95b09d43e7f6ecfdc5753132f73ef9fb7fe3d3051f0128 *1501ad3ff95aeefedd160089120f85b851f17d519873ffee35e1944db03c66283948f382742914 *e3bf43471f439010982ae712275041051b3568c3ad57c30c00835c4370ee2cb80ab0d1ef9e8485 *7899d7a00202b4b41836a058583c868da05ba024860da22050ee9f4e236cca43ca236b3ba87ac0 *20268d3cfd0a2ecb7983ea105daffdaa52a9c8f5bdb2971547146c55e2f21b04c29dfb2fb40fdb *cc65f0871ca201b838006c6c3f19ffc311783a8802911e8744b104d2f797fd633fe45397c1079b *89677145c5057f78e4606e641f1341ec0935e05d87cf00155c6f32ba32aab5c42c09d8d4a2eb18 *e6d8ab2761212e73454425c4d51963c09cba5f17f9f846b835e27819b37fb036eb5b471b565698 *01d9af4de7f70db529a6246085b789b33c347ae818dc972fd5f1a38253033fa8bc21a95caf406e *698aa38cd556ad62063ef6fe27dbb23605188425c7f59db70b6061937f31ecf34ad5d095ad4424 *350678983c2b1036791c6c91c2551233f87af4200397886c13aac37f29696190313013c15b116e *bb5e78e18526f239778afec7f9f09a083c77eedd85f2877c60e2d8b66cdf7b5090855a08d2d148 *ea4ed3300c5837d59bd27b745dd3efecdd913252662fde52037defea36efb1434d236f5d482e9e *ea24c14df9e9fc69fd89a70cb8fea62cee01cb9b2daa7c051888782ebcf016997b8fe41ffdab9e *6d7defbdef08e026d4aafc64d219c58f69985b7bb6013ffa169df698460fedf8a4a37b0bf3836e *734ba1ba30a5325991de6ca1f4e6f67b7e4bdba201b5020c5ce23fff3b17d748f903e1fd6496ff *6ce1d8b37dda1d062459a0a6cbd744475707eda1b082410d78169043477707fc708f252e5cd604 *3149a7ae69e00642ad4b07d6e1bed30efde283ba656552a994b655a75b68665b26d5938275e0f3 *4af7d30433013eede409f8105cf1de9a7366bdb2ffd8c823bffdd4079e0b320d3bc314a09f3241 *1152f0af97c1d260bff00f3e20979d5a7767370a8b224fc27ec0bff4867ec54bde426156e4c102 *5f1af8d52f8537430d716e0118241dd7be8e1f4a62fa2d529823c4181ad8f77b1f780b0a63e407 *bc482ff2030f69f41a2a0c287ee03d454937880990d5b58e4ec88d2e68a45c7b5e8919bcae7e04 *c91cb73f3f0a8fd09413b08f577e243c1ea291bdbbb4f03f85e1dde4895fd9e3bee70622200085 *746b4a262074d01e6d4b0a18017531ef342d16fcf872ecb43b13b081370bc2271eb5e187a0f160 *06f000468f816c34539e1598c103bcfa1d0dcc3bf0e7e69c99327702f1d0a14394f5055703501f *d482bbac4c3693d99141bbdd424131ab4f882aba458b84b58576dcec205bbaf8ddf7ea674fadc4 *8c435277693675df4066770e616ba5dd57bf02d586f28af325529827f6837f04b7105705fcc404 *8dc958c08ce2071fb5811f64894a68253f776861798f466afc80a9dd081139d080e0c302d107cc *f4eea6b0fdcb1be2c27fa3f703232b978ac187a5affc12ed4b1bc1358c0efa1d3a08dd6019b317 *9c8d4e0d0375bb8776d36e4002dca365eafc839fcc7d68115c1c1eb6bb0adbc2fbfc91c1f403bf *70b7d683aa16c5b6168dc5c6c3e2f553d447270bd8433286febedf26fd033c404301e5b52c8b82 *4704456ee66a1382c0288a4ed9e8b1f3fbfcfd98258229aa64c492bfb2e5fbf4dfbee49639096b *595f3d432f824112590b4366ef60f02266da8a9a2f140133d3a65ab60d7e301fa383fba83102d9 *6332f58f1b0364bef0122635320426098aaae939a1723f4c3d961cc11df07f7e809cabd00e9c58 *5969e294a93b2a21a0dcd220397670ffe7f4ea9db4ba84f0f86b4551bde3aae9583d66658fbc39 *2d4c5951c9ecd90909b3b1da8047001e5490b7d2accd3a1439369895de663d7db89af4b3fae455 *140ac599a908afb06101287a4ee2ff4b42753a80b2e983d82e0865d163a22761b18cdae007126e *28957ab83ea68e3414da4057dcc2a5e2a56afa17711592a977a20bc0318ab2a3d207b82b00accc *029968a1ca117e7798b9ddf6bebdcd79734a45287f45d04c71eba90e3351985646c6171d28c88a *0909aaec13788228b5aeae01f20a59d0e090c8b6ac5bdd73a75141828498088a892f1e57464664 *82e72e13270e8b54ca481169d12f68c10fa26bf58f3841adae4f669240ce9b2f62c117c4d5a786 *895f718198522d92ad29217864c106531555cbfbcacb4c833e3a888b44d6a6d5b27f77d92a3a4e *25ac240bcda6546f67d2c8146c916304cac2038150d0fcc12be2bdd72323c919b5b2a6f8f218ca *2b6aea502bb1023f77c62bc90e6998c892b1a29c8c2e5822d5ceaa0ed843754199dead63bda932 *fbf590429af5d5991a26d9f132dec214147349c1b91eba1d222b623fa8f8b13548ef43cd94a994 *674dc900c3c39f17563a015b4ce069959df9aab3dce8726a54c3cc9b77145a24768cb5ab34e555 *987cb07577e7942964878675438797822d494e99bbb3d33230905a2fc32b4646261d231ce6bc7e *5903aa197d63fc4090b96efc729353f152be338d2a1f442acf65d30484828e31e1be846a808542 *ba9fb5009320d93bacbd3bb1f7082fbd5e14d8b2454f5321617b76c69c42cc0776aa1a9ea4162d *36d64e85b46aa74dfbd03d3685cd2f5ce457eb14458453c90b922a1485078daed7c26a148a5eb6 *8ba472aad90fa606ee31a9f7bce4f3ab351fe5048d0c476c2f8bd573b10692318fde6711959ee0 *217804515346e1ab265cd446694a09df388f4a0da626789437d64e81c463971289a9b5e536a750 *b074b6b833877b34a9c83d26cf3b9e47ae8a8aa879731a4ee3895273d6f5384bdc186cd2d2a8af *8db5bac0f1a7c447921fb42ab02fdc37e1b225af6c4e910b52aaf6deda9409a5f64e621a50f5eb *98854a6c44bc7956916d94bab8be8222cc30754eec35fbc97de724756dd0da24d804f76e24d576 *4763e28ee3fb757d5ec8886a671bbc6214c0a52bdbe836ca9a7966a5e22bf1254ddc0f6a6d78ca *6cbf0c4aa636c0d6c1c99e2ceeabad3c6ea668e47811b096b0558b4f5a0d668de4d58ed30eb161 *1901b13e9b427904f9550a93115a9fae4580ad6054ed521299ddd959b86e3a92e17a6d7d05a990 *96dcc8ae51301305337917d6ed6347d84d3a68647ec6319bed45af415ddd982eae848d6236d47e *ae9ff09ea295916d9a742bdb805392546e8deee83a8994b78563fcb468477a271751c60f214d4f *c8108a0a1e70c50f45699a325d4457895b740987ecccbba0c72a476f538d9485576b06e518ed3e *d570a0b00eaeb6b66f14987a1012bd2709bc1601838d7637e866b49b6e35b15a8048c2cc95ee11 *588836776eb4f1f03af60f37cb4f3c85503733c26b5560c4584806b2583e7a5e14ccb0a2d72d65 *6a67673f514577fb5473ff6507bbfb92f27b4d939a2af5d0b5d5f2e1e62d2d2bce64547b492883 *d512525e27978a20fca8264bf3b384aa08dcfc6c55b3d16b71896e6595e4aa2dd2aab3231125b5 *1bf9a944fb6159c62041af086964c84c5c0b53f6cedccfa016c6cf6d0bc4e5a89a51688c453d9c *8b76b56a9b9cabc733993d9b6064982e2ed707b692e397dd954fbb81c0564df1931ed289391371 *d48d76a1125ca844dcd4a38605ce05a1ddeb1bcff5638e08cdd77d8f1f0a3b64d5070c51677f77 *846204512f223300303549c7cfbad7c30f882cd4da41ce59c2bd37b05ad5b48423071fb722e124 *8709d6b033654fbc791a42672fe2e349bddeac6a33b3f961db46a6e3ed5d82dbbb56231bf133e8 *65471afaa6edac3ee05704b6c7ea48e990c469e40be6703f14bdbe1c0b90718450e521a7e7c80f *ce5d69d9e66eb86520a6e74ddc981651d3727f9e8de4fbe15ed852a976e45aab632d6f14b68ded *8f440262c7dd7701a55b05fb6fb8ee6655bb056559320f426f6ee2564035692409c705c513b9be *8e98df8a9aa6fb2a98e9b23baa4b0948c5c7d7d897f314434ec40916c3e82b4d781d3feb14e71d *aaad560b2b3a75418091412473170a606400d8536a8e514d7fa44c6ceeb4d9d777faf3e815e389 *c4643f5040f11488dad0cea6936c306897d4c90b64845b5034966348cc2c4d0206a7a0028ddc63 *30a33a7ea23dd56ec946e2411ada632c63613648eaa2c0f05e73fc802fc702385fe600188b734d *67d91c7bd97f7bce5dbdea9bb94c8e9f1755af0880fdc181b866d574f5f8aa1bba4ae8a9e5fae6 *6e44bb92a819496c6a3825f3f634e9f9342c2c61c7386ca2a4d66f67ed1ce4f71519de156ca263 *b5c12cb158149d9b1c92240d6dbd6483433aea6808277a49ae46f73f34b63ff113399aa85ece12 *7fe62f9d13679de60c07e2c4793e71c2733dbf522ee2f4ced3b9a35f1b8d1245aab3341a196eef *ad55ec474f8cc8f6db4e6e889c3fd5f43affdc991bbf76188b95eb6c75cb5d8570134e76adc103 *fbdcaf661f6c28af6326865b07d821ed92cdadedb64b464c12751dc1bc20deb038aaf9fcccbd3f *1f057e5808a9c126864a65b7050c1a2cccaf448e91668fe8b25ba7cb49324ce748b4a7aa87e299 *03f7eac69597beefa829d2ea4a123672e4af9d7fbd407efd6192df6d9a32035cbec966df15670a *a23aa725fce2c4b3f9e141cb5940801130c6ac8cc590d6ee5ed64ea22f7ef24b348119b8473744 *5303e18a42e1ca7c617b7e487ccc4537db5854831cbdfab3a44fb306872bc267694bba479d764b *7e28e1fa9859a9758a951f52bf13cb5357168bdb7379d4034310b2311f50e3c1e735c798cbd9a8 *0d726bb72ebae007daad6d1f7df8ba9d16c7cf91e9d944d646191a9cc6ceff97287166bf4dade8 *8f023858b0020c0b32bf78ecb9dcd0a00d1582dc49c6321177730c35d3b8b6fe75f272edaed663 *a3228b2392bcd96ea97bee74342cbcd178468163594ea80d5565676cff080e8ae38c4dbcd1137b *3c6bd7a813e4dca07e114aac9412c519990e081134dea85d7ec2699a454d57c14c191964f98dfc *c40aaa3acbe8be0c6667d99103d6f8336c78905929590b81d9098c73caa9ea06ee91aa6dd24a40 *146090771c39981bcae79c051cea8d00cb98d96c5679c57676dbeb267bc032dd6f8e93670f578f *244d8d9f3be33f3d66f5aeb61bbb06152ec24329c758d56aeb718c5bd580a1bac9313fd4cd8c93 *a51a3fd5f6920990172769f690690c6c981f88a738432f274d8a0bd141307ac946621f9cd4fc11 *7e85fc286d76691f1397e476513bcbfd208f7f711275235d9a020bf37968fbc2021cb89c8444c0 *961c407764df100216469b38100eb2690998d11660a4b10f120afbb151356fd340988c80b85ffd *0e4e58061b491d716ea23083cfb42c0a818882d9578f444a0db9bd8ac009bdc6fbee1da5c60859 *d1da07821c5278277c4cf636c20fa839ee83cb0d55af1c19997dff1fe30e38b68ed05f29c7d810 *08d41e582fdb89e343125460db62e6438316bc86f3d6c817989d2697b8856895114b481431d1c5 *f89713728a42556396658185c90dc57601232b7b57b8d037c6fd157b9244c2563c7ba670f638b9 *83d66aa3b69b58f4c2145f7470f4df731502e015f30fe7d5cf2dc66a8e2861377090a7265c5ee3 *470d01e01f2e68849726c5ec14ce6bacbf5613e5491cb15c224e291ae702af08e9ab3a6b1ad55c *604580419f296781d226ebebb72c1b938734a666540e17810d1570cd682b00bc2294cf515f5114 *e5501797239988382c0276d63e60409db45e40b0aad56f936f8d834b54af24016cf4e509e79d02 *a9168fed35b17050e087c701b04b0b6e14c9fa6dfbc0211cd89659134d45ce21a9d4f233f263b2 *6315fc9b97e84522df85b039a523ee62f3f47a350a1d656417e76527c923d970c47e78b4ca0fe9 *8e74bfb934e3610b1c29cb5ad93e1bb23e0bdeb351e6476472ef0715f5374b7e9c1eb8cb9653f2 *e5e8889c8dc06dcfd54ab1a6d475f4b9e7936c699d34bc1666ee1998db4ab599d79b3c2ca8f4e5 *8be663a36c5ba6e5a8760309a17dfbcfcbff3973e98a8f5eb18c3393f96ffc199193a9299a32b6 *19e69d38436e1872a2b44a9d24bc29db7d77f6953fb434f1a33ab9690a36f15ee98d5e6b5467a6 *b6e60c79953efa222915660a64d62185cb12b0df3884b2bb49522c65f41a99ed9926fcd4134edf *828e7586dd109570c29c1a2933b53595c9641644a6e8e10f4198e21a09c30ead03e7bcc18b807e *3c3298eabbcb327a3319c67012779d7fd4def5fcf375982939820d6db7ef7ed7dcd11c36cf5bba *f863edbe07cc9d7d6bdfa1ec9189a3deccd4255e5180814b7ce8d9a3dd9ddd61f8bfed5d7d685b *d715bf4ea4f4be54f2de2b12f163f1f0db9212ad4b377969595d32882183baec8fa594d29a31d6 *fe33c860594b4719f9a38cac65a31d6cb4630cca2825ed1f2329ac548518ba8f8cb81fc30a388d *4b1dfab2d9f8bd3522efb67a896e13d9db39e7def7a4275bb2e46483501d8cf0a774747ff79e7b *3e7ee7b80e9b5a2d50c6cce4cd2cdfda4a3784b724afc8f40adcfbc3e263a72e4e289e76f3c796 *15ff9f1ffe6d30ff2db033f8379b3a0326e4f947c2d9a9f207d822367d86393beeba7dff21b922 *d521cb6ccde4b7e5f3b7e4cd41be5a9fd592da42d661532abd256d6c35b2442236d262cecb0fb0 *01d83f6158af83bf5d0f53e92c7cf897d2b31f66c676d56f2f0ce3db6bc333ef206b6006eb0046 *e9f2e5e5ece7bfe86fcb2dccce8acbd26a71567c5fbc7eac3290ce7f75b44347829c3a1e3efd84 *f7f6a9f9cbf5f2a2ef86b2f8e043a3dffd11a0559555d89bc8bdb5ac5c2e670d5a19086fd63413 *caf5ffb49ebed90eafec94e13b75bac541d5f89507b7f862e945b69c3606473b9c0c1696e4870f *48f7cf738b6c661e5d0f6be4b1e2be43f5cb2172a7627d6ec9653359cc7eb47f6b2da2ce1c7e42 *c5e67cd63a776e61e113435ea96bcc52597c2780d066b064f24fff80039d19db9d2512786fb2f9 *c9c34f209d3d964d887d7da5bebcb20c8f867d6bfdeb77d697dcca922f5690616f35b25d32fceb *8985bf942a22cc7fce08a9ba86a1c3455ffe6bbe3e550a9f7efcc22b2f8af3f3f357d8ac5fe1c5 *e2ad4f3e7bdb3d0ffcbbb2282f4bd895d85290e1e636b2428319bcc2d7da710a033897b0ac03c6 *70c8ee0c2e8af48a0b6613cc0e6e32ba74e186fdf4e209b1745c5e92c6268805d260e7e9092160 *f2d895dfca733f08dffbf5c25265f603f4ec45fdaee2ddbff8f29e71717101ec3d3c3f31d51bfa *f4e4176855f1dce8a685ec4dcbc7de26b61dd8c62bf00a418ade1d3e124e27dea9542af29b45ab *fb9da164a0560d5633d7185da122144125003f27a8d6c4e93783a9922c3778354ef4422a9bcc77 *a0c76567b9ca32fb3efaceca85f17617edfb270bfb262ed5d847e03aaa265d22d59ab64de4edf5 *c9e42dfab8e7ca1c0e4d5567492c2ac7a233c9750cc7cd8299b12d15ed56e7e22679385b69b378 *736ed2d93d010be9795e431fcb529cfb6ef4e9469e7fd53df2926a45089a7d3d2c73d39710804f *eefdcf338fde0b6e67f74fdb163346118ca860a785862d14ecdcccd9e9696b76a6395c72dabc37 *800a801cbde75efb8e7188ea7c5f33ab1839a856b6cd02b54ffb6253b690cdfa04be0bc8f941cd *4c4dabdf69062f7a17fa934ba9e2cde6a8ed8cdb236df4c9217f1b1dbf5e89d291a829130b1f09 *1962ee5154e4d137dca025a9948cf600b6e24ef3859f8e1676743bfe621dcc14f7285a26c51d63 *b530307cb7e6baaeefdb49fe8833645bdb1d36ec983b0abc306a64b070817f7ec18b55c7e03f6b *a83ec69e76340561984809c2001f034feb83ac676185418d4dc7bf3c9841c5002486fc9c710651 *d476eca5c4964e4114ebaaa6ebe2098bd27d5a1fd66db9408d98703d31b3a8da7682788204bc6f *59133890a04974693bee9ea60307b03979f3d85385c2aeae5af1d7eb81a758156d4845bd4fd049 *e0d654055cd5e800e1217594127bfe2670b6f4df0acd0f8c3b9a19d3edbc2a77a0b26d3ded687a *e9e436227d2858d4cd298af50c30b0ad9c6fc21d1255e103a9bc97ab097de20e09c54dee2adc94 *1035f3376771c404a6ea2b8a7380f0a8311fa6c1ad548290e15dd045800eb0bdfeab516764fdd3 *d6d57c90e603878fd520aa7f523a9dda8ad47151c50bf85c41d5e88a07373a6b50d6c7d4416b33 *9fbc474196d9a70d7d6435d02550da61bca917cd4827bb78145457b146a8db96499f4ee1f3aaa5 *289d66a5b23c3b1f1d29e1c28ac3b37c29b7b46bc4726ccbd9cee19143a8b082843bb0c0b0bd20 *943e7a5273175a6023c5b0e40d46b2f4cb31b5381da497393c6a474b344de04d5c15d47c1eb16e *e21d6ac43303e2a5d1bc71864532eaeedef08591d407bd921aaad4aa4ff3a56834cf30b85a6be8 *93e1462ada3ddde933fd3e3bf6aec0a124555d58a1b42f3bb0d7be779fe30c9bfc2603cdd2722d *20eea2d28aacb1c0312a61edf8b43c35cf24b3b0c0bdeaa871e91e3c5038fce371a5603b357a9b *77a56e1446e962866c2f5caccdcb6b146ee2243d8b98de7a7e42aa87dba21b7d6474c2142b746d *7d9ab2f2048f6164b409edde18c272bff97e34f96871666e1e13660727ecc9ef14c0aec21d2f42 *52463d5bb469e05a6052158c70c3c3cb95cab56327450b6cf42752e524a77e33fe9582d341b19e *6794d1cc125aa6a6c5820d4b1bbc3145c54869da575c60695ebbeb2e89cd4415b8481fd4a44683 *16e0d1d24117efc932c329797e8abb151a6ee249f7cc8cb750b6f3e6738f171cc741d7ba1a18d1 *1137884592b823486a8a6e8bf889f2190feca45b6d824d2d294d9fb86fff0878ffabcb40b1f43e *57ae69990012ad13b9005413a29f35f458bf527e7d458317ef5fcab2ebface86f4813d7af815a1 *a8220dc0b2de0b3f9b84a70a2e04cd5c44044acd2821694979eb8e8d50d620bef4dd675fb3f11a *6ea8aa2786c06e38fad4983de4a0afb6d669dbf872ea1dab5f52edde969dfbbf61d57514d22a59 *ee6a7cb9117d9e7d55f3bdc12a8249547ca9c38f4ec0d5e85178175b12acad28cf3935407f6a58 *99e441210f3c48e9bcfee1fbc5913f721c95c62d0cbaa3df020f73ce0d4cd336ebadc19c92ffe3 *11b801059c0e30896a1e1cc45ec277a55f3eb0df1eca999eafa656721d6ed24412c5b347e4ea6c *b56b8300d3ef0714d4c2a13cf86d79e455f289528d322436e92e9ab2608bd03253441f4aa2d4c7 *ac934004a6874b78529c9fc3188bb1d1c210de613250219d4ee850037c67a726b699560a2be041 *858f19e211df7be15d08a52dd6147d4bea00aea56abad29684ad8f595b299f01771e493870d4e2 *be77ec38a283a2b26e98a2cc6006ae7b17942e54f44ee073c064fc1bb592cb3d1c0b04b045a352 *ab3296d517701fb3b63277018f45dcf70e0e02f64364d5c8014391031460bdd69a954f64eac847 *eeda0eb697d79ad2925696d72094946b7a09fdb9dfed256e5086800c87b83449ec7120fd66c3f9 *016e5292d3beadb599041b3e35ffb3de68178aa58fd9da82358d3aaea51a08a2bec94dcae146e3 *64ac4c94536ea10f75496a22a4719e548e9b513d1c8eb26ef8ec663e485f9a059110ae1a1f8cc9 *f1ba6ec1f2aab6a2b969f292e232ad2266f5f02a0dc72450ad4d2339b844931d5fc927ec63d649 *3088f6b4858c9b71e75ca166fee9ef6f34d31d8ba8a844a0becfee2e3ab263277c1fb3b54491d2 *731c13c16162200848e9343a088922ed35088eab5bb0e025948fb3af680e0d71ec658912b37d1f *a4072938b8945e45f750c75d9d5e95bd3ce5251b2f362ea5bfbb8ab4aa0ce37dfb0bd488662802 *24637d1fa44b2118c676319cdba77ba803e5a0036cf071f4e4c0cb6fb8d734bc89647e893d37c5 *554d0753620f17f50ce2941abb68996b9561fb98b515ce4dea7b8fbaa79b36bb69f0e75e93475e *7285101bb68d00d8a1dff9ee391f01f3cb07ef2fdcb5a7a0cd7234116ecd1c691fb3b60237d9f8 *d7ac1fdec3547b1267b2d1174aedd547a7bc899f9c2abde576333ca7458ebf25bff78c3b73da95 *c10c58c5c71e9e983c30aea6c860d0968ffa9ad632bc1bafc57c1644d080df9ffffe141843f51d *b379584f8ac6b572cbd93134b9974ddc61d839ce7927d61bec83d21976eca49c2e7bc8f30966ec *2c3bfc7d7bcfee2f2cba9fa8d1a73a650000020a49444154b110aae7b30365af8f592789499547 *5f9b7bbe94e0e424381d29eccf84fb075cbeb161e18cc0a524876cdb20fc6a52f801fe0ba6b3e7 *317270cfe3a91581cb5970df5ef3b1874601187f4153ea3054cf5b809a86bf7fce7a15c55d408e *57c59f993bfb87a9da7bf31feb9fb590a808b64ecfa58bc3f8ff9700adb19dece083a36345c7ab *04c2f3e21a376fa27d5e376ec1674d30892522fe721094cfb8a7e6197cc40df009d85aa41e9557 *8856055035083f23984ff17c4ff31264c44b5b0f30d6c7ac1bd1fce5104e9ba8217fd9777dec07 *9cf3b9ea0e0deaaddc37c59e63d47b088f85ed7274272feeb29c613341f88998969a66696a2261 *e7bc731fb3ae64356ce4fa73587dfcaf6f8ccb90d598cecf1b84134ea0c1ffd06358599d5356dc *027cb66ad042f851b4734db25caf50d0af9f7525d8d5c934a34bd58e359f3a43390b901ca369e4 *147773a6874ce1ea22e14a31e61293c762922ec1840d9f347fad9bec651fb36e056d578afc7882 *4d662d755c34c7325e48a2ed222b9e222dfdb75896d68361348d2ecb639e6ea329b93b34fab6b1 *3749b26091c2acbf04fc98a62f36e689c43c0e62a1c794c598aadbe0e9f67276fa986d44f4b514 *370910a51a7fd02e8f150fac48695e42a3a9a077e963764da228b089d9c1642d1518fabff92949 *b10461f71a0a6f7dccae9b2488d5d7a316da4efa98dd78d2cfebdf78d2c7ecc693ff02252c0d3d *349d53ec0000000049454e44ae4260821e000000040000006300000013166060e0616060d00762 *4606083806c42a40bcef133343ac380b43cf6c5638edaac80c1607d1c87a4ef033306800697f86 *24862c865486648612063f8644865c201b043218f281309d2107ca9f01c42c50bd071950813c10 *73003100a04c11ca9c000000440000000e0900004200690074006d00610070003200000089504e *470d0a1a0a0000000d4948445200000034000000390802000000f6849f62000000097048597300 *0000000000000001ea6516a4000008b049444154789ced995f685c591dc74f65aae7ea04ee8588 *f7422a7ba1c24e31e094f52103fbd0c23e24d287ae20d83ead455fba16943c967d90e883741751 *b32f25ed83241543d287605e0259a4901136648460a758e15613b85736dd7370c6bd67cd40fdfe *ceb973e7ce4c32ff8cb10ffb230933f7dff9dcdfffdfc999172f5eb097553ef7ff06e8259fc18d *2ab9d16e535195ed56d98160326252d021db61b6cbc61d3659e0e3057a70e3bf5961f85bd5930a *fb605d3dda547b01bec6f5d8ca5b7462ccce5e26260a7ef182ba7ac376ddd1d1183b3360b4028b *df9b8fca9b220af155d695c827403e533c6f13658a5893b80c07a3efcd16bf7f93e7f868fa1b00 *ee205277efc8479b711856eb4ae3f8ce95eb7cc2e3dc564aaafd509437f9ee8ea76442a995aaea *92de61b278f1fd15f7bcff3f80db2eab7b77e46e25643c8cc2e09c5ffae1acf7fa0cff02579faa *18ac8d58b117eadf9f867faeb0bb779cdd8a9de7400419d30a26d071d7bfbfeabf367592706a63 *55dd9f57528435153ca98aabd72ebff3aec5b93808955121ae518a1dc6f4e9ac2562162efffac2 *da12f8cc59031736102aee85875bc3eaef583890b1878b4aca602f4cc9988aa594aaa1c9e21840 *f4e1308e937b189d7a30ef7cb09ee50b75d8f262f1f2ea26cb71c88070c7e4b9ed32c86839a82d *0ac3c962e9c7b70febfbd15ea06a2286d4888cd6c973fbcb9e0319732cc7c257f6dd9bfc7ca1e3 *794183553fac54ee2f30a3ec46f34483f590a3a2e82062bfd34f91f2f15e583d90de3bb378a2f8 *e89f500c67dcc2afe318325ce6e41d525883c52ac6656a4ca9efdcb0efdda12768cf4b65ebbd39 *77fa4dcff55acbf68ce2ccc946f24d2d2f18bdc3a095fd48bc7eb9f4b542b84719043c9665d9b6 *cdf38e93d7f6c9d1b5a0c5edbc417f05d248b164791ea29b69870bf48f7e6d595e5e9879fb36b4 *4737f7cb2f5d66dd2ef38012ac7c1660193cd4fa4651d448233868e518c89c71c71bd76ad30e94 *08ec4bd0dcb11d77c2376a0b180fda0db7b5b424fe112a2dbd6ddaae39a3b68d154ecfa508ade8 *58834ba97ad872af7187208e716ac3290eaa501b42c1844e96cf9e2a22a42cb80647f4309eeb15 *1ced9a85da047909bc0d6a6352b2577c242d863572dc3a4bfe4ed2e38975a9d656acdfcc0751d4 *66d0577c607993256fc21735a16d8a97ec13b66d70eae963733982d4d8116271f277e80a0ad36f *7c8cafa0902c2fc8b515f1b40a9d6d298d0526df8763b8e792f845825439a51cd51bab0bae2e79 *a5cc9a36652d73281307896f75ab0d55646345aeaf9ab25b950a3722ab95de98b1bf5ec291501f *3782db49fde62183fb9cda0f585d200c6153a62debe758a01f682a77a2b6f47aa8f6d13ad26158 *de326594ec98b74b6fdd285c9ae1858ba86cc1d340229be0de9c85bf1cf184e26bde33e53b3e66 *5b6782204c8b8b302d5a1383e76c63cd04aedd826901f0ae5c2f4ebf896815752551e26ac2e43f *24424343591aeea19b03638641f39c2fd1e438475d4359ccb63dfe25fb2f4fb6bffaf0b7c68206 *0b9ee85dbd6e5f9a71be491644d90d9e05604211a1cca7c5a88ae934645408be41f25ce63c7a5a *a3a88cdafcbac025b060b4b6582d6fa2683ed7c7c346a22a647ce72b1e3a14e0824989acca5962 *411de3e415a9c30dd6de755e8568e838f27863d1fb6bc0d0fafabe808674822d6855a17112cf65 *f8b7c084761ae07ccc81f90d4762c15cb3960c5cf53be1bac990ea2cd7f7afdcf0d16036d32f20 *a88b3caa710296767caa13c67ce6eb689d70ff9bdc2844cf810fe82a39793a72e0270c86542adb *3b192c72766e9c9d543532562f38cfa4132dc8f55e0c7320dbc5a2aed5c3cec826192def70ed4c *cd5680f50fc3e1e16c3783d412677747c182639ea25682d6d61f9244459e9e6b7abd495d2781d5 *0917d89e673ed512444ac20d723bf56c879dfb96390807a7114627cf34faa8cf4b2dd833af0e25 *ad96c9f73d2aa9cd3ce26516101bebc6df51677516a53aeb8ebb695e68b3e3c969ae05a7c67d8e *10abb559d6377d54a512626ecd3b4d6dd9ba996327e55bfde1a08cea4401f3665c4fe615a33cc3 *172e2fca4f4462b27e05fbe4e188efd24c47d79f0a9417fc619d1229f576a782d60697634ef1a2 *72fd2c5f87f2c28f51a35a95e014e1b4653138c9fa116b830fcadbf9c51cc11d9e92653370ba89 *70a767108c59be346cc1e73c5c0a1e2cf0b32ca90da70797a31e1a3dbebc35d7715136ad843f99 *addc9d67ec348cdb66564a100de65eb92e268bdd7c2962ca77aa7024b05d9efb3f9a4bb7dfb262 *1089f267b3c1ad1b328a865d8ff4bd5d66c7e4843e7026af3a93179d5bb7d151667f3a44ae2ded *bc512cffeadd01ed4b5dccc62a5ea9fa9160346ef6bfe5885d267a0a5a70f97165f91e7fefa71d *67bdae24c7cf1710e3ee54c97bb57844cd80929e54d5879bd5a5458c61fe2f170bd33303d6dfa3 *b7c0240dd5b431585e5ee8e63b921231eeb89e284c49db293aba611152ee07a2fa38d20336ea71 *e1c1baffda54ab61eed7ed1d0d67948719ec794dfdfd8febc1cfe7986cb52ac75176e420c61267 *3063ecccfb8bfeab8556861fa0153d66f3b041994ceb0fafafc2bdaad8f8bd446fd2d5f075b3a6 *92cce418cf7e70f3f25b6f23c3a38bd658ba7bc04cc7ed91e0b440791889c58120ca5a1cee07c1 *da127a4f2062e11e5809dc845fba76ad30fd6dcff5e37a737f43f73268e5c1cafacd3b7d36ac69 *94974ad4058d0eb518ac58260aaaf19f2a52ef94758b8d59c87551a6bdc912d543a55a4ed6dc2c *3370a39a3585d3bb68a9fee29ade1366588cc74ab0f6bd4bf4790e776806e73c9b2992f48409e8 *8bdcfe3c0d8b030ed503fd9384b686b4847a1ccc22a2838a1b71f72dd00dce9a6debd67e281f82 *6c5038d68c5f48ac6284f0e1bfc8ca4c977f3acef40c91b6a2cd5d15a2196b0dfa1866879af807 *8563191333f30f1a238de6eee961a2bfb8c10c106b3a1969516f94b02127fe21e03288a43032ac *d6534c7020c348d6b46fa2182b9d64479bfb87864b1001645a3abd23cbb21b2586a0b9c73894aa *4e06ee74e4a5fe4ff56770a3ca4b0df71f228801b2c3bc950e0000000049454e44ae4260821e00 *0000040000006300000013166060e0616060b004624606083806c42a40bcf12f2b0397000b03e7 *343638cd93c90c1607d1c87a4ef033306800697f8624862c865486648612063f8644865c201b04 *3218f281309d2107ca9f01c42c50bd071950c125a059b220b30f031d379b9b81c1edd7ffffdf7e *7333180105534086b1202cbe0c542cc18009e26241e0ae3d4cdd32206602e22ec66950ab659054 *5f819ac206c475ec0c0c3a506d201b7591bc09732accf9bf80d884031284a935ac0c9d6dcc60b5 *30f5694039569825e9400e0792a5a48619cce1a0b09901350866d13ca823f6d53030046c8388cd *e280787937334c551437c40475b8083080d14c82a9d14052830e6ef2a3ea21d7277240bc056ac6 *0228bd184ac3228c01a733e0e9648a20d0d3c0a813f88e9a4ee6d32c9d009308c36c2e06064d1c *e90416883bf919e1e9c3d68199a1af830ee9439e017b42c59566feef626078028d06589af180a7 *0b7440adb85700e20d507398c84f0420cf825c0a00ef7431b4c904000044000000fc1100004200 *690074006d00610070003300000089504e470d0a1a0a0000000d49484452000000510000003408 *020000007dd443880000000970485973000000000000000001ea6516a40000119e49444154789c *e55a6b701bd775de05b0782ede200092e05b14254a9429c94a22b996632bf124b6ebb66ed53a4d *d33a71dc76da1f69a7696dc93fea3a69321d351e3575e2b449a6134d1f938e5dc551654b96455b *72a819890f89a25e14df040902c41b582c16bb586cbfc595101a80386ea7b5d8f8cc90b3b88b3d *f77cf79c7bce77ee82561485fa8889e66e1b701744f30bec67409324a9765c532a953e7c6b3e34 *d16834b5b0e962b1a8d56aef8a41774b3e92fb1972b76df8b085fe05ce6177928f9c9321ba35ee *9572597ef89c323ea26452f848db1cb4ab41b7b157bf799b62346353d034fdc167928bd99238a3 *144ed1dc321951d8c612b591b13e48d1ff6d6d440a9252946b262aa9912bca8a58287a1d48d0da *2acd753023dae51be3e291ef4c0f9ce216e793361706034a91b63b1d0646fd86d55efac4271b7f *ff4f346e6fadc65a91f8312a7e449839bc1455d29cfa653babd82d146ba6cd665a509a79e36386 *96e74cac5fa7d3adad0db60ddd14deba4c8f4d17b3026d352a0e07633652bc40a552d24c985a8e *f25c26a617e7034ee14bbfdcf6bb8f76592c668661562ba9decff06dee9ffe3ef5ef3f1a8f26a4 *bd9f71eddd47fb03ea8a2613d92b17a913473b53117ccc65336ca0cdf4fca1e64f3fa2d7ebefe4 *254511a5d4b7b553cfbd3b244becafb081fd3a7db3a4680a7cb8c48d06f4c79dbaab40cef14ab2 *b8c5d0f2a74d3d9fbb933682f6d051f9e4e082df2ef7b76457b286504a6fb5bb1b1aec599e9e5d *e24a99c92e4f22972f06d8c833fbb7f7757bad5616623299ee88598c84841f1e4e9f78fd583819 *38f0a229d085ea4d6ec9b22c8a62329170ffe06f7dc14932b824299b5f7ca9f5f34f1b8dc65a17 *219829e9cbfc85574f9cb75937fe95ded6572808abb5e5f3bc8dfb56b77b0c3e4fe7288480b6f5 *6b1b76fc313c53a50d467eef6de9e5a38578f0f2c1274d7b7a4a7856100a4b31e9fb6fc9e3b12e *aea0a7a4242b4f7f617764cf36b7c964b65aad4ea7d3ebf5e23fae571ba67de18517de0778f0dd *630b61cf579e2d3afc008c15c203369b8dac169cb0d2dd579a9e6033093c922d51b1774e721d1b *9ded1b743aed6affc0c38af845eaca6baf9f5128ebd765b64d10842a6df87e4aeecfa5672c3a35 *760a221d9d3b2d2a568b6b1ba2b1a28d007e7d509abcfcded77f2bdbed2f721c572a6f5a1d55b8 *2790b93e9b8964f42a04213b7c3dedb709ad7e0bcb5a1d0e07e6c24455b17d0b33165ef8d177e8 *e989a18b17c736dd6beddd8e191b1ab04cea9fcbe5b2dbed78de6c86079898dde33a3f40304366 *cf0f3a1f7a84b5dbe11c52ed55a29b3acc447ff0ced9c278f85ec6771fc6a0c4e7f355b4c12020 *473ac8a7dbdc86e378caa8a7f2056a796e546bbbcf62f3318caa0daa4e8ef2035734972e4d35d3 *830f6eb7c213c0e376bb88069ad6046cc9c1f936516129ad0113cd87f9c7f7d81b1b1b1b1a1a2c *160bfc54453475c4c4fccfde46724ecfcf0e44d3ee87bb30e872b99b9a1a61221e03188c809913 *d80ca3cd9cde65bb32d4ccd0086f391e9bfec7c3e6675f6c6cf423c8f1cd62feb2bef88d6c901f *9bd22aec3da224f9fcfea6a626bfdf8fc76104991446e3e3bc56975979bcc5f05384376bd6c4d2 *e989e197ed9e6ead5683bb499e7a7b52170c17c30b573b5a956c26d3d4dc8ca5f3783c06835196 *8b583d58f89985d4ab235e8a71d24c329a0c0e4f517d7dea4e86865ad255764b512a0d9ed665d3 *e333b36a84b81b8c2623ec03608024eb044184400516afb9b9a5f0e45316abada265e89dd3a1d9 *69841c9c80a5d1d0dfa0b2d2b5596a3ecc14752d369bd55f1668c3a2106d58475cc3e7814040b4 *ed8712ec6a22a1a937662687789e87b6e19b6a0a8846d35c6ad92087cace70c130b7db8dc8c3aa *61a1a1e1895d399dd151b167e4f2248c21dd456d3a5483a778631c800bf3b37c3caec6984e0b27 *43b07e55a5081fb10498b57de71ee407c086ab312e2462d7864ea5522964a652e18a963b25c7f3 *b1e4ad8e0da10885e57df1becc846b68438e71fafa91b791c051c358a3ba51672e8e2493c97c5e *b816d64802954dc7c9234806d81764e1f038b1070afa7a9afa5a44c02e69d4141d894462b1583e *9fafdb35aabda4383e5ab4dab9746ab95cdf357a03cb5a0c0643dd6a895031998c58e0e43dbb01 *1b238de5cd9219be964ea791a8e4c23c9cccf30a27d0640591b6f008c2a4561b8c26ded6da3fb9 *dad5b1c4402291c8e5b85056130a4be1b43ac7424c8d0e12231555150d3bda85ee8081d6aa9b2b *c6e9b3d92c8994fa989544147e4ec5626448cf18f47a432521550926c32d35fd6ce90739a944f8 *e262109ec9e5725aee0c3ea2e4561ec1fe5f8366411b4a8bceb61dfc445d23c3ad71ac20ec2ec4 *73a144d90c9d0d48ea62800678a8b755e760cbcb5f58f1b06a2144d0d5c78c51642f399daa0c09 *b90c556f1bfcfc198d468d82eecdacdd415c4d842f4b510a23b0c9489b5fdd5170cc1add1b2632 *6091adbdb866cdb7268d2c5e016004a7c0a74036d4f2cbd84339df8db90c41b29a56400382c86a *2e5f4b49fc6ff5d430d2d5f6432fb952d24972518a8451bad6e8b788abb1b3740e275c5d192f14 *0ad0c671b77209d99945610ed975edd3186853982690d0d583920474625f532a1c2dfb80b1c1d5 *8397e39802c9a94a2134c4f396683ca364aebaf5e19e56d464ec743da938d59891df9232554ca9 *80c9ce6496e66125c9c077b252ad78abf2362461d6c34a2c56658444292d8c4992bcb63612388a *c146c21bd95ed2ed23b740b93678f3e0586a7262eca726bb46af2e910251e595e1194362f12202 *7bf7569bb7c18dc4069d75e34b03e7700d4de825c8e736a5889d095a0759c34ab85a32b3e41a99 *6fa148b1012f96166b9129ede4cb9b19c5d665538cc58b3c9f2b14c4b5311387e0c158fae77b0a *8e42e238f8681011ab29e5555753d4c17fd55fbcbe8ca8af2804f85706a89f5d8c24966f3cb683 *dfb9d9e572a8d5a0c22caaa753b360f7e6e4ca0ada0632a49bba965f9c06e6ba09a06225c373b8 *40e69ba755bd96c6ad06755fea256d3f4960283c0d76d52c7e7e42140bb59e592d8c8637d88a78 *7029aa21dab08284abdeb3a9f1d9c7398b26a1f0414a4a2752b9a75f4abcf45a76644a0cc50a17 *26f27ffe63f1d0915029fce65ffe46e6fe9d0150c78ece2ed4f0ba844405083ba98e8de9be7ba9 *7303e562aba039b879fc784bffc7e11c9481bac90c6b6c8d04a5543298c9c2c9c61dfd0827cc81 *0c4c51e66041e5555439bce1ea0c7f9ae31ec02292ba5a17b3c9906094c585088dc04e86fbb66c *6581160a416370f7b3bbb33ec3a57f3b23ccc6cdd124b87ecbe19f642e049d3deda864f2d8641a *800f3ee96019b550b5b6b5b5b404e06738a0aef13ad2122dfdeae775e7062aa3e6cbe7c3e13098 *536df35911657c04257d7a056c41e7dbf5100927f46eb8956efaa3f4828a19e10d5747d32753f1 *a7f28d8d805117b35a2f0b2a8db93e57b6a9b7d7e604cdb2c3cf84cc82f92129b096e9d84af866 *48345a3476b7264ae356f34c303375e5dca7bb73000cfad8d8d80cc0e814f0e09d8a851adb584e *57ffae95c77e1be4992a673250e8d877ff86708cba0129c722c573ef82abbe27eb3c8f3fcc5a4c *1e74b1658604619d1d0bf45f90e3018f53859d9ffb26589aca58e47a5544e1e9d40f87af2a176f *ea91bddabc1d6081a019c41f40ded0e0d9b0a16b6b5fdfa62d7d7bfa5b77745bba5c89d139e3db *17c4c98514023ecdab7379bd3e02b8b61b5d2ddae79f3f08d56a9b11688fcdcf206963d4aa51b3 *f7a2546adcf931ecd22a065a4215f9e6b3f3a3c33f598cbaeedfe7dcfaf14053736757175a19a4 *1c4c06bfe524ef7c708591264449411e61947032be64f53f58db69abc732a183d343ff3930ac89 *090ffb36ecc286eceaea444f82c0265313728e9c8448717b3c08299ddefcce4d6f345d4ac4a354 *49488b5670cf2d3dadb0013c7cedf316ed8103076ec73d9d6bef994a66f233939ca2c2d65e1e8e *acacb8366dd1dbec646eb549bc329affda57cf9e78e304afd89ff81d734fafcbddd0d1d91908b4 *c03795530eb4789cdcb1b09490f3d37c81d6d094a1342171b35a73b7dee4d1686e9d314bfc98b8 *f867b3c3df7fe39c26cf3ee569dd6931b35d5d5dadad6df073451b49ec248d0339020a9135132e *c5f2f6585a56d0259598331376af8bf958af9374e66b60a633990c1421a982f72c2e2e4e4d4d4d *9c19c8bdf91fbe7898ba5db15b1fd8e76d6b5757e8fa58727af266223db7f751cbbe472895a832 *68ee3a3a3afc7e6c57966c5768e3b8dcd292aa2d72fd1cc8739379d46450fb0784bad5dddbd0b6 *175f3329671727af4e0795e5e26769e7136839a10d5d27b4c15d70726da5211b0d71847d377a7d *e50bdf66222b0945162a5fd87f9ff695aff690672b470e55f855cc0818dc00e9c1f5f2f2f2ecec *ecdcdc3c3f73333537dd185ed027a3e4ab4d2e17dddaa1f4f65bb76ee71803c7656f6fa1161406 *28593d0d60431b1221b40583c1c4f208c8096e35b01187517dd0686f674c6d1acb260dbb4390cc *e932f98536d266af36ba223941b93a2f8c2c686f2c291373453498a3e3d374413d6341e95618a7 *3ab52c3cb0cdfc2f07fc68b049fc228354254e1a0c991c9111d8a038d168341402f6a54c262b8a *925ecfa001463f8854477c28978534954818f85ff7048bc44e3c1e0f061763b1282ea08db59891 *5d2bdaa8326325da10b168ce91bd562f1f5135b52cfe7850393a589c9c5e405fe9367101a76031 *e99cdaa55822a31630c14f600333d8cb633b84ef1dd885e60f5900caabe28506ce4a35228622bb *a243429a8dc5e2a050f80255a644a489c33ff449a8c3e4b408fba236c9556983c3a12d9188a7d3 *993b69831e7597b26c55928b65e52367c5b7864a63d7c3b9e5a1dffc25dda7eeb57b1d84b4e5d2 *6a3798580c85de9b745d58ea540c3e4a6d15f38a9479eed7355ff9bdfb009b4cf43ecc55ef2561 *28760b0641eed08e91ff9502437a744359e0285203d778ad59d106a808a85c8eafd506931026e4 *cc8834b015c093a1c2cb6f5108e34b2397da99c13fdcbfd56610562f19d18c5d06e4a7c6f56fde *e824670608f80663f8f8b73ed1d9d989a8a9a218baea582f1f3e903c09538a659165582e035dd9 *50f516b47c90d3fcd5dab040880ba2adf28535b465f8d23f9ca54261e9d2c8982e76ec99a737c8 *b950516b030642572a877b800d877b3c0b6deeebaf5cd8431e8f26a5c1a11b2e97bbf6dcb3febb *1b622b39035b1bd50791ff813604c86ba3a224d0a0592bf317beb857cfe5788fc7e5f134f87c6a *be2c9f5bc1616ac1c322e6726ee408965d58cc2f1fbbd14b334925b572734e83b57038ec5567fa *6bbdafba8b02d75d5da479815a5a98457be8b228487ee095ededede064644fad3e002f9354233c *ff3939742142870513ad1e7ec411f6b5bf3358a79817e2148a57305c8c267364c4e97235353502 *30767eed7e045a6c1c52999a3ca670f92da0cb22a229aeed0ed7e3bb58f84d5bcc02f04c30abe6 *24833791d39336eb4e9d19e1a72a33756303eb90c3dcfa305abdbafad7236688c52007574a7351 *9d7a8e696a393bdb4a91c3993b0b81bdc4b966e0e47c70f7569b9e31188d865a32b74e31c3d03d *1dd1a2507eefcdd8a6638e978fe5c9d9ed1a070fa82e878eca5c70609b2f78ffce00721e129bc1 *60acfada3ac58c9cfce5bd51af2142ce3101fba7979ccffc5d6670749e34a4b5c851cc9f3c947f *f58d8bbd9e853f78a2dba51ec9faec76877a28f27e598fbf27814900b6bc1c3e7bfefa5fff7308 *4ea6cab0b1b76963e39e6db687368b3d9d4eb78d72b19a04579a4d300323e2c9c1056ee5da97f6 *510ff797244904dad6d6d6402080625e9df3d621664a3de895c058d19f4c4cdc38f2e6d2a5a025 *9a55cf3d6ff512e57662d5b7932e7decbe1ee9d776eb3cd612ea1c0ab2bffc5610dcb3f684689d *6226ae4e2412e5f676122dcf8db9ec62ca12296ec4dd704e7d91e0b7acb479b50dacd8d3eeec6d *2969a82221f356abcde371fb7c3ef24ab0962caed3fa4c4a2e3a36108ff285dbe558021513a529 *4a6dda83e8f6d06c1bd5d76060e9e9a2a8f23c7266e82a0b39b1a9cb8ed7a99f89dcfe09463e95 *4a8345a2d9439f82ec8ded4aa9afc1f4e4f0c46cb6a026219ed9db52f7b71e1559d798a9db9d19 *415e7e3724886241be2da4332b777a7ac23dab68695d59ef988910e4a42da5cae716955b042169 *423fe08fccfe7f60fedf9575ca49fe4fe5bf00ca9460885d3b10b10000000049454e44ae426082 *1e000000040000006300000013166060e06160609808c48c0c10700c885580f899280b8369362b *8309332b9cbe7b89052c0ea291f59ce067603001d2fe0c490c590ca90cc90c250c7e0c890cb940 *36086430e403613a430e901fcf500c144f04b273c072338098056ace410654200fc41c400c00d9 *ee5bfaa800000044000000430500004200690074006d00610070003400000089504e470d0a1a0a *0000000d494844520000001b0000001f0802000000992721140000000970485973000000000000 *000001ea6516a4000004e549444154789ca555496c1b55189ef1acdec663c78ed7c44d52454968 *8268525109210ea84295822a21d122a44a70e0c27a024520a4485c28420838d2b4eac2a6e49003 *8ba002daa22a4a25a0210e24244d533bcd62c7cb4c9cd89ecdc33ff382e3382e69d5ef307aef9f *37dffccbf7ff0fd7751d33010b1cc7b10786e5c1296a40ee79a2bc9997a727d5d9bff5ec1a6c71 *8f0f0b37d31ddd84d76fb1587687f57f8c7272591a39270c9fcfa552777032a2abb8cbcd7bbd58 *5e34fe74e498f39501a7d3499264352f5ec96335c0285f1a4d7dfa7eecd682d2dde73976020f44 *a45c363f7503fb61b45548c299cdfcfafa81433d9f9ce5a32d344d1304715746b06c7e3594fbe2 *34d06dbc3ae0ed3c2849254dd30caf653997cd360c7de85f9c83ed92a293aded07872ff97cbe0a *696d659077fab59f804e387a9c0cb608420eec2e17e733e00d85c3f2c997ec4e0e9d5f9c9bbdf6 *f1294110e067c8b9da3c2aa915edca8f427c614ca35aba1ed18b85c646bfd7eb75b97886a1c1d3 *42a1b0ccb0a5ee3e6cec97150d8be364fcc2e9d6679ea53bbb298a829cee60840fa014982818f1 *7ac2b2a2b83d1ebfdf1f0c061d0e077c005e944a254653c982785dd1812ea162a18eae95c5e5c6 *50d466b341e03b19d34962299e892fcca7324c7b1f4d51102684caf33c2a28541f1b39b77171e8 *9f85db137c20158978238dc18ec33ac3cab2a4aaea8ea88d0ccec48cbc9ae200b056168205ef80 *4e99fa43fdf2b39ba3c320a3ccfe879c474f84fdcdce5c068e791b03a0219a6650c4db8ce57219 *5b4ac042901464a1289ac655fc9baf856f4766aefe9ce33cca13fd8e234f873d3e2817572c709c *d36ab5411c814090e75d7518a12b3451d045a3b85272451dbf1a3ff3d1adc43cd1dc26befd41a8 *e36119270c251536ad562bcfbb81d1e572394cb02c8b5a689b11b2a0af0b15ed3bb2292d10e19e *7cca19082b160b95138a1a1c29310c6bb7db800222b5dbed40044a04ae8ac26bd5a39aea43903d *bea2d5695155d00045112ccb806bc8230816c484b86a5a7b47d438c7a37590c0e2d9742a36d1d2 *da663501468631185913161375a7df36239c48065ba83be7d136aaabdaf865adff18c4075947ea *adeb540d767421ded10d85861180dc246e4ee76627618d828527246bcfa9bccd68b8c0bb8bcd6d *b00e535b9f2d5f382ba4d7244936b4756fd86684702041da0baf552ce0666461faaff7deca66b3 *954170df8ceeb6f654fff330a62a76ebf55f63032fc3ec808e46336d372449aaac89c1c141b4c2 *4dc0a2108e4abf8d95cd0e4328df9eb75df95ec04977749fce5a2b273173cecf7c7e062348ab3f *80eebeda899bcfe757575763b158e2d4bb5019143b0224d71189eeeb3da447a2a0b36c4e484ede *484f4d44df7827fcdc8ba0055082315076672793c9241289b9b9b9c4f045e6f277d569ad060c47 *6d7f67efeb6ffa7a0fc31c0331400b19a4bb9302af43a19091b2e327a77bfa0abf8f53d37f96b2 *e9f87fd5663d5ebea797ebeb0a1d785cb1d945510455011d7a5b87113ce738aea9a9097e08ecc9 *5038fde86392b881de3aec5630daed0e3be704013066338205855c9f11151d9ed027a06a98b86b *6b0151144ac5124c75380093188d4eb87ce0d9d0d0001e54664ffdbb10d98d4b4292e062c9e737 *8ac50278a49980186913287df0d7eaeeac7f5f57b30385a228aa3181a071b6f4b8754991e4ee91 *b107630d7bf5f66e0d7e1f8cf7887f01103847933411c41e0000000049454e44ae4260821e0000 *00040000006300000013166060e0616060980dc48c0c10700c885580d84b9395c126949521a502 *4167fd62018b8368643d27f819184c80b43f43124316432a43324309831f4322432e900d02190c *f94098ce9003e4c7331403c51381ec1cb0dc0c2066819a739001155c029a2b0bb2279b8b81611f *3303c3965fffff7ffbcdcd6004144c01e2bd4c08478470c30c6264c8e046181a05654b2e646048 *4752731968b8040326888b0581bbf63073970131d01a862ec66950a7ca20a9be0235851d883dd9 *181834a1da402ed4450a22130e48500bac6066e8e666058bc3e4d28072ac3003d3811c0e240b28 *095b905e0d22f58200cc838a4871018b9f5f2036d4613087cf837aca359f81616936446c160724 *b83c1866237b0309dce4473565207ca804c41ba06e60da0275c80228bd184ac3621eee520c20cf *00892c00651a7a6149030000440000003b2000004200690074006d00610070003500000089504e *470d0a1a0a0000000d494844520000009c00000045080200000030eb18fd000000097048597300 *0000000000000001ea6516a400001fdd49444154789cec5a09741cd595adea7ddfd4ab5a2d79df *651b1b676267c090608283634f08241066619de4842493cc1208c9090792139221e11812860081 *0c9e0c49588e01b31b1b6c6c072fb2365b5e24b5dcea967aafdebbabbbbabae6567fd1c8b2dc96 *094a18a1777474aa7fd5fff5dfbfefddf7deff450b82404dcbd412c95f7b02d3f2e1cb34a85350 *a6419d82320dea14946950a7a04c833a05651ad42928d3a04e419906750aca34a85350a6419d82 *320dea14946950a7a04c833a05651ad42928b23fa7738e15869952225361b215d262d149cc7a89 *c324d7ab69fca469fa4398e3ff4f09e6425bd32f76678fe23a5e608e048f0687836abfe2dbabbf *79cbca9b0c0683542a9da4f5396f50795e68eb63dfe8a25fdb9fee3a11cb667302cf4a2a05dcaa *48d4b45445c9cd4e9b61968bba60a6ec938b9497b6ca1c66994422f9f8002c08c2e1e1f647869f *c0b54367c3ff38c5c499786a1f73f1cc2bbf30631357152c08709d8c09d013fff2017ef9ced1fc *e3db853dede17084d1f1fdb31a952d76a94d57b29b249164259a55f8227c77402bc8cd8056a632 *a197555ff954abe6e675f4a54b64908f03ba58d25c3157667986610ef4efff9de5196f6c60a0cf *5bec28dce5b973cdea351e8fc7e974e9745a2cc8644c6042836296074fb28fbd25d97530c304da *9bccec8deb85a5731a748a222f0a09ccf85f8604e3916e7ffaf9b6583ca9a355ae104b3db733fd *dc4eeae279a91f5ca7fdd48a16854231e5a195d3f2225f2c958a835420940d837881a8296ec85a *0a994c060f48a593b802e706150ebae51dee85bd958eb6c342bafd5b57aa96ccb1003caa9c2851 *3245556a16572c165df04e03bbd2137db98d7ef57881782dc525761ff45dbedbffb36f2cfdda75 *9f50a954e832857185d56259f47abdd56973961c7e95bf764b5a15425a93f4f673801acbf03f7d *b9fca7c3fc89cedd4d95ed375ebb4227670b85bc5aadc18c11edd56a35665f8b0da5aa64b31986 *497c411e6d6938f6c78e79f1024b674f52b9be468be0b156128944434303549aa488f251106807 *c3e5f90ac5501ab9a6d6aed3aa355599549bae072a41f4c8f1321055a577dd78ed0c059551a9f5 *164b83cd66c37fad56a354aac024354f8507230580bf66b3d968346ab6841c0d433f7f4997cdf5 *352842b7ae17474826933a9d0e3a4f924a7f7521191044ad1eaba34a2655a99493eaa6541d508b *9c00447da7b88eb64ee6d4eebbae57a3d160d0bb5c6e8fa7c962b1c0dcc68d8e08c080d66432c1 *8f8d4663bae8a3a8347cf4ba8b1d5089aaf20fbc74f254fa084a892d910b894209ea9d5444a9b3 *810a609eda5f4c25e9ce230391932f6d589157c9b43aada6b9b9d9edf6d86c56b0eed9ca2c34ca *e5725955e0c73b3a8a5ffadb7caba311b7ac568bd3e904de4aa562b215fb2848a5524929d254f1 *fd16855c4955c9f92feda940b42f58eae8a37bbc7c5fef09d0e6fc6687c1dcd0dcd202441d0e3b *98f39ce110d00254f0f3972f73af995f0985442202693735895e0e179fc259527df90b6412e380 *0afbdad65ec9b312af2f4825db56af30588d3a87c381ea0a3e3a1144890036d82358da6eb713cf *369bcde0e4d189d5c741f25cbe76ad50c8276f23a9266341859b7ac3e5e18cc41f2a874fb5a3c5 *d660849b823601c9c4112542327b744466044e26c5cf3947a8e432f943fb84ee36219dc44fda60 *a22d36d9bc458a854b0595e67c6b5cbe9ca994bc42713b9d0d8ee8a87355a87972fda5147ddea3 *1141c251e6cf785145dcc629f142a958b69ba41fcc70a17be95857f9648fc044f1138a53ee66c5 *8256a9d5317aaa838383814000cc876c74cd9a35efbcb3bbb57599c9642477c7820a37dde3c5e4 *68af3f4315fce0de66fb0cb829fac3c93ec00e084111d64002499d15843df1c7bb4b5b1eeadfb9 *3d1bf0250c1634360965da683629e5e2137a63e59397b8fef9db9206fb44ec9dcb7752f12dac77 *f350544865c5878d3ac1a8a5741a5aa3a159c19d576d507aee50eb9ce72c30c8f6cb1b5d74677f *39c3d27a956032c9352a2acf52c924e70d51c1683e9b8e294abe26337bd3e75bfef1cad9083d62 *353f9e8c9b2796c2c3c567fe3bf9f49389482440cb4614b75aa94c0a772beb36e96fbb03652499 *2a58b3abab0b70f6f4f478bd03282051679e155496930c05a954924a47faa962c4dd6c067f9a4c *a2ab7d80d26ae2db9bb0d0dc6f7f0995baa30c77f115966ffdd0e06c427b34c1648eb453af6d9d *950c539148aea32dfdd2b3eaefdfe75ef7b93a3b538250e2920f4afbee78fb20cfe936e99aae91 *39dd9c2009e44383d9c34de597cdf9a33a4da01c7f38eadbadf47ca771fe75671b8dc079df56fe *f5bd834e23bfdc9361334a6f52a137a2ae3366f2f4c050be92ee9d6d6572da7293237ceb3517b4 *ce35735ca95c56a03b5361c455cd176a03920519fd22bca2f4c6d6c8833fedf60e70ad175abefa *3de83e4af1089ec9fdfa17e93dbb973ef084a96526992ac641f5387ffefc6c360397430d591bf0 *345031fa30538ae668706f3491238d161302a15ea9544ed24625553552f6f1cda9d75ed8164a34 *7def479aa6d959d87889c32d5ea5a92c5d95689a4dfde6e70e7f2f5ae0c4276eb9a678cffdcdd7 *df3ceece14f896e26e29763dfbda7e837ededd0a436ba6c852457159795e53a23fd19e5e62c8fe *626e4327bc56523c1aebb835c184e6acb80dbe3566342cc8afdfe47eb5b51cf777fdf85a3532be *42a1ccb2b9a118f7d81ba7f6b5cdce16151497d0f1fee58bc26b9636a8d5768d24cd305299588f *56371f4e17855c3ea645dc28fefd6f12fffb1810cd7ee30eebc215d922cb1758ea0cc533ed07f6 *df70d58aa7df0084c075fdfaf5685cb060c199eb3936b1ee0f8a8c0103243f9badbc4aad429a83 *883849e17d04d1bd6f0351ebbfdcce6a2d994c068b8b1a17b37756a5d1ed8edff2ef61cfdc5aaf *633ffcd78e179fcbe5f2a0b8d16712307a204a1d79ee957d82a0fd41bed2944c26c68c66b134a4 *75ffd61b5f961ab15b2adcf9fdbec30fe1bda3472388beb0970bf7efb9e7ead8427b1c018c65c5 *02c5ace1be7e596a96f60410c5cf6c51f6f0ab957d5d717447198ae5223e8082bcbeeec447853d *6f02d1e4fa2fc95c33315bb41b8d069b2856285efa875bb57a0379dedf7b72cfe69f2593c952a9 *54e724e6b4b7f23c1f4f57e3449617b83469ace6378a497253bc1181840ef8a0956fe1ca8cd208 *e202db238aa3f8f154a5a5a5652664d6eccc55ff34ba6ff7dddf0df4f7b12c8b3c80b4404f9175 *83af8075fb13e26888348843a347c34873e6cc41c12d28be4a7a21d0aa94d4c0a1fb7c7d876025 *981219eaf5c3f9c3fd82b7cf3b47db6d52170139ca6eabd5dad8d888ee76bbe3c6b5399d4e2bee *6c6b5a28b5e7d977c51d5db3d944766626b2625c24c8bffd7ad237b08f9717165d40660bb343e9 *8809b7b4ccc06ce1bb6ceb857838c8533e5a7678cb63befe13f9fcc83cc795b1f41b88b2c9a432 *91aac600a59da24e552d6e5210c5eb0a7bde448a9bf20dec8ca61a2e9f8d46b85163a30b559056 *3b723205cc90a36199e472697ac72ac391836e393dc4097c3cd6ffe866cdedf7b85c4eb2e9582e *7429ca3fc9f8f39d7d5241b7acc4710e787963239689ec7f91979a4c26fcf44965e9c8468ff245 *f8ab4e2389a552270efdca689d0bf7c2dd449e7ab3578630141a3c3ab359c8a4d3701ad4e80015 *d0f27cd968346186570c269f6db303575a9e8826fc87faa8d656a41f3a8c50db5e28f2a571d527 *068dfc45245e8b1bb3355b2cb03f97cb458a054c1526abe4cbb27c6a3f2700d1c132d5b86051d0 *3f6c6f6cc12bce962d9ee6a9608f4094ee1914629991f648d13d7935a550e62a7b77c832296885 *9fa5061ba81e0000d15a390b817a50006404fb2d5e7b438d8b2007dfda313cd08f1c013307f612 *fa275486eb19a07c217959e6412a40f816a391628c1c8fe01ace04572819aec12088ac4486fb5e *f1f61e841360b4432759b444a3a96c32a8e48729d1da2c9858434303b81166014bc20857adca91 *6363226d5dbd980cf2176a025f7df0b1b074c80737ed8fc4950e17c22df8166a6270922b8855cd *93bfccdeb471ffc1431d266764e972ebc6cb5d1baf1694aa12caa6b3a4d6d438d96f3ed91b3094 *d9242d3708058acd84787e0e0cf33cb09a98885bc4c7bb8168d137908fc73113954c0a3785c003 *c6d8207e02632ceb8c956bcc76f007e5cea483bcc032b19e83db1dcda2d92ae83e796e3b1f2fc4 *12236cacd389670f671e89e09a54cf19c7f28477b1c7d00306d6a9c410e56d6f6b6a590a5fec09 *293816d5449c74d157f7b1896590949e8cd03abfb1d553eaf69b3856fc7e271c0ec76231600f16 *adef0c62343dde2dba4eb56281c0a0e1fda4cae08e1c2e3ff568dfd6a751dbc4e72cd6afffb2db *d1ac4f8893b1da9d185ca1a897b78ebde1b2881c05eb13672933c4b20a107d1dfafec002c72a75 *1faee88dd95412d182a2c5cd6e842892629c69e66033b55a052b4e2c5b6deefc532e937649295f *854a1fea495d9602de52894f9ee1f27921cb8a7d61227abd015dc64df148e98c5ee9f82594d053 *73d618b393613661d58633d6e110174a89c00cc6a4a4da1e3db1da082b661458417f2c23f23f96 *0ba197f8bafc8c44778cfad4d0202e92458eb488b90b5da6b7fd21f9d233c777ed4099ceaddda0 *5bf779b7c586ecc950c88378d46a3096d5e974a1243d0f509bed23665efddac8389c73f40fb1ad *ad2592167e880930b402bdc05393b1186951c895c400c7ddec269bc930e4cce2e594b747246146 *b4f140c09f482444c6a677e16736ff7e4e88185c67bb03a3618df2860b341c8d5e2ae5487b2a95 *0230c5b87a98a91e9c552d7b5caeab9e58281735733dd1aa5316235647093e80d4b40e378e569f *4f25859498ee16c3c1f2bbbb7c8fdfef1dec9736cf4eddf99f8d0b9695686911e54d3e8774da54 *2d2cc116baaa90cd9cb3aa36fa079e5bd434e6bee1c049eeb36b0b9828e631f1f85ae404fc9dd9 *4e76d174487ae83252246855bbc5e6c47cbb8edd607aa21fcf5da8339a28903033425cf9aa9415 *21497ca4c66f718a61adfe21175ea48415e917518cb8c70446446338700488160a0584a181219d *5886562dfbf8a9f4e2c5632d9b9c47e9ab47e0349710aa15e004d7471c2a9daca9aa6322bcb3c9 *f099cfea9d6e4e22912792051e8fb00804a89e8122c803510958d6761eea0c3e16d416bbb41a24 *a08c59508a4476b0371463d24dd5ca6122a0a6f3956dfb0bffb38bf2472a2a053dcb49353a4522 *029b75f666d3917ea736f2e8dd57ccb115c8bb89a9422a61c46fbe4ef9459c15d14d663253a3ac *a1582c02866cc964210b548d8e65f61452815ab533bef24846e48dace086c3d71a5153415a1b93 *8f6f17fb8ab90567d8db15fbdca70bc880c62c02468817b4d1785a481f25c759e75501969389da *75c9622ba8f59272198b008e51a9947050e2976014d1fe26fc6dd75850c5ad8a85bdedbd623222 *323032c08c7aeb3ba9d933338867f5770a81c8f68efce66d146a3bfcb4c94fc9258d14351f85af *464521a9eef3faa9d4f147ee5d629587b259a9c05386aa56243aca877cbc689ee53ad623b68fca *7e218c460118c4a8ff5e0f42a434dbc9717cfdd188eb0b4a83a6aa1472664ef619726bcdfcca1c *7ba16f8815bf7b951bb7f71abf787488145a6356f69057c9040e807b57af30d86d0dc89e30e639 *8f4b312bda3092368bea33b14877076a717555d0884170a1aaca39b7cdc7c8585031c42517581e *7cbd24320fdc48e9c048dbf686be729998979e73b370b64bf65f37654a79392213c3c80a055f2c *1378a45d5c29bf1f8876352a7bf99c391a152b8492ad51b2fd05d2b14528f707fccb58785db10e *0c508cd3e8c835d2ab419eb236d9e11c783e5d59a9aa0654149d1683c0a4dbf3f95cb158aae3ac *d097a883f42a967a7fc960d958d03baff4defc904c6c159d357de7530a8733b8d660ac1d348154 *1ede49ed690f33c1e31b56e4572eb4584cc0d45cabb0eb085e1d76cd94079eaca9cfbffb16bf61 *1388164910f9cae0037f76799a41117e9be5525eb1a44a6ea8a9a52af04f94753ef0bcf86d1156 *bcee77c295267345ab14bf1a4521458d3a100e46f362795016a36682617057cc25e72e4c4422c8 *63c933b2be9e42a01fafa893654049795edcb9467a85621c175ad71265959b38e9729225a13eb1 *194520f3be13a49eab3367b924af3494d171282a21a3c144802862d8b205aedb3766b51246c8fb *292ec5247337dfcfdcff5ca6adaf341c2b1e3851f88f3f96eedb325c09bd7ad7d5e98b5636d96d *76b81abc79f4ce431da117b422f525eac359a57dc71227bb704d58b7ceb725e794b10655fdb051 *f7b575c5dd47c291ace8ace01f899cdab63fdd3a2f7adb177524609ced65e2a22377100b290522 *93c88ac102c22a5b5207dffb4ab2c4714014405033e7a55a2fa4f6ed74cbab790a5f3ef9f2cb9e *e57f03f702618cfb0ab89d3eece792097f3a3358a6542b9683f1b088883a14a5f117c51d22aaca *c070d6747e4736bb165652e71858ad64e44260304c837b13a1d6c54bc49404031a0c22c9af5f9d *71283b7ebf8b1d886ba289344379363f9f3ee037cf9f21190ef19dbd29207ae7b5269d5c8c53cd *2d2d1e4f133c7522df75888e6832179a6753011fd92043e3f0962792ab2e225f86fc397b3e6341 *250c8cc9dd7451f7bd2fd9444f95aa60f6c0f5de3f64ede6e0dfaf57d64ef5ceec5bfd844edcfd *af1d5064f994c9245785b8da630ab99c440b0c32f477d7cbf6edacddd274ed0f85424ea71329df *d9ea3ca1bb0da56d7f44dcaf70acfa34613c18226ea51abf9e1a14410503c359a3a9d793f11b0a *2ed7d9b602c4baa228ee571c3b555d8b458b0ce606940d647a6871bb3d08cc3a6d7f2c123a395c *526925c6064994c62db7d79fee3bb26fdddc1c1055a955e47b3c9bcd4e42e039d77de41bd21bbe *49bda73e9c951a3876f447df353df05b58fcd9cc7a2232f6f51808c3c14e37ad756f5c9e107816 *7f54d55ff1f79d8763bf7bf5d4996723b5bea424077b54f7d28c586b678398f2ab14a7bd886cd8 *c1212ccb5745367c85d829b4e2ffaf9d238d8de3acceece9bd7767c7bbebb5b35edb499dd84e54 *ea26cd4153d19420885489a22290401ca52a54e29028d0f2030510aada822aaa8a82507f508a10 *a8b440487a0069eb34218d8fda4d8d8f8d77d7bb5eefe1bd776667f6e67df3dc61e32b49210d44 *7e3f46f6ecccfbbeefbdf77def9e5432f9b347401f8ba2b8e699594bc6ab675e3bef0f9caaa9d8 *3b0f1b0d3ab6b515633d645c5b5788fe36e6c3591be1ab107c18b406605b3b7ed228d2d9a74726 *1b6fcd6ac044ea747481dd001b05050e580b9efed6ad3d033b776eefdfb9ff46cf4ddb0c3d4c7a *2cd8f2b773655f280b67724e4a67391c4ee4e8eae4ddba7497986aebb9415e3e82eecda1f30fde *9f9d0fac3b67c9dadf18b9f2e8d1a3abc7039283106f6b2dcc45b848aa4137aa0d9aec1bb8be3c *ae4c16a85d9d94c9b0861aa79b80924c895c417cc3a70dc76bf14880ca4f6a6af13bf67adadbdb *917624a6dfe14dcefbc1f485e74d0a62032f54ea6d837b4053ae502a7570361efecefcd8c81f17 *96985b0fd9066ee970b777f7f460041ca8093b8faf38e6c3097565a65c6980b1a26ec432a988c9 *f5a1d599575268b1f8ddb9e1bf9c1c5124c5c3ceadbb4129f6f474bbdd6eb9250d03c560f8c05e *b7b32c1c0a2a8dfed559c752ae9e4e2d51753157368107d8dfeb8139801caf180214d09f8ac7e7 *32fea544a216ab8afad29d1d47dadc6e385ae02cc0278bed9da59133f54ceadfcb0ccee95f3b91 *a555b64e6fa34527139392d294d3cf3e4d29553aa70b3de63505680da662c198745e35763852f9 *74d81755d2351eee01536985ea2d9f7062586cd42b3b3a685cc67ab2894cfded29e5c464a89c9e *a42a69bd9243a636e91e9af7f65ec8e405bf8f6b10be2adf1e892712ccf67e8dd982c42539b577 *c6841f3e30f4d289978a0dcb5d9fd1f7f631f6d6aeeeee8e8e2db0bb644311e6ced5ba4291744d *982b9668054d69eb33152ea0d46fd3e858b936b3529c282f7c3330f2cb13671482f1f3ac67105c *fc9e9e1e8fa713551a6243f318fe05a101d692808e41e78fd593822599ab35a846b5ae7e7dc6e2 *60d47bfa804fba15522e08e2e3334fcc0667f9e1c2f22d0ddd6673d15605ada48d6a34e3e9f8b6 *9de1c9f37c2a89cb074865b3da375e291c7fde3871b6f4f670796238f6f2b1d9271f7de7d1a3d6 *bd0799db3e0c04d9c0cf59bbeb0d0bb2f3f97c2412b970e1c2dfdf0c3f7756090e2ba5265530c4 *cf915a16c193fbc8bef6237bb5bb3ad7e8574c166a23b3e2f1b3a55fbd14e322ffa0f80b70d3cd *34be7fcfd6dd7bf674757501a5609442a1b0b0b000a3ccbc7e927ff179672a46a18201d3e3b643 *8e4e2f11bda989cc9c6f369d0b1e3c6238f4314a52cceef67640e27281ca34a2ca046c1cc74722 *045b7cea4c327dd2ad1fd36949b01e4e6393bdafb5f3203ca66b0c2df826e7c28d68f5a3b4ed2e *30dc009bd3e5026cb0e1d62cc5422a913ade5c6e6c2af1d927d4f1441a1513c2dd07944f3dd08b *efcaa7d4f7a67ff0e3938f97c6499ccb9a3267edcb76be6b8beb1bfbbefa95bdf7c1c3c5623114 *0af97cbed0ef7fad7df5b88cb0ed621b00fcb7dad61d835ffb56ebe05e505b2864eb5964ebb632 *923442b90c7c8d46a3814020189c3f312c8c870d4b990aa532afe0aed346bb59d040169314cd29 *88f4d2526e3129f0c5129f596095b36d1a128ef0b0b55e8f6ef7e04dfdfdfd1e8f07ceb4d5a314 *fdb3d9e05c5b2ca4c92ce14cdc0c437bba1a7d379a063ec0a9b51c47a45e52635b301fd24c4794 *45b0b6001b78c6e9e8282d4ec04fadc6b8b585bcd862f1aa759d0ac37685f126b1a2cf499129c0 *8669d766aec8c08b8dc9797134a49c8e3466825558dad8f939ba14a730dea4b691a16be26dbbf4 *bf79c8c5b22cd21a34e229ff1bb160343c119e0a4e222abbc165efb17abbbc83de41ab95e464e0 *264c18a6eaf7fba7a6a78aa367d55313623a298fdec2b0d65d83e69bfbdc03b7eaf5c04a3d2301 *bcbb1e53d7f591313f058bc43013910ec3fced9211383a134e729a45de490b929ba232c7739678 *70f945a3b6aad1597addd5233d258755e1752a95959674b60d44127e052d286994e5c28015a398 *4ce628cb58b7f797cb155aa3369b4de08cc3d094b40b05301c6a358621b60c5825705d6198bc1b *4734235a2041d26e4fa506019bc2a02febc08233b5e897db95c412e9c3046c58e90226d20aab1e *8bda7f77baf1c2e9aa6f2e047eb65dc775d844834e75e48648329d277e8e48116f4ce2eba9f1d4 *fd8f447efed06e4c88c2eb3b99010b67d6746b8c0623c77352c6426db7da6d948de338301ad0be *830983802291e3eef6e42d074ab9e52a326ca832188c06b309a41f3d724cf86f10dfb844d331ca *3e5862994c269148c00e88c762e96c0638c4f1e45449f39a16831dfe70da49facae56c654d350c *74a1f106531104c24e70ea614e0c6383031329283b2dcda380b19a4ca68a451e5ea424bf19735e *7051abc15fd2030f800a20a7ab2da915d8600700b6743a95cbe5d7c32619ea16cc7b34731474c7 *3343e55786eb1353313e3afcc90faaeeb8d9e2b062f889cf91dc527a6171f1948f3917e986130b *ee2bea42a3927ff0138aaf7fee00f0150612040156944aa5e07401d7482282128b982c162bac43 *ee4782e9f13c0f4fa6d3e925380a72595110cb52b21d5403a65ae179b802e930e7bf81997de94e *727880e43ecb6560245007c693284f0a4df3f982fc188e4d9180881e6b0c24a2abe46548b137bd *8e94b191eb8aaa6e1c856c4781b44ae255b6e93129ad95000881bee006eeb98c0da70d3ed86a6c *302bd8e8b2d4371b04bec5d293af5070d28e8f8e7bd5a7bf7cf780592b36cb04620656016bff7a *5ef3e27437f87b849aa5786b4becf84ff676777783d422dd40bc56c4c83044830ebd6c0992ea96 *5209665b287098bf931aba6b38dbe5c3528a345d327c78e96482ec7d225ef03e4193c1d82086b8 *0b51061160921ad2d885545be6044c1dafd835b5a6d986a3a0b58965d05592af00b2d4b0f4191b *26652a5cce9c111b9e6f884d7e60036cf962fd174324a7343e3aa14a1ebbf79ead357eb1aa3403 *93302e21877b60f920e22c1beab44f3d756e3fbe0e36c7e9e16938d5f149180588d6bc73e4e19a *89808a037702da8fb8f677a9ba11e956c3e5569435b316968744c70f52d42590278aa4048146c2 *e1965a5dc1bcc1285897749913fbef6203eaff61ac5c11697f389f983ff785831a8e2fb22cc3b2 *ad4ea703939ab8348ae8973acfdb414f1b8da105217a6cba8f56671ad9c46c5001cc06e9bfd268 *1fb21695e58a13f48aa24b575626d84c26d9cac71934fbc2e80b5eed36a0ab01b0f92617e8a248 *454201aa94600c0da341dfd6d6eef57ab139ac79afc092313906ccfb746df15c9c8e49954a228f *4ab472c9e13680ff847aefbdf61347bdcefad74229927d6f6e50b0318cdbdd061cc592cce68765 *d31d1d1870ea62520b1663003d5ada38957b55e1faeffcbd7c809da7ac1680a3fe7081183e5a07 *d8f698b4592fcf8307260922da4189aac050b26b628e56fbfb3ff966d864ea4560d0d6c2897a70 *4945822aba2d43010f75a9d308f91ae1183f6c5321bc6fc00cfee8fbf061870d6093a917017062 *7fd7525594fa62d5e6b9a4f5c96302967c6ee0fbc131fbd80b352e7c7297337ceb60071856603d *69b5979583bb1ab0c9d48b002cdb2f1d5c7268e3b4d4f9047cfdf3b8edde9fe64f8fcd632e6c35 *6bc1a9fdd463c27327deea6343f7ddb58db1da1c0ea7c542be6b712d5640e00a3e6377dd03f6ae *44a3b1a137a77ef4ec226c534ae22ba93d6b69dbbfcb7cfb8e726fb7cd6e26dfd54c73f5405a7d *72b4fcf2e91097f8e7170f51876fac572a6560a7c7e3e9e8e800a7f65a59919b4cbd08c00fc9e7 *f38140606666fa991723248121e5a69603f7528cb7e9e90ca3491ee8ad7c7c9f8a3591e0914ea7 *73492d5956abf51a7eac6493a917016ed6743a2d65037d8bd1e874b0b09035c4ab37c0af319e54 *ceba0c09fccc66afd7d6b7a5aea0aa18583699cc2c6b773a9d189bbd866efad56a0eff3f05743d *1986c1ac11c90859231c5f2c57483258a30e6b346a8c72abd51a952a572d93500c16aac919b16b *fed9c5cd9dba064825ae654110b2d91c26308a451e6c60509994946ec27208bdded05c47bf3ad5 *73ad6093a96b839c9b02d64a6d1d62b98cdfc16dce9c68b1ec0ffe7a0f75f4570f3699ba11206b *318b4749897af9273975f1bfc34b1936997a1dc2bf00a626369a356ec3f90000000049454e44ae *4260821e0000000400000063000000cd987f50146518c79fdd3d08010523144c0252c720ce9483 *0ca7e4e8324744c0e2400a0a100f10e1881fd38f71e6fac77f6ca6669ae90796e68c33a7c24c8d *18fea136a0388d23385404837f64f407369ad54c544e56b33dcfbbbbefeebbdc5df54ff6dcbcb7 *b7ef7e3fcffbbccffb63772f2911201e00c6b148a0d9a758566279e316c0f937a3e09d61991fdf *bfe860f574b432ef6271e8bfcf81685f2400a491f6cf18808268801ffe50d55f7f8f835cac6cc4 *52239b8e2ae20c471234c7994e9b2cf5460346a3b7b14c60232930df9eab25fbaad0f01fc482cd *c17ee96d9d5e6e517fa97b89a66b783147c72852a7a5bb79315ada26bf73c0687c14ab37aef9f0 *5a94e1b0094f622c0d5cc406f2f058060db01b76c14ee88652a88736fc4dd60c7efc34c11e3c7f *1ebab0be1e7fefe1ec03ff9025333ab88252a50761047948ef40ad07606383567720464bcd19c5 *503d6324fd35b307efd93c191ac9a2b1db950491b91359a019fdb1defe61fd78443f1a93820718 *d6d660598c654e5555ad668b9b065b7a08c48136ecda1decfaad0473fd7c9ba005216a14bab40f *8b0736400d3c819776420f73d88ecebb2003ddb7e322cd80a7b1ae1b3f2d78de84576aa008ebdb *d83991bbb0ae15affba103cfadcdacc11a6200ca4b376f7aa9c3dfd95dd6d1dde26fef0a91af07 *856c31a305a952be310b49aca61cbbbd19f479471f09874fd2bb13d9280f2952a43cff2739b136 *f9bfca8fdd5c58565103e654e2c677bda7b0478dba988aea46b111637f5fac202e834e96c02684 *9c024a7d530388ca3aeaf526874535a480902144ccae654468ad1abf29e57e78d1daa68a0e8cde *f5f7650b0ee62345588608317679af373f2ce2c469d48c1174e234e8c4fa1e1c7823782a017214 *cd83770b8ec2a385a425f42e1e76f1dfa24e9c14744613597393056c681d7cebf27abd821b3b50 *c400b70316f090ebc2004e5c1e1d78a62d0ebba3f5cc51c001b1bc03bb05475638631e5ec8f021 *07c4f1c07bc2e2d6983cf0329b0f9a9bd5cc8dea60f742cd5eb5a5d12aa74d1e87de010b79d0fb *6dadb62290018fe3e8f7f0c1625800b1453cd8b7046c1b06da380f6329722396c0833b1c023320 *a70d677d03c41379b07d022eca690abb49be9807391852ee842d6cfb6bc1ccfac15c450182efe6 *a10e0b7068648890241ede2501a944b99f6d96dd3a424f602a21f7f010276d09a9670b9df6e97a *1d7a8c4138539279683311209a21346fda70c5f8f9c06b2de36c5dc283bd21380905e53308d7ca *521eee2f1120712fccd21025e4432d39a0e1a8c73b53ab0eacc3929a9aaac8a9f8231bfdfb7cd7 *04a200d6e24eae4d323be872b91479990e5e1e1b13c04722802525258a7caf0eba5c2705707d04 *d0e7f329f2721d3cd0db2b800f470003818022a7e9a0be5cb9e547007b7b7b15f93e9e1c9f00e6 *450007060614399d27a744005d11c0b1b13145cee0c97109606e0470767656913379725205705d *1890660c3e0528703f84b62abc25b4e02437563c7529b37acabc737e7df52a1c0d06213b2b8bf7 *4e932d7a7224b46c7859d2bf97256d3a61cabebf7913ce9c3e0d65a5a5b646fbd3e34d99b7a202 *be9999819fe7e66cb2259ea3a6ecc6f5ebf0c9d9b350bd63874d96e4fe406c74786808eaebea6c *b2bc86415336363a0a870e1e84adc5c536597ad58429a3b88e1f3b06ce9c1c9bec51abac6fc585 *30b2f40da74cd98591112e5bb535cd225b5938355f167c3d117eca4db1c8567fb4d6945d999e86 *ede5e5f0d9f8b8ad51b03e0f2a8b2e83c52453b6fd5cb529fb7cef87f042f346d8371db479cb3c *9e2d0e7d5565254c4d4eda649ee162534603e52e2c8453838336d9d2dc4ba17bdaf923bdc75581 *f6b2456f61bf6179563f0fe6d6784e14d4786a407f5a75a7432d984fae030badaff18dbc856dc9 *0be0c8743c7b5666dd9724198dfd45002711a23bb0f15f0040a95ba2675ee30f07095e39afaa33 *f86ab87722166e574783142fb16e504c7f0173b3ffbb6211000000000000000000000300000000 *000000 newhex * rmfile ./scripts/hoogle/misc/logo/hoogle.xar rmdir ./scripts/hoogle/misc/logo binary ./scripts/hoogle/misc/icons/icons.vsd oldhex *d0cf11e0a1b11ae1000000000000000000000000000000003e000300feff090006000000000000 *0000000000010000000200000000000000001000000500000001000000feffffff000000000300 *0000ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *fffffffffffdfffffffeffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffff52006f006f007400200045006e00740072007900000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000016000500 *ffffffffffffffffffffffff000000000000000000000000000000000000000000000000000000 *000000000000000000feffffff0000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *0000000000000000000000ffffffffffffffffffffffff00000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *00000000000000000000000000000000000000000000ffffffffffffffffffffffff0000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000ffffffffffff *ffffffffffff000000000000000000000000000000000000000000000000000000000000000000 *00000000000000000000000000000052006f006f007400200045006e0074007200790000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *0016000500ffffffffffffffff02000000141a020000000000c000000000000046000000000000 *0000000000000043079d96d8c50106000000000200000000000056006900730069006f0044006f *00630075006d0065006e0074000000000000000000000000000000000000000000000000000000 *0000000000000000000000001c000201ffffffff04000000ffffffff0000000000000000000000 *0000000000000000000000000000000000000000000000000014000000a7270000000000000500 *530075006d006d0061007200790049006e0066006f0072006d006100740069006f006e00000000 *0000000000000000000000000000000000000000000000280002010100000003000000ffffffff *000000000000000000000000000000000000000000000000000000000000000000000000070000 *00c818000000000000050044006f00630075006d0065006e007400530075006d006d0061007200 *790049006e0066006f0072006d006100740069006f006e000000000000000000000038000201ff *ffffffffffffffffffffff00000000000000000000000000000000000000000000000000000000 *000000000000000001000000bc01000000000000ffffffffffffffff04000000fdfffffffeffff *fffefffffffeffffff08000000090000000a0000000b0000000c0000000d0000000e0000000f00 *000010000000110000001200000013000000feffffff1500000016000000170000001800000019 *0000001a0000001b0000001c0000001d0000001e0000001f000000200000002100000022000000 *2300000024000000250000002600000027000000feffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffff56006900730069006f0049006e00 *66006f0072006d006100740069006f006e00000000000000000000000000000000000000000000 *000000000000000000000022000200ffffffffffffffffffffffff000000000000000000000000 *000000000000000000000000000000000000000000000000000000001c00000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *0000000000000000000000000000000000000000000000000000ffffffffffffffffffffffff00 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *00000000000000000000000000000000000000000000000000000000000000000000000000ffff *ffffffffffffffffffff0000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000ffffffffffffffffffffffff000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000feffffff0200000003 *00000004000000050000000600000007000000feffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff *fffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffeff0000 *040002000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000feff00000501020000000000000000000000 *0000000000000200000002d5cdd59c2e1b10939708002b2cf9ae4400000005d5cdd59c2e1b1093 *9708002b2cf9ae3c010000f80000000b000000010000006000000002000000680000000e000000 *740000000f00000080000000170000009c0000000b000000a400000010000000ac000000130000 *00b400000016000000bc0000000d000000c40000000c000000d800000002000000e40400001e00 *000004000000000000001e00000004000000000000001e00000014000000556e69766572736974 *79206f6620596f726b000003000000e6150b000b000000000000000b000000000000000b000000 *000000000b000000000000001e1000000100000008000000506167652d3100760c100000020000 *001e00000008000000506167657300000003000000010000008000000004000000000000002800 *000001000000600000000200000068000000030000007400000002000000020000000e0000005f *5049445f4c494e4b424153450003000000150000005f565049445f414c5445524e4154454e414d *4553000002000000e40400004100000002000000000000001e0000000400000000000000000000 *00feff0000050102000000000000000000000000000000000001000000e0859ff2f94f6810ab91 *08002b27b3d930000000981800000b000000010000006000000002000000680000000300000074 *0000000400000080000000050000009800000006000000a400000007000000b000000008000000 *bc00000012000000d40000000d000000ec00000011000000f800000002000000e40400001e0000 *0004000000000000001e00000004000000000000001e000000100000004e65696c204d69746368 *656c6c0000001e00000004000000000000001e00000004000000000000001e0000000400000000 *0000001e000000100000004e65696c204d69746368656c6c0000001e000000100000004d696372 *6f736f667420566973696f004000000000d2049d96d8c5014700000098170000ffffffff0e0000 *00010000006c0000009700000095010000c3000000a30200000000000000000000416100006489 *000020454d46000001009017000065000000030000000000000000000000000000000004000000 *03000040010000f000000000000000000000000000000000e2040080a90300460000002c000000 *20000000454d462b014001001c000000100000000210c0db010000006000000060000000460000 *002c01000020010000454d462b3040020010000000040000000000803f1f4004000c0000000000 *00001e4005000c000000000000001d400000140000000800000002000000640400000840000240 *000000340000000210c0db00000000ce00000000000000ec513840020000000200000002000000 *02000000000000000210c0db00000000ff0000ff0840010390000000840000000210c0db0d0000 *00000000007b3d4043f238d5437b3d40430601d04386c737430cc6cb43af572d430cc6cb43d8e7 *22430cc6cb43e4711a430601d043e3711a43f238d543e3711a43de70da43d8e72243d8abde43ae *572d43d8abde4385c73743d8abde437a3d4043de70da437a3d4043f238d5430003030303030303 *0303030383000000154001001000000004000000000000002100000008000000620000000c0000 *000100000024000000240000000000803d00000000000000000000803d00000000000000000200 *00005f000000380000000100000038000000000000003800000000000000000001002e00000000 *0000000000ff00000000000000000000000000250000000c00000001000000250000000c000000 *0500008055000000500000009800000095010000c3000000c00100000d000000040ca81a040c01 *1a7d0b7919d60a79192f0a7919a809011aa809a81aa8094f1b2f0ad61bd60ad61b7d0bd61b040c *4f1b040ca81a250000000c00000007000080250000000c00000000000080240000002400000000 *008041000000000000000000008041000000000000000002000000280000000c00000001000000 *46000000a400000098000000454d462b2a40000024000000180000000000c04200000000000000 *000000c042e4711a43e230cd430840020630000000240000000210c0db80aaaa3e000000000100 *0000000000000500000041005200490041004c000000364002804000000034000000ff0000ff01 *00000001000000010000003f0000b4c23d00fd973e0000803f00000000000000000000803f0000 *0000000000000000120000000c00000001000000180000000c0000000000ff00160000000c0000 *0018000000520000007001000001000000e0ffffff000000000000000000000000bc0200000000 *00000700040041007200690061006c000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000016000000000 *3404400100000000cf99016000000000000000004c71120074635101bc711200e6aa1860487112 *00000000000000000001000000b881120002ab1860010000000000000000000000000000004400 *3a005c0073006f00750072006300650073005c0068006f006f009c711200000008013207917c05 *0000000000080100000801a0b8de017471120063006f00b873120018ee907c3807917cffffffff *3207917cab06917ceb06917c000000001c0000007834dc01730063000000690063006f006e0073 *005c00690063006f006e0073002e0076007300640000000000c46482393cdf0801000000000000 *00000000000000000000000000006476000800000000250000000c000000010000005400000054 *000000a400000099010000b6000000bd010000010000000000fa410000fa41a4000000b7010000 *010000004c000000000000000000000000000000ffffffffffffffff500000003f006900000000 *00250000000c0000000d00008046000000fc000000f0000000454d462b2b4000000c0000000000 *00000840000240000000340000000210c0db00000000ce00000000000000ec5138400200000002 *0000000200000002000000000000000210c0db00000000008000ff084001039000000084000000 *0210c0db0d00000000000000fafc3f438381f143fafc3f439749ec43058737439d0ee8432e172d *439d0ee84357a722439d0ee84363311a439749ec4362311a438381f14362311a436fb9f64357a7 *224369f4fa432d172d4369f4fa430487374369f4fa43f9fc3f436fb9f643f9fc3f438381f14300 *030303030303030303030383000000154001001000000004000000000000002400000024000000 *0000803d00000000000000000000803d0000000000000000020000005f00000038000000020000 *0038000000000000003800000000000000000001002e0000000000000000800000000000000000 *000000000000250000000c00000002000000250000000c00000005000080550000005000000097 *000000cd010000c3000000f90100000d000000000c311e000c8a1d790b021dd20a021d2b0a021d *a4098a1da409311ea409d81e2b0a5f1fd20a5f1f790b5f1f000cd81e000c311e250000000c0000 *0007000080250000000c0000000000008024000000240000000000804100000000000000000000 *8041000000000000000002000000280000000c0000000200000046000000740000006800000045 *4d462b2a40000024000000180000000000c04200000000000000000000c04263311a437379e943 *364002804000000034000000008000ff010000000100000001000000430000b49c3d00fd973e00 *00803f00000000000000000000803f00000000000000000000120000000c000000010000001800 *00000c00000000800000160000000c00000018000000250000000c000000010000005400000054 *000000a2000000d1010000b6000000f5010000010000000000fa410000fa41a2000000ef010000 *010000004c000000000000000000000000000000ffffffffffffffff5000000043000000000000 *00250000000c0000000d00008046000000fc000000f0000000454d462b2b4000000c0000000000 *00000840000240000000340000000210c0db00000000ce00000000000000ec5138400200000002 *0000000200000002000000000000000210c0db000000000066ffff084001039000000084000000 *0210c0db0d00000000000000fafc3f431aed0644fafc3f432451044405873743a73302442e172d *43a733024457a72243a733024463311a432451044462311a431aed064462311a431089094457a7 *22438da60b442d172d438da60b44048737438da60b44f9fc3f4310890944f9fc3f431aed064400 *030303030303030303030383000000154001001000000004000000000000002400000024000000 *0000803d00000000000000000000803d0000000000000000020000005f00000038000000020000 *0038000000000000003800000000000000000001002e00000000000000ff660000000000000000 *000000000000250000000c00000002000000250000000c00000005000080550000005000000097 *00000006020000c3000000320200000d000000000cbc21000c1521790b8d20d20a8d202b0a8d20 *a4091521a409bc21a40963222b0aea22d20aea22790bea22000c6322000cbc21250000000c0000 *0007000080250000000c0000000000008024000000240000000000804100000000000000000000 *8041000000000000000002000000280000000c0000000200000046000000b0000000a400000045 *4d462b2a40000024000000180000000000c04200000000000000000000c04263311a438b250344 *084002063c000000300000000210c0db80aaaa3e0000000001000000000000000b000000570049 *004e004700440049004e00470053002000330000003640028040000000340000000066ffff0100 *00000100000001000000c8000090633d00fd973e0000803f00000000000000000000803f000000 *00000000000000120000000c00000001000000180000000c000000ff660000160000000c000000 *18000000280000000c00000001000000520000007001000001000000e0ffffff00000000000000 *0000000000bc0200000000000207000400570069006e006700640069006e006700730020003300 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *0000000000040041007200690061006c0000000000000000000000000000000000000000000000 *000000000000000020000000000000000000000000000000000000000000000000000160000000 *0034044001000000000000150000000000000000004c71120074635101bc711200e6aa01000400 *0000c87012003207917cbc7112000000907c7005917cffffffff6d05917c8899807c0000150000 *0000009b99807c140f0ae628bf19002020f577eb06917c000000001c0000007834dc0198711200 *00000801307b1200f399837ca099807cffffffff9b99807c4edbf17728bf190001000000000001 *00590f216a0100000000721200e5b2f2772020f577140f0ae66476000800000000250000000c00 *0000010000005400000054000000a00000000b020000ba0000002f020000010000000000fa4100 *00fa41a000000029020000010000004c000000000000000000000000000000ffffffffffffffff *50000000c800000000000000250000000c0000000d00008046000000fc000000f0000000454d46 *2b2b4000000c000000000000000840000240000000340000000210c0db00000000ce0000000000 *0000ec51384002000000020000000200000002000000000000000210c0db000000000000ffff08 *40010390000000840000000210c0db0d000000000000001b0d4043731915441b0d40437d7d1244 *26973743006010444f272d430060104478b722430060104484411a437d7d124483411a43731915 *4483411a4369b5174478b72243e6d219444e272d43e6d2194425973743e6d219441a0d404369b5 *17441a0d4043731915440003030303030303030303038300000015400100100000000400000000 *00000024000000240000000000803d00000000000000000000803d000000000000000002000000 *5f000000380000000200000038000000000000003800000000000000000001002e000000000000 *00ff000000000000000000000000000000250000000c00000002000000250000000c0000000500 *00805500000050000000970000003f020000c30000006a0200000d000000010c4725010ca0247a *0b1824d30a18242c0a1824a509a024a5094725a509ee252c0a7526d30a75267a0b7526010cee25 *010c4725250000000c00000007000080250000000c000000000000802400000024000000000080 *41000000000000000000008041000000000000000002000000280000000c000000020000004600 *0000a80000009c000000454d462b2a40000024000000180000000000c042000000000000000000 *00c042d86b1743799c10440840020634000000280000000210c0db00729c3e0000000001000000 *0000000008000000570045004200440049004e00470053003640028040000000340000000000ff *ff01000000010000000100000040000090633d00b9933e0000803f00000000000000000000803f *00000000000000000000120000000c00000001000000180000000c000000ff000000160000000c *00000018000000280000000c00000001000000520000007001000001000000e3ffffff00000000 *0000000000000000bc0200000000000207000400570065006200640069006e0067007300000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *00000000000000000400570069006e006700640069006e00670073002000330000000000000000 *000000000000000000000020000000000000000000000000000000000000000000000000000400 *41007200690061006c000000000015000000000000000000000000000000000000000000000001 *0004000000c87012003207917cbc7112000000907c7005917cffffffff6d05917c8899807c0000 *1500000000009b99807c140f0ae728bf19002020f577eb06917c000000001c0000007834dc0198 *71120000000801307b1200f399837ca099807cffffffff9b99807c4edbf17728bf190001000000 *00000100590f216a0100000000721200e5b2f2772020f577140f0ae76476000800000000250000 *000c0000000100000054000000540000009d00000046020000b800000063020000010000000000 *fa410000fa419d0000005e020000010000004c000000000000000000000000000000ffffffffff *ffffff500000004000000000000000250000000c0000000d00008046000000fc000000f0000000 *454d462b2b4000000c000000000000000840000240000000340000000210c0db00000000ce0000 *0000000000ec51384002000000020000000200000002000000000000000210c0db000000008000 *80ff0840010390000000840000000210c0db0d00000000000000bc5d4043dc4d2344bc5d4043e6 *b12044c7e7374369941e44f0772d4369941e441908234369941e4425921a43e6b1204424921a43 *dc4d234424921a43d2e92544190823434f072844ef772d434f072844c6e737434f072844bb5d40 *43d2e92544bb5d4043dc4d23440003030303030303030303038300000015400100100000000400 *00000000000024000000240000000000803d00000000000000000000803d000000000000000002 *0000005f000000380000000200000038000000000000003800000000000000000001002e000000 *0000000080008000000000000000000000000000250000000c00000002000000250000000c0000 *000500008055000000500000009800000077020000c3000000a30200000d000000060cd428060c *2d287f0ba627d80aa627310aa627aa092d28aa09d428aa097b29310a022ad80a022a7f0b022a06 *0c7b29060cd428250000000c00000007000080250000000c000000000000802400000024000000 *00008041000000000000000000008041000000000000000002000000280000000c000000020000 *0046000000ac000000a0000000454d462b2a40000024000000180000000000c042000000000000 *00000000c0425dae1843771b1e4408400206380000002c0000000210c0db80aaaa3e0000000001 *0000000000000009000000570049004e004700440049004e004700530000003640028040000000 *34000000800080ff0100000001000000010000003f000090633d00fd973e0000803f0000000000 *0000000000803f00000000000000000000120000000c00000001000000180000000c0000008000 *8000160000000c00000018000000280000000c00000001000000520000007001000001000000e0 *ffffff000000000000000000000000bc0200000000000207000400570069006e00670064006900 *6e0067007300000000000000000000000000000000000000000000000000000000000000000000 *0000000000000000000000000000000400570065006200640069006e0067007300000000000000 *000000000000000000000000000000000000200000000000000000000000000000000000000000 *00000000000400570069006e006700640069000000150073002000330000000000000000000000 *000000000000010004000000c87012003207917cbc7112000000907c7005917cffffffff6d0591 *7c8899807c00001500000000009b99807c140f0ae828bf19002020f577eb06917c000000001c00 *00007834dc019871120000000801307b1200f399837ca099807cffffffff9b99807c4edbf17728 *bf19000100000000000100590f216a0100000000721200e5b2f2772020f577140f0ae864760008 *00000000250000000c0000000100000054000000540000009e00000078020000ba0000009b0200 *00010000000000fa410000fa419e00000095020000010000004c00000000000000000000000000 *0000ffffffffffffffff500000003f00000000000000250000000c0000000d000080460000001c *00000010000000454d462b2b4000000c000000000000004c000000640000009800000095010000 *c3000000a202000098000000950100002c0000000e0100002900aa000000000000000000000080 *3f00000000000000000000803f0000000000000000000000000000000000000000000000000000 *000000000000220000000c000000ffffffff460000001c00000010000000454d462b024000000c *000000000000000e00000014000000000000001000000014000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000566973696f2028544d292044 *726177696e670d0a0000000000000b00a7270000008401001400000074635101692600003e0100 *00520000000000c2776000000060801200201a2537d0a5b500948012006ff51837e0a5b500301a *253700003500f4021937e0a5b500301a253704031937000000002700010004000000e87f1200ed *6ceaf1031ae9f2ffffff8300fff6f2fff3fbf00701f8f1008980eaf116048016002000190080ff *00c0c0c000e6e6e6ff00cdcdcd00b3b3b3ef009a9a9a2100800066ff6666004d4d4d0033ff3333 *001a1a1a00331d66fcf06600001800000000000000000000000000000000000000000000000000 *000000000000000000001800000000000000000000000000000000000000000000000000000000 *00000000000000551aebf0fff2f006ebf01ce8f3a0faf4070febf0f6f1e6f54ae7f4043aebf044 *ebf00100543501e8f380f2f1490f5b0ff2f1e0fb3101e6f568eae7f40febf054ebf00200548518 *ebf03cdffc94019401e6f501ae99020000032e04051a0407aaebf008ebf009ebf00aebf00baaeb *f00cebf00debf00ee7f4937ae3f82ec80255010101c2017ee7010200620100fe1912e5011f1602 *1f11e3010203614b00feeaf185c004eaf1990c13ff307a14ae47e17a84a53fbe0340e6f5c70102 *47131048990257162215002b197a12036616ae2213046202211405901606ca901607901608b411 *7a12092124a516eaf186c404eaf103c3000f11a06f06481307245f131b2950e0fbf0513f161f8f *1c1912039016041f16a4bd127a1206e6177a1207862c0828862ce51819120a7c260b1e269d13a5 *0cd02c0d30269d130ee614f0053f3f1287c804eb150f101e2f2a3ffe48133fb95c2e97cbe5bfe2 *3f200000e0f2f0efa1410b0fba0a7914d02c01d02c0202d02c03d0276c2f7e254b368f24543644 *d5159115099016c528e61ba07d0801e00c13663fc103191491158f1991158067299115bd1fcf1b *f83fc52219120baa90160c90160d90160e90160faa901610901611901612901613249011eaf1a4 *d004eaf1330123e2f90dfd6f02090839533b233d3a371229003d1037120160550260553c11aa37 *1204605505605506605507c03d109e4fb04ed54fe744eb010210a960aa11371211605512605513 *aa605514605515605516605517ea6055189f551990161a6209a508dd531be4527a121c003b8432 *1a0811304f481500a3d8042505200f1039519f696c3bde5200e452de529501c36702c36703e452 *eaf1a720dc046c683951bb6aeaf1b7e004eaf18df70c13202066162a7f66160811083c7f597f41 *272021167e709d33a8a4179e1d7a1204917c05a41c064362089246d270a023917c09917c250a91 *7c0ba417eaf1bde404eaf1fdb17169f03f88138813a0384f6e3c19178d33e614e0df34022a738c *03862c04862c05862c852f48a51ba752eaf1bee804eaf1510c1441021d09588f2017b5106c5d01 *7d55483b948c51eaf1bfec04eaf1fa716f00719f47155a5f6c5f7e5f905fa25fb04f40c24fc45f *e64ff84f0a59191214901685151255c0f0045b922758c30140ff4c2693c96432b93f9280adc991 *a84c33d2a3a881ae730555c9a1e5c7a6739fe9af819f939f00a59fb79fc99fdb9fed9fff912015 *0bafa41da47a1210b6a69d1311a5bc129492a69d1313c5bc14a4a69d13156ae5bc16a5bc17a5bc *1820c8a5a29d131925c73b6491151b90161c2a90161d90161e1255c8f4081a3b83d03f88cf9ac6 *455b3f21c3000111098f66c3017d3ad0df349235ddc500a235ddc5b235ddc5a2850730ad8a0730 *548a442015073316080db5090db5d50a0db50b4cb5101f161162150936a6073e1369c004c301fa *f1a09c048009bf058366e7f494e3f854bc2757800710270030c9a25559c5d7ae0035bf30ddfe09 *f165048267191404564f684f7a4320df8c45a09023e9d643df55df36130c0db50d0a0db50e0db5 *0f3d109fb30be6aeb4aab62c339016349016357c26362402e62213394161eaf16ac40492df14a4 *dfdffc95e3f8382757333f8bf64b21339ef2f30ae70be60138540001e7d7afdbff723f843f963f *a8389df644aa74daec05dae730dedb5508e4524059bf0d4c1ff0da2d81b7f5616b0f344838ff4a *ff0eec8812e87069014d482894658ed16f1144b862542911f3630001703c1f017012314e1d0feb *f815f5610968f264274128c70700d111e92741a8d109211512359312e82ef8840140bcc2442e4b *255d2222b6f561858068fd2d3083307a14ae47e1237a84b3c46b7634f1025d8849e20af5618671 *1847f884ac6dac638bff10f026b4c7412c0e39b01b3fc42f11e9004b3fe2ffebfffdff0f0fa53f *b73a7d4a002cf58edfd00fe20f6afa0c217bff8dff049fffddd6febbff114f234f0f9a8f420094 *6534f5291f694f4d1f5f1f9d3c801502b2212482375795ded5b2219149211500c31fd51fe71ff9 *1f0b2f1d2f2f2f412f00532f652fcd3f892f9b2f9764524f644f00fc58f2550e69954f781d34f1 *f4208435001ee65b5a266ff24f045f165f285cae217a27e59c3083321cc771d46003ac3fd36fe5 *6627e3eb2f1e6f0f3fa30200e5662c34357c02357c03003577d555dcd1251ff35f784f8a4f6d1f *007f1600910be18534883111e90091009904b719dcd105746f866f986faa6f335d3a8754329f18 *ff0017595f2d763a543b0136e6026217755f875f00995fab5fbd5fa42fc485d06fe260f28fb0ca *73fd6f187f217f0202daec03ae4f0c046202b403a4d9d83600d583ca79ff3329f01b66b2c525e4 *10b40501b502bf1a887491c030c4c52aaf00fbaf09a003a619b40aa38adf873f993f8ac0de7202 *17048583e3d4fb03c000f1df03ef15ef27ebb5827ce4c8a5b50239c91a88011101005093a9dcd2 *0534ebf028dcff040f160c14000000000000000000000000000000000000000000000000000000 *000000001800000000000000000000000000000000000000000000000000000000000000000000 *00dde3ebf0010015e3f8fcffffe2ff04044b020400f9ff0a00e6f5f03f3e9fcfffe7f3f9fc3f86 *c3e13f70381c174001dcfff1f0fef0f10100770101000982ebf0222a0f5e0f700f820fe2f9ff01 *3f8f0fb40fc60bd54eebf028ebf01aeaf104474902dcffe8f3011304eaf12af8f1ffc054016e08 *00005402ebf04304065515ebf0fff2f00bebf060e8f3fcfaf4f1f20000900c002cfee0fbf03f3e *9fcfe7f3fff9fc3f86c3e17038871c1740defdf2f109034c0f00a900f6f1e6f546e7f402ebf044 *0eebf0010054790171034305900da00507a407e0fb7501e6f568e7f4035aebf02472025418ebf0 *0cdffca8d801d801e6f501c10892e3f8d0fed502553f2291482412ff8920403f592c168bffc562 *27403f8fc7e3dff1783cbe3f3815bf46ff0a8542a15028a43f884a16b20fe9f250130d611fe1fa *017fff0300043c004cd501e90d0711d80101f606010005cab11606d10501c41175010101a507b1 *1609b116eaf19bf11600630091201332060d2df03f1f2d3c1428731901cf0310d501c4026e0711 *0104167201047575001b6020e6f505fe5222fb025c228d0562220575d8006c29eaf1c0f2c10890 *20130216404c26935fc96432b93fbe2dc9cf287fb95c2e97cbe5d2e12816bf2e73550731e50536 *03151d3f94951c13276504140a1324e0042820dffc51315131ff0dd801047321ebf044ce11e211 *08ebf0ec11eaf183653c042310071148e5f6a831fe15b434750100bf3bc405b434d801bf3bfb05 *b4348c3100bf3b8c31b038c411bf3bc411b038ce1100bf3bce15b434e211bf3be211b0389c3100 *bf3b9c31b038ec11bf3ba035b434513100bf37bf310715f2437f028c31c403900f01ffa410f0f3 *2759763f1639d00fe20fd0f40f061afa11e6f5b90724293fffca8ff2a3fc3f40c27f0c3143cc10 *1d40f4248fd93f4050c355d126cb53c9193f432c655103025c225d22fa55f50af9560a612f00e0 *3f0595fef45203fa5605046633660aa8872f2962eaf185fb1823201330ffb91e85eb51b89e3fce *8c30ff0001320675010200d501845586c10852201318338566b10a01af0383168316731e01fd04 *edf2020062330062bf660062ff007aa83040129d226c04186d2102b760b1488f6bf4865beaf189 *755e5500010f0aeaf18ffb18b00724d45ec15dd72996cb5501001862001e6d1862012c586d5221 *0202682262c210c8730103586d186fdb768d23ea72ee457501301e4502588453155fffff071160 *8900375f3045515f635f755f875f995c062556b056fb28b1511cc05820cc5e840893e357804c29 *dc125d2fd67a03285622822f5e6b84fb181daf2887890ead81020280aa1009736c61c405fe7865 *7a14ae47e17a8440876315279764ce150f75ce11301c7700a981e2f9ce11ce157c3f4f474e7f60 *75018afb1832010a2f7a02b37f7421c97f829a258bc10864a5c25675af6a27f000c67fa4acc185 *bbae0895d4afe6af39b700aba5304564ae23bf87af47bfaba551452064afcdaf8dbff1afebf00e *c108a5922ae1673f503069ed181ca387304554c5891a3d94e3f858af27048b31ffff0011000010 *2700ad32073255d5831e211b04bf14fb91e0fb09267601a661ea49bd85003b8f4d8f225f718fbe *888e8fa08fb28fa8c48f995fc3b221c12199b650aa3f56abd56ab51ac05fd25fc0e45d419fc576 *6c9ef453f01501049af0150a07e60a042e6308e6054412e62be60a51426c6f7e67092991008d6f *9f6fb16fc36fd56fe76ff96f0b7f001d7f2f7f417f43af657f777f897f9b7f007ebfbf7f499fe3 *7ff57fd8df198f07c1002ac1379536cf48cf5acf6ccf6ae208c08a86c0308ac3c591cfa3cfb5cf *0100c409bf318c31378feecf5b8f12df7f8fc036df48df5adf6cdfd98f90d8e37280e321a1d908 *9f1a9fd1dfe3df4a9f02008c313b937823ef1649e2819f939fa59f00b79fc99fdb9fed9fff9f11 *af23af35af0047af59afc7bf93ffebbff8afb3afc5af002ebfa8fffbaf423f1fbf663f783f55bf *00ee2fae3f123fd23fafbff12f5a3f1a4f107e3f09cf32109c054327cf200f320f04440f560f00 *82cf7b0f8d0fb8cfcacb0049e1dccfd50f00dff90f24df1d1f2f1ff0411f531f7edf7718138bc5 *6207b15818a2dfb4dfc6dfbf1fd11f10fcd949e13b9394650a936624e59466d1059e66b76648ef *385bec19ff25666def016191d8e201e4e0e1e10100e6e888ef9aefacefbeefd0efe2ef00f4ef06 *ff18ffc42f3cff4eff60ff72ff0084ff96ffcc3fbaffccffdeff558f020f00140fcb4fdd4fef4f *5c0f6e0f255f375f00a40fcfc6a621c30f7a5fe70f9e5f0b1fc0c25fd45fe65ff85f651f77180b *060f83c160302d69941fa61f5d6f046f6fdc1f02a621f31990a6082f1a2f002c2f3e2f502f622f *742f862f982faa2f00bc2fd57fe02f4e4f604f724f844f3a3f004c3fa8bfc73fccbf943fa63f02 *cf14cf00dc3f8abf004faebf6ecf364f92cf9fbf10b6cf1acf904fa24dc8b34fc18fd38f6ee58f *00006dbba78200f662000f5f1d9f2f9f455ce2a134d1107fdba402689107655f739f895f9b5fad *5fbb9fe0cd9fdf9ff19f076f42c215be89f76fe29b24607cbfdfef07f7fb152e6f406f526f60af *72af1088691ae1f3134af50a49f6b0654af6410554f66df6d46feea5ee65023f7100fb6ea8e529 *7f3b7f4d7f5f7f717f837f00957fa77fb97f65bfdd7fef7f018f138f00258f378f6dcf5b8f6d8f *7f8ff60fa38f00b58f6cdf7edfeb8ffd8f0f9fc6dfd8df00459f5b564a01649f30ef889f54efac *9fe078ef8aef9cefaeef06af5540fddf2ec28bf02224603c1e0f8fc7e3f1e3e935af47af13ff04 *25ff7daf024a0194a93136a9afbbaf00cdafdfaff1af03bf15bf27bf39bf4bbf005dbf760f81bf *efcf01df13df25dfdbbf00edbf494f68cf6d4f35cf47cfa34fb54f007dcf2b4fa1cf4f4f0f5fd7 *cf335f404f10575fbb4f31df43dd4054df621f741fcc861f981a8000acf2b0d4e338c58e5860d3 *ba1fcc1fde1f018702519c091bef142f3fef51ef63ef5c2fe06e2f802f922fbdefe34212954af7 *a552a920a069de997707e69d13e4eff6ef08ff013f133f103ef9a6614ef3d6750ad57666f5d676 *6105e076f9768aff9cfd0c80f72000b1ffc3ffd5ffe7fff9ff0b0f1d0f2f0f00410f530f650f11 *4f890f9b0fad0fbf0f004c5fe30f1d3f071f191fa67f3d1f4f1f00066f186f2a6f971fa91f606f *726f846f02f11d0a022fb96f262f382f4a2f017fe0137f257f377fa42fb622068bc5f762b158da *e0ee203bc8030eb26f79d62fe82f9f7fb17f1e3f01028da13539bdb64a3f5c3f6e3f803f00923f *a43fb63fc83fda3fec3ffe3f029f00224f905fa25fb45fc65f7c4f8e4fd5cf00095ff9cfd64fe8 *4f2fdf41df1e5fb7cf00425fdbcf9bdf785fbfdfcccfe3df47df04d25fe45d3ff55fee9f00af12 *af24aa230300388251643fa3d546af58af006aaf956a0100000002000000020000000000000011 *0000020000005516e5f603ebf004ebf080ebf00182dcf0a574ebf034eff4eaf101ebf005feeaf1 *22914824128920ff40592c168bc56227a540e3f8021f04eaf10bebf0b4ff5e42012d12000006fa *ebf0412d0204955101330a370011ebf043f9f65901140000001600000000000000000000000000 *0000010000000000000040000000ec7d5101441200004c0000005200000000000548ebf03cdcff *040f160f280e140000001600000000000000000000000000000001000000000000004500000024 *7e5101c21200000d000000520000000000140000005c0000000000000000000000010000000400 *00000000000015000000fc6b5101eb08000031090000d300c9000000c4ff40011c120000110000 *0040003f0000003c785101901200002e00000050004400000074785101cf1200002e0000005000 *00000000000000005531ebf0fff2f003ebf028e8f3151cebf00cdcff00f6f1f6f1e6f55501ebf0 *02e7f44f220844260261554101e8f3f2f1550fffff4e05906a09e0fb2901e6f568220801010217 *005418ebf0047d0f8b0aeaf1d5bce3f82b1602552c020908ac7a0f7f0b1f06ec03c989081e4226 *02512d01bf0a19052d02482a04003d0f2800580f6913f6f1771db10f900fa8a20fb40fe1fa9be3 *f84516025110fa0f082f1a2f2c2f00fd66ebf0650100004100ff7200690061006c00df20005500 *6ef9f06300df6f00640065fff04d006953dcffdffcff3603e93f2f05f7003f603401020b060405 *025201042401fd66ebf0050100005300ff79006d0062006f00a16cdcff120f240f360f80eaf105 *ff050102010706020501073701fd66ebf00501000057007f69006e00670064f7f4a173dcff180f *2a0fe2f980eaf10500370afd66ebf04501000041007f7200690061006cdcffdc100f220f00877a *e9f28008dee7f4ff0100404400ff022f0b0604025201042401fd66ebf04701000053007769006d *f5f075006edcffbc120fddfedf7b0061ebf080fd08e7f4ff01012000007f2820020b0604025201 *01042401fd66ebf0470100005000ff4d0069006e006700c54cf9f055dcff160fe1fadf7bdb0061 *ebf08008e7f4ff01ff012000002820020b170604025201042401fd66ebf0470100004d00ff5300 *200050004700ff6f00740068006900f163dcff1a0fe5f6df7b0061f6ebf08008e7f4ff010120ff *00002820020b060405025201042401fd66ebf04701000044007f6f00740075006ddcff7c100f22 *0f00df7b0061ebf0fb8008e7f4ff01012000ff002820020b060402025201042401fd66ebf04501 *00005300f779006cedf061006500f16edcff140fdffc87060004dee2f99f000020eaf1010aff05 *02050306030303002401ed66ebf04501f0f0007300ff7400720061006e00ff670065006c006f00 *5520f5f064030073f7f061dcff1ee1fa40600080eaf13902e3f8070308062408fd66ebf0450100 *005600ff720069006e0064003161dcff120fddfe0300f3f0e3f80e38050101064d0052012401fd *66ebf0450100005300ff68007200750074003169dcff120f240f0004260febf0070200053c08fd *66ebf0450100004d005f61006e0067f7f06cdcff24120f240f80250fe8f3043e08fd66ebf04501 *000054007f75006e00670061dcff48100f220febf040260fe9f2043e08fd66ebf0470100005300 *df65006e0064f9f07900b161dcff140fdffcdf7b010280fd08e7f4ff01012000007f2820020b06 *0402520101042401fd66ebf04501000052001d61f7f0760069dcff100f220f12ebf002260f3502 *053c08fd66ebf04701000044007f680065006e0075dcff7c100f220f00df7b0061ebf0fb8008e7 *f4ff01012000ff002820020b060402025201042401fd66ebf0450100004c001f6100740068f7f0 *ffff110fce230f000010260febf0020001043c08fd66ebf0450100004700df6100750074f7f06d *009169dcff140fddfe20260febf0020300053c08fd66ebf0470100004300ff6f00720064006900 *ff610020004e006500b177dcff1a0fe5f6df7bfff000f7008008e7f4ff010120ff00002820020b *060405025201042401fd66ebf0470100004d00ff53002000460061001f7200730069dcff160fe1 *fa7bdf7bfdf000008008e7f4ffff010120000028205f020b0604025201042401ed66ebf04701f0 *f00075001f6c0069006ddcff100f220fdf00df7b0061ebf08008fee7f4ff010120000028bf2002 *0b060402520104002401fd66ebf0450100005400ff69006d0065007300d720004efbf077fff052 *009d6ff9f061006edcffddfe87ed7ae9f28008e7f4ff0100fd404400ff02020603051f04050203 *042401fd66ebf0040100005700ff65006200640069001f6e00670073dcff160f280ffae0fb80ea *f105030102011f05090607033701fd66ebf00401000057007f69006e00670064f7f41f73002000 *33dcff1c0f2e0ffae6f580eaf105040102010308075400370118000000420b0000000000000000 *000000000000000000008300000000000000000000000000000000000000000000000000d70000 *0004c0530110140000450000004200d70000007cc05301551400002e0000004200d7000000f4c0 *530183140000250000004200d70000006cc15301a8140000350000004200d7000000e4c15301dd *140000390000004200d70000005cc25301161500003d0000004200d7000000d4c2530153150000 *430000004200d70000004cc3530196150000390000004200d7000000c4c35301cf150000370000 *004200d70000003cc45301061600003d0000004200d7000000b4c45301431600002d0000004200 *d70000002cc5530170160000270000004200d7000000a4c5530197160000220000004200d70000 *001cc65301b9160000230000004200d700000094c65301dc160000390000004200d70000000cc7 *530115170000220000004200d700000084c7530137170000390000004200d7000000fcc7530170 *170000260000004200d700000074c8530196170000270000004200d7000000ecc85301bd170000 *430000004200d700000064c95301001800003e0000004200d7000000dcc953013e180000380000 *004200d700000054ca530176180000470000004200000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000d7000000ccca5301bd180000320000004200 *000000000000000000000000000000000000d700000044cb5301ef180000320000004200000000 *0001000000470075006900640065000000f512ebf001ebf0540068007f650044006f0063dcf0f5 *12ebf001ebf0500061007f670065002d0031dcf0f522ebf001ebf0470065007f73007400750072 *f7f0df200046006ffff06d000d61fbf000001800000068000000ffffffff000000000000000004 *0000000400000000000000330000002cfe40017b2200001000000045003300000044fe40018b22 *0000150000004700330000005cfe4001a02200001500000047003300000054634b01b522000025 *000000470000000000010000000200000003000000000000000000000000000000000000000400 *0000a574ebf034eff4eaf101ebf002feeaf122914824128920ff40592c168bc56227a140e3f802 *010202ebf00bebf0e4ff5e42015623000006aaebf0412d02d433005c37000a003b02faf5590100 *00010000000300000000002574ebf034eff4eaf102dcffddfef4fef1fef50bebf0845d42015fb1 *2300000aebf0412d029fe4834001bb3700fef14102e9f2011004140000004a0100000000000000 *000000000000000f00000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000400000005c7e510166230000 *4b0000005200000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000400000007c7d *5101bd230000360000005200000000000548ebf03cdcff040f160f280e0548ebf03cdcff040f16 *0f280e140000004a0100000000000000000000000000000f000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *0000000045000000947e5101212500000d00000052000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *0000000000000000000045000000b47d51012e2500000d0000005200000000007bc402ebf00100 *00b8f3f09ce6f5f7f3010003ebf00a0504faebf009ebf07701010022c0dcff340f460f580fdffc *f7f80090c70c002c8601680fe8f3285bffb0055b30dfe24028df76a37bfe31ac01ec4673f7fcb4 *02a70e40e3a9defd5798624bf7f614e7f416ebf05fe4c04e0180ebf05cebf057420017e7f4dceb *f020e9f2e80c15f2f11813ffebf0546b51daf7f660940f001afb016351fb0124f3f0fb060000d2 *ac421f761f001debf0ac59101fef0800000bebf05200244ae7f42a93101c781fe9f221e7f4e94a *9310181329ebf0cc77517301c29310d211520027ebf0ffec68510101130000dd68ebf0500031eb *f024699751016ded10a3ebf0641f00eb00d8ebf08c35102119003b00561a00500032ebf13510b5 *da2200783111003febf0349f7a5101f323a210f3f050fb0044ebf0447d51013b01254825612100 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *000000000000000000000000000000000000000000000000000000000000000000000000000000 *00000000000000000000 newhex * rmfile ./scripts/hoogle/misc/icons/icons.vsd rmdir ./scripts/hoogle/misc/icons rmdir ./scripts/hoogle/misc hunk ./scripts/hoogle/Makefile 1 -# -# Simple Makefile for command line tool -# - -GHC= ghc -HC_OPTS= -O - -.PHONY: all deploy york haskell - -all: hoogle - -hoogle: - cd src && $(GHC) $(HC_OPTS) --make -o a.out CmdLine.hs - mv src/a.out ./$@ - cp src/hoogle.txt . - - -clean: - rm -rf hoogle - find src -name '*.hi' -o -name '*.o' -exec rm -rf {} \; - - -deploy: - mkdir -p deploy - mkdir -p deploy/res - mkdir -p deploy/haddock - wget http://www.cse.unsw.edu.au/~dons/lambdabot/State/where --output-document=deploy/res/lambdabot.txt --no-clobber - cd src && $(GHC) $(HC_OPTS) --make -o ../deploy/index.cgi Web.hs - cd src && $(GHC) $(HC_OPTS) --make -o ../deploy/hoodoc.cgi Doc.hs - cp -r web/* deploy - cp src/hoogle.txt deploy/res/hoogle.txt - cp src/Web/res/* deploy/res - cp src/Doc/res/* deploy/res - haddock --html --title=Hoogle --odir=deploy/haddock --prologue=docs/haddock.txt src/*.hs src/*/*.hs - - -york: deploy - cp -r deploy/* $(HOME)/web/cgi-bin/hoogle - cd deploy && find * | grep '\.' | grep -v cgi | grep -v txt | xargs -i cp --parents {} $(HOME)/web/res-cgi-bin/hoogle - - -haskell: deploy - scp -r deploy/* $(LOGNAME)@haskell.org:/haskell/hoogle rmfile ./scripts/hoogle/Makefile hunk ./scripts/hoogle/docs/builddocs.bat 1 -md haddock -haddock --html --title=Hoogle --odir=haddock --prologue=haddock.txt ..\src\Hoogle\*.hs - rmfile ./scripts/hoogle/docs/builddocs.bat hunk ./scripts/hoogle/docs/file-format.txt 1 -.HOO File Format -================ - -This document describes the file format for .hoo files - -These files are read by Hoogle to find out what functions are available - - -Syntax ------- - -The file is a text file. Each line is one entry, there is no way to span a line over multiple lines. Blank lines are ignored. Any line in which the first character is a # is ignored, #'s appearing later on the same line are not comments. There is no indentation, all lines are trimmed before being examined. - - -Module ------- - -The first content line of each file must be a module declaration. Once a module declaration is seen, all signatures after that are counted as being in that module. If another module declaration is given, then all subsequent lines are in that new module. This means that multiple hoo files concatentated are a valid hoo file. - - -Declarations ------------- - -Some example declarations, if anything isn't clear ask. - -module Prelude -module Data.Char - -instance Eq Bool -instance (Eq a, Eq b) => Eq (a, b) - -True :: Bool -False :: Bool - -data [] a -: :: a -> [a] -> [] a -[] :: [] a - -not :: Bool -> Bool -+ :: Num a -> a -> a -> a - -class Eq -class Eq a => Ord a - -== :: Eq a => a -> a -> Bool - -type String = [Char] - - -Generators ----------- - -The main way to generate hoo files is using hi2hoo, which requires the module to be built with GHC first. A haddock output format is also being written. - rmfile ./scripts/hoogle/docs/file-format.txt hunk ./scripts/hoogle/docs/haddock.txt 1 -This is the hoogle project, which is located at , and is (c) Neil Mitchell 2004-2005 - -This work is licensed under the Creative Commons Attribution-NonCommercial-ShareAlike License. To view a copy of this license, visit or send a letter to Creative Commons, 559 Nathan Abbott Way, Stanford, California 94305, USA. rmfile ./scripts/hoogle/docs/haddock.txt hunk ./scripts/hoogle/docs/todo.txt 1 -Tidy up the parser - Remove conflicts - Fix the 2 unused rules - Check the output of curried functions is correct - Parse errors "a[", should give an error message - - -Sort out the proper probabilities - -Allow functions to be matched partially - -Allow function argument reordering - -If no results are returned, state that, instead of no output - -I think the unification is wrong in some cases - -Class information, i.e. which types belong to which classes rmfile ./scripts/hoogle/docs/todo.txt rmdir ./scripts/hoogle/docs hunk ./scripts/hoogle/data/hihoo/hihoo.pl 1 -#!/usr/bin/perl -w -# hihoo - extract Hoogle .HOO information from GHC .hi interface files -# by Gaal Yahas - -use strict; -use Getopt::Long; -use File::Find; -use Text::Balanced; - -our $VERSION = '0.07'; - -# ChangeLog -# -# 0.08 -# - most of the required support for classes, only one subtest fails -# (emits `instance Class2 (Data2 a)` instead of -# `instance Eq a => Class2 (Data2 a)`) - how bad do we want this? -# -# 0.07 -# - pass all tests except the ones for classes -# - parse data completely -# - supress duplicate accessors from different variants -# - newtype (processed just like data declarations, I hope that's good) -# -# 0.06 -# - dequalify all outputs, not just from function signatures. -# - use a record-based iterator instead of parsing lines, bozhe moi! -# - support operators -# - improve data type parsing, including infix constructors and field accessors -# -# 0.05 -# - fix a bug in multi-line processing that caused some functions -# to be omitted -# - handle instance declarations -# -# 0.04 -# - strip function dependencies from class signatures -# - give up more gracefully on funky functions (?ref / {1}) - - -# Functions matching these patterns are considered to be internal GHC stuff. -# "Of course, this is a heuristic, which is a fancy way of saying that -# it doesn't work." -- MJD -our @STOPWORDS = map { qr/$_/ } qw/^a[\d\s] ^lvl[\d\s] ^lvn[\d\s] ^\$/; - -# GHC types which don't need to be fully qualified. -our @DEQUALIFY = map { qr/\b$_\./ } map { quotemeta } - qw/GHC.Base GHC.Conc GHC.IOBase GHC.Num GHC.Prim GHC.Read GHC.Show/; - -GetOptions \our %Config, qw(ghc|g=s); -$Config{ghc} ||= 'ghc'; - -for my $e (@ARGV) { - if (-d $e) { recurse($e) } else { do_process($e) } -} -exit 0; - -sub recurse { - find({ wanted => \&process, no_chdir => 1}, shift); - exit 0; -} - -sub process { - do_process($File::Find::name); # ick globals -} - -sub do_process { - my($file) = @_; - return unless $file =~ /\.hi$/; - - my $info = mk_iface_stream($file); - - print "-- $file\n"; - my %operators; - while (defined($_ = $info->())) { - #print "[$_]\n"; - /^((\S+)( :: [^{\n]+))/ && do { my $f = $operators{$2} ? "($2)" : $2; - printfunc("$f$3") unless stop($2) }; - /^interface (\w+)/ && do { print "module $1\n" }; - # why do i sometimes see "2 class" in the hi output? - /^\d* \s* (class.*)/sx && do { process_class($1) }; - /^type/ && do { s/\s+/ /g; s/\s*Variances.*//; dprint($_) }; - /^(instance .*) =/ && do { dprint($1) }; - /^data|newtype/ && do { process_data($_) }; - /^export Operators (.*)/ && do { load_operators($1, \%operators) }; - } - - print "\n"; -} - -sub load_operators { - my($ops, $store) = @_; - # --show-iface is redundant: infix data constructors are marked as - # such elsewhere, but also appear here. So let's strip 'em and handle - # them later, in context. This is a little hacky. - $ops =~ s/\S+\{.*?\}//g; - %$store = map { $_ => 1 } split /\s+/, $ops; -} - -sub process_class { - my($class) = @_; - my($classname) = $class =~ /class \s* (.*?) \s* Var/sx or do { - warn "*** class declaration unknown:\n$class"; return }; - dprint("class $classname"); - $classname =~ s/.* => \s*//; # crude, but correct AFAIK - $class =~ s/\{-.*?-\}//g; # remove "{- has default method -}" - while ($class =~ s/(\S+) \s* :: \s* (.+?)\s*(?=(?:\S+\s*:)|$)//x) { - dprint("$1 :: $classname => $2"); - } -} - -sub process_data { - my($data) = @_; - my %seenfields; - (my($decl, $type, $variants) = $data =~ m{ - ^(data|newtype) \s* (.*?) \s* - Variances .*? - = \s* - (.*) \s* # constructors, with Stricts and Fields etc. - }sx) or do { warn "*** can't parse data or newtype declaration:\n$data"; return }; - dprint("$decl $type"); - for my $v (split /\s+\|\s+/, $variants) { - my($cons, $params, $infix, $stricts, $fields) = $v =~ m{ - ^ - (\S+) \s* # Cons - (.*?) \s* # Int String (IO a) - (Infix)? \s* # - (?:Stricts: \s* ([\s_!]*))? \s* # !Int - (?:Fields: \s* (.*))? \s* # { x :: Num, y :: Num } - $ - }x or do { warn "*** can't parse data declaration:\n$data"; return }; - my @params = psplit($params); - my @stricts = map { /^!/ ? '!' : "" } split /\s+/, ($stricts||''); - my @fields = split /\s+/, ($fields||''); - -#::YY([$data, $cons, \@params, \@stricts, \@fields]) if $type eq 'Data1 a'; - my $cons1 = $infix ? "($cons)" : $cons; - dprint("$cons1 :: ". join " -> ", @params, $type); - for (0 .. $#fields) { - dprint("$fields[$_] :: $type -> $params[$_]") unless - $seenfields{$fields[$_]}++; - } - } -} - -sub psplit { - map { /^\(/ ? $_ : split } - Text::Balanced::extract_multiple(shift, - [ sub { Text::Balanced::extract_bracketed($_[0],"()") } ] ); -} - -sub mk_iface_stream { - my($file) = @_; - open my $fh, "$Config{ghc} --show-iface $file |" or die "open: $file: $!"; - my $buf; - return sub { - return undef unless $fh; - #die "stream exhausted" unless $fh; - while (<$fh>) { - if (/^\S/ && $buf) { - my $tmp = $buf; # "return $buf; $buf = $_" :-) - $buf = $_; - return $tmp; - } - $buf .= $_; - } - close $fh or die "close: $file: $!"; - undef $fh; - return $buf; - } -} - - -sub dprint { - my(@strs) = @_; - for my $str (@strs) { - $str =~ y/\n//d; - $str =~ s/$_//g for @DEQUALIFY; - } - $strs[-1] =~ s/\s+$//; - print @strs, "\n"; - #print ">>> ", @strs, "\n"; -} - -sub printfunc { - my($str) = @_; - - if ($str =~ /\?ref|\{/) { - warn "*** Function too funky for us, please add this definition yourself:\n$str"; - return; - } - - dprint($str); -} - -sub stop { - my($word) = @_; - do { return 1 if $word =~ $_ } for @STOPWORDS; -} -sub ::Y { require YAML; YAML::Dump(@_) } -sub ::YY { require Carp; Carp::confess(::Y(@_)) } - rmfile ./scripts/hoogle/data/hihoo/hihoo.pl rmdir ./scripts/hoogle/data/hihoo hunk ./scripts/hoogle/data/hadhtml/Lexer.hs 1 - -module Lexer(Lexeme(..), lexer) where - -import TextUtil -import List -import Char - -data Lexeme = Tag String [(String, String)] - | ShutTag String - | Text String - deriving (Show) - - -entities = [("gt", '>'), ("lt", '<'), ("amp", '&')] - ---------------------------------------------------------------------- --- MANIPULATORS -soupLower x = map f x - where - f (ShutTag x) = ShutTag (lcase x) - f (Tag x xs) = Tag (lcase x) (map (\(a,b) -> (lcase a,b)) xs) - f x = x - - lcase = map toLower - -firstText (Text x:_) = x -firstText (x:xs) = firstText xs -firstText [] = "" - -tagText (Text x) = x -tagText _ = "" - -innerText x = concatMap tagText x - -innerTextSpace x = oneSpace $ concatMap (\a -> ' ':tagText a) x - -addAttr :: Lexeme -> (String, String) -> Lexeme -addAttr (Tag name attr) x = Tag name (x:attr) - -getAttr :: Lexeme -> String -> Maybe String -getAttr (Tag _ attr) name = lookup name attr - ---------------------------------------------------------------------- --- PARSER - -lexer :: String -> [Lexeme] -lexer = {- map singleSpace . -} joinText . readTagSoup {- . map reSpace -} - -reSpace x = if isSpace x then ' ' else x - -joinText (Text a:Text b:xs) = joinText (Text (a ++ b):xs) -joinText (x:xs) = x : joinText xs -joinText [] = [] - -singleSpace (Text x) = Text (oneSpace x) -singleSpace x = x - -oneSpace (' ':' ':xs) = oneSpace (' ':xs) -oneSpace (x:xs) = x : oneSpace xs -oneSpace [] = [] - -readTagSoup [] = [] -readTagSoup ('<':'!':xs) = readDeclComment xs -readTagSoup ('<':'/':xs) = readShutTag xs -readTagSoup ('<':x:xs) | isAlpha x = readTag (x:xs) -readTagSoup ('&':xs) = readEntity xs -readTagSoup (x:xs) = Text [x] : readTagSoup xs - - -readDeclComment ('-':'-':xs) = readTagSoup (skipUntilAfter "-->" xs) -readDeclComment xs = readTagSoup (skipUntilAfter ">" xs) - -readShutTag xs = ShutTag (trim a) : readTagSoup b - where (a, b) = splitPairSafe ">" xs - -readEntity xs | hasClose && valid = Text [value] : readTagSoup b - where - hasClose = ';' `elem` take 10 xs - (a, b) = splitPairSafe ";" xs - isNumber = head xs == '#' - validNumber = all isDigit (tail a) - validWord = all isAlpha a - valid = (isNumber && validNumber) || (not isNumber && validWord) - value = if isNumber then chr (read (tail a)) else maybe '?' id (lookup a entities) - -readEntity xs = Text "&" : readTagSoup xs - - -isLegal x = isAlpha x || isDigit x || x == '_' || x == '-' - - --- read until a space or a >, that is the tag -readTag x = readAttr (Tag a []) b - where (a, b) = pairWhile isLegal x - ---readAttr tag xs = error (take 100 xs) -readAttr tag ('>':xs) = tag : readTagSoup xs -readAttr tag (x:xs) | isSpace x = readAttr tag xs - -readAttr tag [] = [tag] -readAttr tag (x:xs) | not (isLegal x) = error $ "Doh: " ++ show x ++ ": " ++ take 25 (x:xs) -readAttr tag xs = if head b == '=' - then readString tag a (tail b) - else readAttr (addAttr tag (a, "")) b - where (a, b) = pairWhile isLegal xs - - -readString tag name ('\"':xs) = readAttr (addAttr tag (name,a)) b - where (a, b) = splitPairSafe "\"" xs - -readString tag name xs = readAttr (addAttr tag (name,a)) b - where (a, b) = pairWhile (\x -> x /= ' ' && x /= '>') xs - - -skipUntilAfter find str | find `isPrefixOf` str = drop (length find) str -skipUntilAfter find (x:xs) = skipUntilAfter find xs -skipUntilAfter find [] = [] - - -splitPairSafe find str = case splitPair find str of - Just x -> x - Nothing -> (str, "") - -pairWhile :: (a -> Bool) -> [a] -> ([a], [a]) -pairWhile f xs = g [] xs - where - g done (x:xs) | f x = g (x:done) xs - g done todo = (reverse done, todo) - - rmfile ./scripts/hoogle/data/hadhtml/Lexer.hs hunk ./scripts/hoogle/data/hadhtml/Main.hs 1 - -module Main where - -import System -import Directory -import List - -import Lexer -import TextUtil -import Char - - -copyright = ["-- Generated by Hoogle, from Haddock HTML", "-- (C) Neil Mitchell 2005",""] - - --- example, for full GHC do C:\ghc\ghc-6.4\doc\html\libraries -main = do xs <- getArgs - let res = case xs of - (a:_) -> a - [] -> "C:\\ghc\\ghc-6.4.1\\doc\\html\\libraries" - hoogledoc res - - -test = hoogledoc "examples" - - - - - -hoogledoc :: FilePath -> IO () -hoogledoc x = do filelist <- docFiles x - textlist <- mapM readFile filelist - - excludeExists <- doesFileExist "exclude.txt" - excludeSrc <- if excludeExists then readFile "exclude.txt" else return "" - h98 <- loadH98 - - let filetext = zip filelist textlist - exclude = lines excludeSrc - results = onlyOnce $ h98 ++ concatMap (uncurry (document exclude)) filetext - writeFile "hoogle.txt" $ unlines (copyright ++ results) - - --- load up the libraries that GHC shows distain for... -loadH98 :: IO [(String, [String])] -loadH98 = do exist <- doesFileExist "haskell98.txt" - if exist then - do x <- readFile "haskell98.txt" - return $ f $ filter (not . null) $ lines x - else - do putStrLn "Warning: could not find haskell98.txt" - return [] - where - f [] = [] - f (x:xs) = (drop 7 x,a) : f b - where (a,b) = break ("module" `isPrefixOf`) xs - - -onlyOnce :: [(String, [String])] -> [String] -onlyOnce xs = concatMap g ordered - where - ordered = groupBy eqFst $ sortBy cmpFst items - items = map f $ groupBy eqSnd $ sortBy cmpSnd $ concatMap (\(a,b) -> map ((,) a) b) xs - - eqSnd (_,a) (_,b) = a == b - cmpSnd (_,a) (_,b) = a `compare` b - eqFst (a,_) (b,_) = a == b - cmpFst (a,_) (b,_) = a `compare` b - - modFst (a,_) (b,_) = length (filter (== '.') a) `compare` length (filter (== '.') b) - - f xs = head $ sortBy modFst xs - g xs@((name,_):_) = ["", "module " ++ name] ++ map snd xs - - - -{- -doctest x = do let file = "C:/ghc/ghc-6.4/doc/html/libraries/parsec/Text.ParserCombinators.Parsec" ++ x ++ ".html" - src <- readFile file - let y = unlines $ document [] file src - writeFile "result.txt" y --} - - --- the entries to output -document :: [String] -> FilePath -> String -> [(String, [String])] -document exclude file contents = - if hide then [] - else if any isSpace name then [] - else [(name, rewrite lexs)] - where - hide = any (`isPrefixOf` name) (map init partial) || any (== name) full - (partial, full) = partition (\x -> last x == '.') exclude - - lexs = lexer contents - name = modName lexs - - - -data Flags = IsDir | IsHtml | IsNone - deriving (Show, Eq) - - -docFiles :: FilePath -> IO [FilePath] -docFiles x = do xFlag <- getFlag x - if xFlag == IsHtml then return [x] else do - dir <- getDirectoryContents x - let qdir = map (\y -> x ++ "/" ++ y) (filter (\x -> head x /= '.') dir) - flags <- mapM getFlag qdir - let flag_dir = zip flags qdir - resdirs = map snd $ filter (\(a,b) -> a == IsDir ) flag_dir - reshtml = map snd $ filter (\(a,b) -> a == IsHtml) flag_dir - children <- mapM docFiles resdirs - return $ reshtml ++ concat children - where - getFlag ('.':_) = return IsNone - getFlag xs | ".html" `isSuffixOf` xs = return IsHtml - getFlag x = do y <- doesDirectoryExist x - return $ if y then IsDir else IsNone - - - ----- REWRITER - -getAttr :: Lexeme -> String -> String -getAttr (Tag _ attr) name = - case lookup name attr of - Nothing -> "" - Just x -> x - - -rewrite = concatMap rejoin . bundle . map deForall . extract - - -rebundle = bundle . map tail - - -deForall :: String -> String -deForall x = g x - where - g x | "forall " `isPrefixOf` x = g $ noImp $ tail $ tail $ dropWhile (/= '.') x - g (x:xs) = x : g xs - g [] = [] - - noImp x = f x - where - f ('=':'>':' ':xs) = xs - f (x:xs) = f xs - f [] = x - - - -bundle :: [String] -> [[String]] -bundle (x:xs) = (x:a) : bundle b - where (a,b) = break (not . isSpace . head) xs -bundle [] = [] - - -rejoin :: [String] -> [String] -rejoin [x] = [x] -rejoin (x:xs) | "data " `isPrefixOf` x || "newtype " `isPrefixOf` x = rejoinData (x:xs) -rejoin (x:xs) | "class " `isPrefixOf` trim x = rejoinClass (x:xs) -rejoin (x:xs) = [concat (x:map ((++) " " . tail) xs)] - - -rejoinData (dat:xs) = nub $ (keyword ++ " " ++ pre) : (concatMap f $ rebundle xs) - where - (keyword, _:pre) = break (== ' ') dat - - f ("Instances":xs) = map ((++) "instance " . tail) xs - f ("Constructors":xs) = concatMap g $ rebundle xs - - g [x] = [y ++ " :: " ++ concatMap (++ " -> ") ys ++ pre] - where (y:ys) = chunks x - - g (x:xs) = (dechunk $ x : "::" : concatMap h xs ++ [pre]) : concatMap t xs - - h x = res - where - res = concatMap (++ ["->"]) (replicate (reps+1) typ2) - - reps = length $ filter (== ',') names - (names:_:typ) = chunks x - typ2 = bracketStrip typ - - t x = map res names - where - names = splitList "," a - res name = dechunk $ name : "::" : clls ++ pre : "->" : imp - - (a:_:b) = chunks x - bb = bracketStrip b - (cls,rest) = break (== "=>") bb - - clls = if null rest then [] else cls ++ ["=>"] - imp = if null rest then cls else tail rest - - -bracketStrip ['(':xs] | not ('(' `elem` xs) = chunks $ init xs -bracketStrip x = x - - - -rejoinClass (dat:xs) = ("class " ++ pre) : (concatMap f $ rebundle xs) - where - pre2 = drop 6 $ reverse $ drop 7 $ reverse dat - pre = if '|' `elem` pre2 then takeWhile (/= '|') pre2 else pre2 - - cpre = chunks pre - body = dechunk $ - if "=>" `elem` cpre then tail (dropWhile (/= "=>") cpre) else cpre - - f ("Instances":xs) = [] - f ("Methods":xs) = map g $ rebundle xs - f (x:xs) = error $ "rejoinClass: " ++ x - - g [x] = dechunk $ a ++ "::" : cls : "=>" : imp - where - (a,b2) = break (== "::") (chunks x) - b = if null b2 then error pre else tail b2 - (c,d) = break (== "=>") b - - cls = if null d then body else concat ["(", body, ", ", nobrackets (dechunk c), ")"] - imp = if null d then b else tail d - - nobrackets ('(':xs) = init xs - nobrackets x = x - - g xs = g [dechunk xs] - - -dechunk = concat . intersperse " " - --- divide up into lexemes, respecting brackets -chunks :: String -> [String] -chunks x = filter (not . null) $ f "" 0 x - where - f a n (',':' ':xs) = f a n (',':xs) - f a n (x:xs) | x `elem` "[({" = f (x:a) (n+1) xs - | x `elem` "])}" = f (x:a) (n-1) xs - | isSpace x && n == 0 = reverse a : f "" n xs - | otherwise = f (x:a) n xs - f a n [] = [reverse a] - - - -extract :: [Lexeme] -> [String] -extract xs = - filter (not . isPrefixOf "module") $ -- remove modules - dropWhile (isSpace . head) $ -- remove synopsis - f (-1) xs - where - f n (Tag "TABLE" _:xs) = f (n+1) xs - f n (ShutTag "TABLE":xs) = f (n-1) xs - f n [] = [] - - f n (t@(Tag "TD" attr):xs) | att `elem` ["decl","arg","section4"] = g n "" xs - where att = getAttr t "CLASS" - f n (_:xs) = f n xs - - g n a (Tag "TABLE" _:xs) = h n 1 a xs - g n a (ShutTag "TD":xs) = (replicate n '\t' ++ trim a) : f n xs - g n a (Text x:xs) = g n (a ++ x) xs - g n a (_:xs) = g n a xs - - h n m a (Text x:xs) = h n m (a ++ x) xs - h n m a (ShutTag "TABLE":xs) = if m == 1 then g n a xs else h n (m-1) a xs - h n m a (Tag "TABLE" _:xs) = h n (m+1) a xs - h n m a (_:xs) = h n m a xs - - -deescape ('&':'g':'t':';':xs) = '>' : deescape xs -deescape ('&':'l':'t':';':xs) = '<' : deescape xs -deescape ('&':'a':'m':'p':';':xs) = '&' : deescape xs -deescape (x:xs) = x : deescape xs -deescape [] = [] - - - -modName :: [Lexeme] -> String -modName x = a - where Text a = head $ tail $ dropWhile (isntTag $ Tag "TITLE" []) $ x - - --- first one is the pattern, second is the actual -isTag :: Lexeme -> Lexeme -> Bool -isTag (Tag a c) (Tag b d) = eqEmpty a b && all contain c - where contain (key, val) = Just val == lookup key d - -isTag (ShutTag a) (ShutTag b) = eqEmpty a b -isTag (Text a) (Text b) = eqEmpty a b -isTag _ _ = False - -isntTag a b = not (isTag a b) - -eqEmpty a b = a == "" || a == b - rmfile ./scripts/hoogle/data/hadhtml/Main.hs hunk ./scripts/hoogle/data/hadhtml/TextUtil.hs 1 -module TextUtil where - -import Prelude -import Maybe -import Char -import List - - -trim :: String -> String -trim = trimLeft . trimRight -trimLeft = dropWhile isSpace -trimRight = reverse . trimLeft . reverse - - -isSubstrOf :: Eq a => [a] -> [a] -> Bool -isSubstrOf find list = any (isPrefixOf find) (tails list) - - -splitList :: Eq a => [a] -> [a] -> [[a]] -splitList find str = if isJust q then a : splitList find b else [str] - where - q = splitPair find str - Just (a, b) = q - - -splitPair :: Eq a => [a] -> [a] -> Maybe ([a], [a]) -splitPair find str = f str - where - f [] = Nothing - f x | isPrefixOf find x = Just ([], drop (length find) x) - | otherwise = if isJust q then Just (head x:a, b) else Nothing - where - q = f (tail x) - Just (a, b) = q - - -indexOf find str = length $ takeWhile (not . isPrefixOf (lcase find)) (tails (lcase str)) - - -lcase = map toLower -ucase = map toUpper - - -replace find with [] = [] -replace find with str | find `isPrefixOf` str = with ++ replace find with (drop (length find) str) - | otherwise = head str : replace find with (tail str) - - - - --- 0 based return -findNext :: Eq a => [[a]] -> [a] -> Maybe Int -findNext finds str = if null maxs then Nothing else Just (fst (head (sortBy compSnd maxs))) - where - maxs = mapMaybe f (zip [0..] finds) - - f (id, find) = if isJust q then Just (id, length (fst (fromJust q))) else Nothing - where q = splitPair find str - - compSnd (_, a) (_, b) = compare a b - - --- bracketing... - -data Bracket = Bracket (Char, Char) [Bracket] - | UnBracket String - deriving (Show) - -data PartBracket = PBracket [PartBracket] - | PUnBracket Char - deriving (Show) - - -bracketWith :: Char -> Char -> Bracket -> Bracket -bracketWith strt stop (Bracket x y) = Bracket x (map (bracketWith strt stop) y) -bracketWith strt stop (UnBracket x) = bracketString strt stop x - - -bracketString :: Char -> Char -> String -> Bracket -bracketString strt stop y = Bracket (strt, stop) (g "" res) - where - (a, b) = bracketPartial strt stop y - res = a ++ (map PUnBracket b) - - g c (PBracket x:xs ) = deal c ++ Bracket (strt, stop) (g "" x) : g "" xs - g c (PUnBracket x:xs) = g (x:c) xs - g c [] = deal c - - deal [] = [] - deal x = [UnBracket (reverse x)] - - - -bracketPartial :: Char -> Char -> String -> ([PartBracket], String) -bracketPartial strt stop y = f y - where - - f [] = ([], "") - - f (x:xs) | x == strt = (PBracket a : c, d) - where - (a, b) = bracketPartial strt stop xs - (c, d) = f b - - f (x:xs) | x == stop = ([], xs) - - f (x:xs) | otherwise = (PUnBracket x : a, b) - where (a, b) = f xs rmfile ./scripts/hoogle/data/hadhtml/TextUtil.hs hunk ./scripts/hoogle/data/hadhtml/exclude.txt 1 -Distribution.Compat.RawSystem -Distribution.Compat.ReadP -Distribution.Make -Distribution.Version -Distribution.Simple.Utils -Language.Haskell.Pretty -Array -Char -Complex -CPUTime -Directory -IO -Ix -List -Locale -MarshalError -Maybe -Monad -Random -Ratio -System -Time -Graphics. rmfile ./scripts/hoogle/data/hadhtml/exclude.txt hunk ./scripts/hoogle/data/hadhtml/haskell98.txt 1 -module Prelude -data [] -(:) :: a -> [a] -> [a] -[] :: [a] -keyword | -keyword -> -keyword <- -keyword @ -keyword ! -keyword :: -keyword ~ -keyword _ -keyword as -keyword case -keyword class -keyword data -keyword default -keyword deriving -keyword do -keyword else -keyword forall -keyword hiding -keyword if -keyword import -keyword in -keyword infix -keyword infixl -keyword infixr -keyword instance -keyword let -keyword module -keyword newtype -keyword of -keyword qualified -keyword then -keyword type -keyword where - - -module Ix -index :: Ix a => (a,a) -> a -> Int -inRange :: Ix a => (a,a) -> a -> Bool -rangeSize :: Ix a => (a,a) -> Int -range :: Ix a => (a,a) -> [a] - -module List -tails :: [a] -> [[a]] -intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] -group :: Eq a => [a] -> [[a]] -sortBy :: (a -> a -> Ordering) -> [a] -> [a] -find :: (a -> Bool) -> [a] -> Maybe a -delete :: Eq a => a -> [a] -> [a] -(\\) :: Eq a => [a] -> [a] -> [a] -nubBy :: (a -> a -> Bool) -> [a] -> [a] -unzip4 :: [(a,b,c,d)] -> ([a],[b],[c],[d]) -unzip5 :: [(a,b,c,d,e)] -> ([a],[b],[c],[d],[e]) -unionBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] -union :: Eq a => [a] -> [a] -> [a] -elemIndices :: Eq a => a -> [a] -> [Int] -zip6 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [(a,b,c,d,e,f)] -findIndex :: (a -> Bool) -> [a] -> Maybe Int -genericReplicate :: Integral a => a -> b -> [b] -maximumBy :: (a -> a -> a) -> [a] -> a -minimumBy :: (a -> a -> a) -> [a] -> a -inits :: [a] -> [[a]] -intersect :: Eq a => [a] -> [a] -> [a] -transpose :: [[a]] -> [[a]] -groupBy :: (a -> a -> Bool) -> [a] -> [[a]] -insert :: Ord a => a -> [a] -> [a] -unzip6 :: [(a,b,c,d,e,f)] -> ([a],[b],[c],[d],[e],[f]) -unzip7 :: [(a,b,c,d,e,f,g)] -> ([a],[b],[c],[d],[e],[f],[g]) -intersperse :: a -> [a] -> [a] -zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a,b,c,d,e)] -zip4 :: [a] -> [b] -> [c] -> [d] -> [(a,b,c,d)] -zip7 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [(a,b,c,d,e,f,g)] -partition :: (a -> Bool) -> [a] -> ([a],[a]) -zipWith6 :: (a -> b -> c -> d -> e -> f -> g) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -isPrefixOf :: Eq a => [a] -> [a] -> Bool -genericIndex :: Integral a => [b] -> a -> b -isSuffixOf :: Eq a => [a] -> [a] -> Bool -findIndices :: (a -> Bool) -> [a] -> [Int] -mapAccumR :: (a -> b -> (a,c)) -> a -> [b] -> (a,[c]) -genericSplitAt :: Integral a => a -> [b] -> ([b],[b]) -sort :: Ord a => [a] -> [a] -mapAccumL :: (a -> b -> (a,c)) -> a -> [b] -> (a,[c]) -genericTake :: Integral a => a -> [b] -> [b] -genericLength :: Integral a => [b] -> a -insertBy :: (a -> a -> Ordering) -> a -> [a] -> [a] -zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h] -elemIndex :: Eq => a -> [a] -> Maybe Int -zipWith5 :: (a -> b -> c -> d -> e -> f) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -zipWith4 :: (a -> b -> c -> d -> e) -> [a] -> [b] -> [c] -> [d] -> [e] -unfoldr :: (a -> Maybe (b,a)) -> a -> [b] -deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a] -genericDrop :: Integral a => a -> [b] -> [b] -nub :: Eq a => [a] -> [a] - -module Numeric -showSigned :: Real a => (a -> ShowS) -> Int -> a -> ShowS -floatToDigits :: RealFloat a => Integer -> a -> ([Int],Int) -readInt :: Integral a => a -> (Char -> Bool) -> (Char -> Int) -> ReadS a -showGFloat :: RealFloat a => Maybe Int -> a -> ShowS -showInt :: Integral a => a -> ShowS -readOct :: Integral a => ReadS a -fromRat :: RealFloat a => Rational -> a -readFloat :: RealFloat a => ReadS a -showFFloat :: RealFloat a => Maybe Int -> a -> ShowS -readSigned :: Real a => ReadS a -> ReadS a -readDec :: Integral a => ReadS a -showEFloat :: RealFloat a => Maybe Int -> a -> ShowS -lexDigits :: ReadS String -showFloat :: RealFloat a => a -> ShowS -readHex :: Integral a => ReadS a - -module IO -hGetChar :: Handle -> IO Char -hGetPosn :: Handle -> IO HandlePosn -isUserError :: IOError -> Bool -bracket_ :: IO a -> (a -> IO b) -> IO c -> IO c -hIsEOF :: Handle -> IO Bool -try :: IO a -> IO (Either IOError a) -hGetContents :: Handle -> IO String -hIsClosed :: Handle -> IO Bool -isEOFError :: IOError -> Bool -hGetLine :: Handle -> IO String -hFileSize :: Handle -> IO Integer -isEOF :: IO Bool -isAlreadyInUseError :: IOError -> Bool -hReady :: Handle -> IO Bool -isPermissionError :: IOError -> Bool -hPutStrLn :: Handle -> String -> IO () -hIsSeekable :: Handle -> IO Bool -stdout :: Handle -stderr :: Handle -isIllegalOperation :: IOError -> Bool -hClose :: Handle -> IO () -hPrint :: Show a => Handle -> a -> IO () -isFullError :: IOError -> Bool -hIsReadable :: Handle -> IO Bool -ioeGetErrorString :: IOError -> String -hFlush :: Handle -> IO () -isAlreadyExistsError :: IOError -> Bool -hLookAhead :: Handle -> IO Char -ioeGetHandle :: IOError -> Maybe Handle -hIsWritable :: Handle -> IO Bool -bracket :: IO a -> (a -> IO b) -> (a -> IO c) -> IO c -hPutStr :: Handle -> String -> IO () -hIsOpen :: Handle -> IO Bool -hPutChar :: Handle -> Char -> IO () -hSetBuffering :: Handle -> BufferMode -> IO () -ioeGetFileName :: IOError -> Maybe FilePath -stdin :: Handle -isDoesNotExistError :: IOError -> Bool -openFile :: FilePath -> IOMode -> IO Handle -hGetBuffering :: Handle -> IO BufferMode -hSeek :: Handle -> SeekMode -> Integer -> IO () -hWaitForInput :: Handle -> Int -> IO Bool -hSetPosn :: HandlePosn -> IO () - -module System -exitFailure :: IO a -getArgs :: IO [String] -exitWith :: ExitCode -> IO a -system :: String -> IO ExitCode -getProgName :: IO String -getEnv :: String -> IO String - -module CPUTime -getCPUTime :: IO Integer -cpuTimePrecision :: Integer - -module Random -split :: RandomGen a => a -> (a,a) -randoms :: (Random a, RandomGen b) => b -> [a] -next :: RandomGen a => a -> (Int,a) -getStdGen :: IO StdGen -randomIO :: Random a => IO a -setStdGen :: StdGen -> IO () -getStdRandom :: (StdGen -> (a, StdGen)) -> IO a -randomRs :: (Random a, RandomGen b) => (a,a) -> b -> [a] -randomRIO :: Random a => (a,a) -> IO a -randomR :: (Random a, RandomGen b) => (a,a) -> b -> (a,b) -newStdGen :: IO StdGen -random :: (Random a, RandomGen b) => b -> (a,b) -mkStdGen :: Int -> StdGen - -module Array -accum :: Ix a => (b -> c -> b) -> Array a b -> [(a,c)] -> Array a b -array :: Ix a => (a,a) -> [(a,b)] -> Array a b -ixmap :: (Ix a, Ix b) => (a,a) -> (a -> b) -> Array b c -> Array a c -bounds :: Ix a => Array a b -> (a,a) -accumArray :: Ix a => (b -> c -> b) -> b -> (a,a) -> [(a,c)] -> Array a b -elems :: Ix a => Array a b -> [b] -listArray :: Ix a => (a,a) -> [b] -> Array a b -(!) :: Ix a => Array a b -> a -> b -(//) :: Ix a => Array a b -> [(a,b)] -> Array a b -assocs :: Ix a => Array a b -> [(a,b)] -indices :: Ix a => Array a b -> [a] - -module Time -formatCalendarTime :: TimeLocale -> String -> CalendarTime -> String -diffClockTimes :: ClockTime -> ClockTime -> TimeDiff -getClockTime :: IO ClockTime -addToClockTime :: TimeDiff -> ClockTime -> ClockTime -toClockTime :: CalendarTime -> ClockTime -toUTCTime :: ClockTime -> CalendarTime -toCalendarTime :: ClockTime -> IO CalendarTime -calendarTimeToString :: CalendarTime -> String - -module Locale -defaultTimeLocale :: TimeLocale - -module Complex -mkPolar :: RealFloat a => a -> a -> Complex a -polar :: RealFloat a => Complex a -> (a,a) -cis :: RealFloat a => a -> Complex a -conjugate :: RealFloat a => Complex a -> Complex a -phase :: RealFloat a => Complex a -> a -magnitude :: RealFloat a => Complex a -> a -imagPart :: RealFloat a => Complex a -> a -(:+) :: RealFloat a => a -> a -> Complex a -realPart :: RealFloat a => Complex a -> a - -module Monad -msum :: MonadPlus a => [a b] -> a b -zipWithM :: Monad a => (b -> c -> a d) -> [b] -> [c] -> a [d] -filterM :: Monad a => (b -> a Bool) -> [b] -> a [b] -mapAndUnzipM :: Monad a => (b -> a (c,d)) -> [b] -> a ([c],[d]) -liftM :: Monad a => (b -> c) -> a b -> a c -foldM :: Monad a => (b -> c -> a b) -> b -> [c] -> a b -ap :: Monad a => a (b -> c) -> a b -> a c -zipWithM_ :: Monad a => (b -> c -> a d) -> [b] -> [c] -> a () -join :: Monad a => a (a b) -> a b -liftM3 :: Monad a => (b -> c -> d -> e) -> a b -> a c -> a d -> a e -when :: Monad a => Bool -> a () -> a () -guard :: MonadPlus a => Bool -> a () -liftM2 :: Monad a => (b -> c -> d) -> a b -> a c -> a d -unless :: Monad a => Bool -> a () -> a () -liftM4 :: Monad a => (b -> c -> d -> e -> f) -> a b -> a c -> a d -> a e -> a f -liftM5 :: Monad a => (b -> c -> d -> e -> f -> g) -> a b -> a c -> a d -> a e -> a f -> a g - -module Directory -getPermissions :: FilePath -> IO Permissions -setPermissions :: FilePath -> Permissions -> IO () -searchable :: Permissions -> Bool -createDirectory :: FilePath -> IO () -removeFile :: FilePath -> IO () -writable :: Permissions -> Bool -getModificationTime :: FilePath -> IO ClockTime -executable :: Permissions -> Bool -readable :: Permissions -> Bool -renameDirectory :: FilePath -> FilePath -> IO () -doesDirectoryExist :: FilePath -> IO Bool -getCurrentDirectory :: IO FilePath -removeDirectory :: FilePath -> IO () -renameFile :: FilePath -> FilePath -> IO () -setCurrentDirectory :: FilePath -> IO () -doesFileExist :: FilePath -> IO Bool -getDirectoryContents :: FilePath -> IO [FilePath] - -module Char -showLitChar :: Char -> ShowS -isUpper :: Char -> Bool -isPrint :: Char -> Bool -chr :: Int -> Char -ord :: Char -> Int -isDigit :: Char -> Bool -toLower :: Char -> Char -isOctDigit :: Char -> Bool -digitToInt :: Char -> Int -isSpace :: Char -> Bool -toUpper :: Char -> Char -isAscii :: Char -> Bool -lexLitChar :: ReadS String -isHexDigit :: Char -> Bool -readLitChar :: ReadS Char -isLatin1 :: a -> Bool -isAlphaNum :: Char -> Bool -intToDigit :: Int -> Char -isControl :: Char -> Bool -isLower :: Char -> Bool -isAlpha :: Char -> Bool - -module Ratio -approxRational :: RealFrac a => a -> a -> Rational -denominator :: Integral a => Ratio a -> a -(%) :: Integral a => a -> a -> Ratio a -numerator :: Integral a => Ratio a -> a - -module Maybe -isJust :: Maybe a -> Bool -listToMaybe :: [a] -> Maybe a -fromMaybe :: a -> Maybe a -> a -isNothing :: Maybe a -> Bool -fromJust :: Maybe a -> a -mapMaybe :: (a -> Maybe b) -> [a] -> [b] -maybeToList :: Maybe a -> [a] -catMaybes :: [Maybe a] -> [a] rmfile ./scripts/hoogle/data/hadhtml/haskell98.txt rmdir ./scripts/hoogle/data/hadhtml hunk ./scripts/hoogle/data/hadhoo/Main.hs 1 - -module Main where - -import System.Environment -import System.Cmd -import Control.Monad -import Data.List - - -helpMsg = "help msg for hadhoo\nhadhoo directory -output.hoo" - -main :: IO () -main = do args <- getArgs - if null args then putStrLn helpMsg else do - let (outfiles,infiles) = partition ("-" `isPrefixOf`) args - outfile = last ("hoogle.txt":map tail outfiles) - allfiles <- liftM concat $ mapM pickFiles infiles - if null allfiles - then putStrLn "No in files specified, nothing to do" - else execute allfiles outfile - - -pickFiles :: FilePath -> IO [FilePath] -pickFiles file = return [file] - - -execute :: [FilePath] -> FilePath -> IO () -execute srcfiles outfile = mapM_ (executeOne outfile) srcfiles - -executeOne :: FilePath -> FilePath -> IO () -executeOne outfile file = do - system $ "haddock -hoogle " ++ file ++ " > temp.txt" - src <- readFile "temp.txt" - appendFile outfile src - - rmfile ./scripts/hoogle/data/hadhoo/Main.hs rmdir ./scripts/hoogle/data/hadhoo rmdir ./scripts/hoogle/data rmdir ./scripts/hoogle hunk ./lambdabot.cabal 56 --- --- Hoogle --- -Executable: hoogle -hs-source-dirs: scripts/hoogle/src -ghc-options: -funbox-strict-fields -Main-is: CmdLine.hs - }