7h      !"#$%&'( ) * + , - . / 0 1 2 3 4 5 6 7 8 9 : ; < = > ? @ A B C D E F G H I J K L M N O P Q R S T U V W X Y Z [ \ ] ^ _ ` a b c d efg'Show a value using an infix operator. .Parse a string containing an infix operator. #Compose two parsers sequentially.      &Also present in newer versions of the base package. Monadic  List.repeat. /repeat action until result fulfills condition !parameter order equal to that of nest Lazy monadic conjunction. 'That is, when the first action returns False, then False= is immediately returned, without running the second action. Lazy monadic disjunction. 'That is, when the first action returns True, then True= is immediately returned, without running the second action.     Cf. '(Control.Arrow.***)'. 7Apply two functions on corresponding values in a pair, 9where the pattern match on the pair constructor is lazy. -This is crucial in recursions such as the of  partition. Control.Arrow.first Control.Arrow.second    Returns h$ if the precondition is fulfilled. This is an infix version of i  for writing Data.Bool.HT.select style expressions #using test functions, that produce js. +The precedence is chosen to be higher than '(:)', in order to allow:   alternatives default $  checkForA ?-> (\a -> f a) :  checkForB ?-> (\b -> g b) :  [] "The operation is left associative in order to allow to write   checkForA ?-> f ?-> g which is equivalent to   checkForA ?-> g . f due to the functor law. k#Compositional power of a function, i.e. apply the function n times to a value. It is rather the same as iter in Simon Thompson: "#The Craft of Functional Programming" , page 172 lm npowerAssociative is an auxiliary function that, for an associative operation op, computes the same value as  ?powerAssociative op a0 a n = foldr op a0 (genericReplicate n a) but applies op' O(log n) times and works for large n. klm nklm n! Known as on in newer versions of the base package.  ! !!opq"@Divides a list into sublists such that the members in a sublist share the same key. It uses semantics of Data.List.HT.groupBy,  not that of Data.List.groupBy. rWill be less efficient than " if key is computationally expensive. ?This is so because the key is re-evaluated for each list item. Alternatively you may write groupBy ((==) on key). s#argmin $argmax %&'tuvwopq"rs#$%&'tuvwopq"rs#$%&'tuvw"#$%&''%#$"& ()limit (lower,upper) x restricts x to the range from lower to upper. Don't expect a sensible result for  lower>upper. *limit (lower,upper) x checks whether x is in the range from lower to upper. Don't expect a sensible result for  lower>upper. ()*()*()* ++++, if-then-else as function.  Example:  if' (even n) "even" $  if' (isPrime n) "prime" $  "boring" -x+From a list of expressions choose the one, whose condition is true.  Example:  select "boring" $  (even n, "even") :  (isPrime n, "prime") :  [] yz. Like the ?( operator of the C progamming language.  Example:  bool ?: (yes, no). /"Logical operator for implication. #Funnily because of the ordering of { it holds  implies == (<=). ,-xyz./,-xyz./ ,-./,-./0$Make a list as long as another one 11Drop as many elements as the first list is long |}~8Shares suffix with input, that is it is more efficient.   laxTail [] = []236Compare the length of two lists over different types. It is equivalent to !(compare (length xs) (length ys)) but more efficient. <efficient like compareLength, but without pattern matching 4lessOrEqualLength x y is almost the same as compareLength x y <= EQ, but lessOrEqualLength [] undefined = True, whereas compareLength [] undefined <= EQ = undefined. 5&Returns the shorter one of two lists. 6It works also for infinite lists as much as possible. E.g. 4shortList (shorterList (repeat 1) (repeat 2)) [1,2,3] can be computed. 6The trick is, that the skeleton of the resulting list is constructed using  without touching the elements. 3The contents is then computed (only) if requested. This lazier than 5 in a different aspect: It returns a common prefix 8even if it is undefined, which list is the shorter one. However, it requires a proper  instance 9and if elements are undefined, it may fail even earlier. 601|}~2345601|}~23456f7IThis function is lazier than the one suggested in the Haskell 98 report. It is inits undefined = [] : undefined, in contrast to %Data.List.inits undefined = undefined. 3Suggested implementation in the Haskell 98 report. It is not as lazy as possible. 8IThis function is lazier than the one suggested in the Haskell 98 report. It is tails undefined = ([] : undefined) : undefined, in contrast to %Data.List.tails undefined = undefined. 94This function compares adjacent elements of a list. UIf two adjacent elements satisfy a relation then they are put into the same sublist.  Example:  1 groupBy (<) "abcdebcdef" == ["abcde","bcdef"] In contrast to that Data.List.groupBy compares ?the head of each sublist with each candidate for this sublist.  This yields  3 List.groupBy (<) "abcdebcdef" == ["abcdebcdef"]  The second b is compared with the leading a. (Thus it is put into the same sublist as a. The sublists are never empty. +Thus the more precise result type would be [(a,[a])]. :;Like standard ; but more lazy. It is &Data.List.unzip undefined == undefined, but )unzip undefined == (undefined, undefined). <Data.List.partition' of GHC 6.2.1 fails on infinite lists. But this one does not. =>It is &Data.List.span f undefined = undefined, whereas )span f undefined = (undefined, undefined). ?ASplit the list at the occurrences of a separator into sub-lists. Remove the separators. This is a generalization of . @Like >), but splits after the matching element. A5Split the list after each occurence of a terminator. Keep the terminator. ?There is always a list for the part after the last terminator. It may be empty. B=Split the list before each occurence of a leading character. Keep these characters. HThere is always a list for the part before the first leading character. It may be empty. C removeEach xs" represents a list of sublists of xs, where each element of xs is removed and "the removed element is separated. ,It seems to be much simpler to achieve with %zip xs (map (flip List.delete xs) xs), but the implementation of C does not need the  instance 2and thus can also be used for lists of functions. DE It holds "splitLast xs == (init xs, last xs), but E is more efficient 8if the last element is accessed after the initial ones, "because it avoids memoizing list. FShould be prefered to  and . GShould be prefered to  and . HShould be prefered to  and . IShould be prefered to  and . J4Remove the longest suffix of elements satisfying p. In contrast to reverse . dropWhile p . reverse $this works for infinite lists, too. KAlternative version of reverse . takeWhile p . reverse. Doesn'3t seem to be superior to the naive implementation.  However it is more inefficient, 5because of repeatedly appending single elements. :-( LmaybePrefixOf xs ys is Just zs if xs is a prefix of ys, where zs is ys without the prefix xs. Otherwise it is Nothing. M1Partition a list into elements which evaluate to Just or Nothing by f.  It holds $mapMaybe f == fst . partitionMaybe f and partition p == partitionMaybe ( x -> toMaybe (p x) x). NThis is the cousin of  analogously to  being the cousin of . @Example: Keep the heads of sublists until an empty list occurs. + takeWhileJust $ map (fmap fst . viewL) xs OP%keep every k-th value from the list QRST7This is slightly wrong, because it re-replaces things.  That'$s also the reason for inefficiency: P The replacing can go on only when subsequent replacements are finished. 2 Thus this functiob fails on infinite lists. UV Transform  " [[00,01,02,...], [[00], % [10,11,12,...], --> [10,01], ( [20,21,22,...], [20,11,02], ! ...] ...] With concat . shear+ you can perform a Cantor diagonalization, 8that is an enumeration of all elements of the sub-lists Awhere each element is reachable within a finite number of steps. ?It is also useful for polynomial multiplication (convolution). It's somehow inverse to zipCons, but the difficult part is, <that a trailing empty list on the right side is suppressed. W Transform  " [[00,01,02,...], [[00], % [10,11,12,...], --> [01,10], ( [20,21,22,...], [02,11,20], ! ...] ...] It's like V8 but the order of elements in the sub list is reversed. ;Its implementation seems to be more efficient than that of V. ,If the order does not matter, better choose W. zipCons is like  zipWith (:)' but it keeps lists which are too long This version works also for zipCons something undefined. zipCons' is like  zipWith (:)' but it keeps lists which are too long XJOperate on each combination of elements of the first and the second list. $In contrast to the list instance of  Monad.liftM2 )in holds the results in a list of lists.  It holds 1concat (outerProduct f xs ys) == liftM2 f xs ys Y"Take while first predicate holds, 3then continue taking while second predicate holds,  and so on. This is a combination of  and  in the sense of . It is however more efficient Gbecause it avoids storing the whole input list as a result of sharing. Z rotate left 'more efficient implementation of rotate' [!Given two lists that are ordered (i.e. p x y holds for subsequent x and y) [* them into a list that is ordered, again. \]^_8This function combines every pair of neighbour elements #in a list with a certain function. ` Enumerate without Enum context. !For Enum equivalent to enumFrom. abcFor an associative operation op this computes  *iterateAssociative op a = iterate (op a) a but it is even faster than "map (powerAssociative op a a) [0..] #since it shares temporary results.  The idea is: From the list (map (powerAssociative op a a) [0,(2*n)..] we compute the list $map (powerAssociative op a a) [0,n..], and iterate that until n==1. dThis is equal to c. The idea is the following: 4The list we search is the fixpoint of the function: sSquare all elements of the list, then spread it and fill the holes with successive numbers of their left neighbour. 2This also preserves log n applications per value. However it has a space leak, !because for the value with index n all elements starting at div n 2 must be kept. f789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcdf789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcd .789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcd.789:;<=>?@ABCDEFGHIJKLMNOPQRSTUVWXYZ[\]^_`abcde?Lexicographically compare a list of attributes of two records.  Example: ( compare [comparing fst, comparing snd] f@Check whether a selected set of fields of two records is equal.  Example: $ equal [equating fst, equating snd] efefefefg#remove leading and trailing spaces ggg 01234560126345 !"#$%&'()*+,-./0123456789:;<= > ? @ ABCDEFGHIJKLMNO8PQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~}}~Op}}}}}}}}}~}}}utility-ht-0.0.5.1 Text.Show.HT Text.Read.HTData.Strictness.HTControl.Monad.HT Data.Tuple.HT Data.Maybe.HTData.Function.HT Data.List.Key Data.Ord.HT Data.Eq.HT Data.Bool.HTData.List.Match Data.List.HTData.Record.HTData.String.HTData.Function.HT.PrivateData.List.Key.PrivateData.Bool.HT.PrivateData.List.Match.PrivateData.List.HT.PrivateData.Record.HT.PrivateshowsInfixPrecreadsInfixPrec.>readMany maybeRead arguments1 arguments2 arguments3 arguments4 arguments5<=<repeatuntilMuntil iterateLimitM iterateLimitandLazyorLazymapPairmapFstmapSndswap forcePairfst3snd3thd3curry3uncurry3toMaybe?-> alternativesnestpowerAssociativecompose2groupminimummaximumsortmergenub comparinglimitinRangeequatingif'select?:impliestakedropsplitAt compareLengthlessOrEqualLength shorterList replicateinitstailsgroupByunzip partitionspanbreakchop breakAfter segmentAfter segmentBefore removeEachsplitEverywhere splitLastviewLviewRswitchLswitchR dropWhileRev takeWhileRev maybePrefixOfpartitionMaybe takeWhileJust unzipEitherssievesliceHorizontal sliceVerticalsearchreplace multiReplaceshearshearTranspose outerProducttakeWhileMultirotatemergeByallEqual isAscendingisAscendingLazy mapAdjacentrangepadLeftpadRightiterateAssociative iterateLeakycompareequaltrimbase Data.MaybeJustGHC.BasefmapMaybenest1nest2propNestpowerAssociative1attachauxaux'group' propGroupgroupByNonEmpty groupByEmptyselect0select1zipIfghc-primGHC.BoolBooldrop'drop''drop'''laxTailpropTakepropDrop propDropAlt propTakeDrop propSplitAtcompareLength'compareLength''propCompareLengthGHC.ListzipWith shorterListEq GHC.ClassesEqinits98inits98'tails'tails98 Data.Listwordschop' chopAtRunpropSegmentAfterConcatpropSegmentAfterNumSepspropSegmentAfterLastspropSegmentAfterInitspropSegmentAfterInfinitepropSegmentBeforeConcatpropSegmentBeforeNumSepspropSegmentBeforeHeadspropSegmentBeforeTailspropSegmentBeforeInfinite propSplitLastheadtailinitlast propViewRswitchL' propSwitchR dropWhileRev' takeWhileRev'takeWhileRev'' takeWhile catMaybesfiltersieve'sieve''sieve''' propSievesliceHorizontal'sliceHorizontal''sliceHorizontal'''propSliceHorizontalsliceVertical'propSliceVertical propSlice markSublists propReplaceIdpropReplaceCyclereplace'propMultiReplaceSingle transposeFill unzipCons unzipConsSkewshear' zipConsSkewzipConszipCons'takeWhileMulti'propTakeWhileMultifoldl'r foldl'rStrictfoldl'foldr propFoldl'r foldl'rNaiverotate'rotate'' propRotate padRight1compare1compare2