Search results

Jump to navigation Jump to search

Page title matches

Page text matches

  • parent s = father s `mplus` mother s grandparent s = paternalGrandfather s `mplus`
    561 bytes (71 words) - 08:43, 9 April 2021
  • parent s = (maybeToList (mother s)) ++ (maybeToList (father s)) grandparent s = (maybeToList (paternalGrandfather s)) ++
    631 bytes (63 words) - 08:44, 9 April 2021
  • newtype SuperState s t a = SuperState { runSuperState :: (s -> t -> (t,[(a,s)])) } instance Monad (SuperState s t) where
    1 KB (169 words) - 05:31, 9 March 2021
  • newtype State s a = State { runState :: s -> (a, s) } * <hask>s -></hask>
    380 bytes (24 words) - 12:26, 6 December 2023
  • parent s = (toMonad (father s)) `mplus` (toMonad (mother s)) grandparent s = (toMonad (parentalGrandfather s)) `mplus`
    1 KB (151 words) - 08:45, 9 April 2021
  • maternalGrandfather s = return s >>= \ms ->
    1 KB (147 words) - 08:41, 9 April 2021
  • newtype SupplyT s m a = SupplyT (StateT [s] m a) newtype Supply s a = Supply (SupplyT s Identity a)
    1 KB (202 words) - 05:09, 4 April 2014
  • maternalGrandfather s = return s >>= \ms ->
    4 KB (454 words) - 02:33, 7 January 2022
  • xor s t = if null s then t else s loop n s = cycle $ replicate (n-1) [] ++ [s]
    980 bytes (157 words) - 15:19, 6 February 2021
  • [s] <- getArgs putStrLn $ formatCalendarTime defaultTimeLocale s time
    543 bytes (78 words) - 15:19, 6 February 2021
  • ...e writings on the relevance of algorithmic information theory, and Chaitin's thoughts of its relatedness to epistemology, biology. [[Chaitin's construction]].
    440 bytes (57 words) - 06:23, 4 February 2016
  • It's very simple to use, and provides a highly efficient, pure interface * JeremyShaw's update of HalDaume's NewBinary package (Cabalized): http://www.n-heptane.com/nhlab/repos/NewBina
    2 KB (254 words) - 19:03, 23 October 2013
  • s/^> // s/\(\n\)> /\1/g
    600 bytes (99 words) - 10:10, 7 November 2013
  • ...e the prelude function for computing gcd's along with a test of the result's equality to one.
    329 bytes (49 words) - 19:43, 18 January 2014
  • .../github.com/bergey/diagrams-stow/blob/master/release/UpperBounds.hs Daniel's]) This page has ideas & requirements for building a less ad-hoc tool, whic Either Brent's tool or Daniel's (or both) performs each of the tasks listed above. In some cases the code
    2 KB (241 words) - 16:19, 22 June 2015
  • ...n if it is (mostly) backward-compatible, and otherwise in the "alternative(s)" column. !Module(s)
    5 KB (633 words) - 15:16, 6 February 2021
  • Page about the implementation of Oleg's Iteratee maintained by John Lato. * [http://okmij.org/ftp/Haskell/Iteratee Oleg's Original Implementation]
    2 KB (228 words) - 15:18, 6 February 2021
  • ...e hackathon on Friday and Saturday, and possibly Sunday afternoon if there's interest. To get sound you'll need VSTs, a VST host, and jack if it's linux. It's
    886 bytes (153 words) - 22:47, 5 April 2017
  • ! Author(s) ! Maintainer(s)
    4 KB (491 words) - 10:14, 3 August 2015
  • * <hask>unsafeInterleaveST :: ST s a -> ST s a</hask> * <hask>unsafeIOToST :: IO a -> ST s a</hask>
    1 KB (206 words) - 12:27, 8 June 2023
  • gray n = foldr (\s acc -> ("0" ++ s):("1" ++ s):acc) [] $ gray (n-1) gray' n = (gl . gr) [] where gl y = foldr (\s acc -> ('0':s):acc) y gp
    2 KB (298 words) - 03:02, 7 June 2021
  • (**) Calculate Euler's totient function phi(m). Euler's so-called totient function phi(m) is defined as the number of positive inte
    1 KB (224 words) - 19:44, 18 January 2014
  • ...nd raise the profile of the Haskell programming language. Most of all, it's fun---you get to tangibly experience your contributions in the form of beau
    1 KB (165 words) - 22:48, 5 March 2014
  • ...hs using graph canonization. It is somewhat of a slow solution, taking >10 s to run <hask>regular 6 3</hask>. [i : s | i <- n, s <- xs, i `notElem` s, asc (i : s)])
    2 KB (388 words) - 03:47, 10 January 2017
  • Because (State s) forms a monad, values can be combined with (>>=) or do{}. ...is a function from initial state s to final value a and final state s: (a,s). These are usually wrapped, but shown here unwrapped for simplicity.
    7 KB (1,055 words) - 15:06, 21 December 2018
  • 2007-03-01 closing=1403.17 change%=-0.25944346 cash=12389.992 assets=(#S(PURCHASE :AMOUNT 0.9840075 :ORIGINAL-PRICE 1399.04)) 2007-03-02 closing=1387.17 change%=-1.1402752 cash=12389.992 assets=(#S(PURCHASE :AMOUNT 0.9840075 :ORIGINAL-PRICE 1399.04))
    3 KB (309 words) - 16:40, 6 February 2015
  • .../notes-on-haskell.blogspot.com/2007/02/whats-wrong-with-for-loop.html What's wrong with for loops] ...blogspot.com/2007/02/whats-wrong-with-for-loop-revisited.html More on what's wrong with for loops]
    2 KB (160 words) - 08:56, 16 April 2020
  • This month's editorial is an encouragement to join the [http://www.haskell.org/mailman/l ...y, for example c2hs, Knit, and other projects require C parsers, but there's no common code base. Since parsers are one of the killer features of Haskel
    2 KB (241 words) - 22:48, 25 March 2017
  • #redirect [[Wadler's Law]]
    61 bytes (8 words) - 12:43, 8 June 2023
  • #redirect [[Poor man's here document]]
    73 bytes (10 words) - 11:48, 8 June 2023
  • #REDIRECT [[Haskell Quiz/Knight's Travails]]
    79 bytes (10 words) - 06:56, 8 June 2023
  • #redirect [[Haskell Quiz/Knight's Travails]]
    79 bytes (10 words) - 06:31, 8 June 2023
  • #REDIRECT [[Xmonad/Config archive/leedo's xmonad.hs]]
    88 bytes (12 words) - 13:01, 8 June 2023
  • #redirect [[Xmonad/Config archive/Don's Config.hs]]
    86 bytes (12 words) - 04:31, 8 June 2023
  • #redirect [[Xmonad/Config archive/twifkak's Config.hs]]
    90 bytes (12 words) - 12:56, 8 June 2023
  • #redirect [[Xmonad/Config archive/Gwern's xmonad.hs]]
    88 bytes (12 words) - 13:01, 8 June 2023
  • ...mation about <code>cabal new-build</code>, the main entry point into Cabal's new Nix-style local builds facility. * Haskell at Work's [https://haskell-at-work.com/episodes/2018-05-13-introduction-to-cabal.html
    592 bytes (78 words) - 15:19, 6 February 2021
  • == What's in the platform ==
    2 KB (260 words) - 13:28, 21 January 2020
  • #redirect [[Xmonad/Config archive/David Roundy's Config.hs]]
    95 bytes (13 words) - 13:00, 8 June 2023
  • [http://hackage.haskell.org/package/lens Edward Kmett’s <code>lens</code> package]. ''“JQuery for Haskell values”.'' ...s.Setter] ||<code>over setter f s</code> ||<code>setter %~ f $ s</code> ||modify pure value
    5 KB (742 words) - 19:22, 22 May 2022
  • #redirect [[Xmonad/Config archive/Thomas ten Cate's xmonad.hs]]
    98 bytes (14 words) - 13:00, 8 June 2023
  • monadic <hask>do</hask>-block. Here's some quick examples: s <- foldM fn [] [1..n]
    986 bytes (142 words) - 15:18, 6 February 2021
  • revWorker s [] = s revWorker s (x:xs) = revWorker (x:s) xs
    2 KB (333 words) - 12:44, 4 June 2018
  • ...being used in the wild, and discuss lessons learned about working with GHC's plugin mechanism. HERMIT is being used to optimize SYB traversals, to fuse Stream Fusion's concatMap combinator, and to implement staged compilation within GHC to gen
    1 KB (174 words) - 06:36, 16 September 2013
  • echo ${cpu} | gdbar -s v -h 15 -sw 1 >> /tmp/.dzen2cpugraph echo ${cpu cpu1} | gdbar -s p -w 7 -nonl
    924 bytes (169 words) - 15:18, 6 February 2021
  • ...in xmonad from ghci's main thread is another option, which requires xmonad's code to be modified slightly:
    1 KB (163 words) - 20:37, 8 February 2015
  • end s = (last s == n) && (length s /= 1)
    1 KB (153 words) - 06:29, 31 July 2021
  • where search :: STArray s Vertex Bool -> [Vertex] -> ST s [Tree Vertex]
    4 KB (488 words) - 04:24, 5 April 2024
  • Here's how Haskellers responded to the following question in the Call for Particip * Any, but I'd especially like to help people improve docs if that's welcome.
    1 KB (145 words) - 18:33, 27 January 2017
  • *All of the guts of MapReduce are hidden in the monad's <hask>bind</hask> function a -> ([(s,a)] -> [(s',b)])
    6 KB (1,053 words) - 03:27, 9 April 2021

View (previous 50 | next 50) (20 | 50 | 100 | 250 | 500)