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/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
  • #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
  • ...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
  • ...to install diagrams of course cabal rejects the latest version. But here's where things go screwy: cabal then starts looking back in time to try to fi
    1 KB (207 words) - 15:18, 6 February 2021
  • ...ages.inf.ed.ac.uk/wadler/index.html#links Links] language and Steele et al's [http://lambda-the-ultimate.org/node/view/673 Fortress] language are effort ...patibility, exploring dark corners of [[GHC]], [[domain specific language]]s, and the [[Foreign Function Interface]].
    2 KB (239 words) - 22:47, 25 March 2017
  • * [[Bresenham's line drawing algorithm]]
    226 bytes (25 words) - 01:10, 26 April 2021
  • ...sed algebraic datatype|GADTs]]. One solution is to use [[existential type]]s. The example here is a solution to one of the exercises in Fun with [[phant compress (RPair s t) (x,y) = compress s x ++ compress t y
    8 KB (1,072 words) - 18:32, 16 January 2017
  • ...uncements regarding the provisional (as of Jan. 2012) Ireland Haskell User's Group will be posted here.
    247 bytes (34 words) - 15:19, 6 February 2021
  • , Run Com "uname" ["-s","-r"] "" 36000 , Run Date "%a %b %_d %Y %H:%M:%S" "date" 10
    1,023 bytes (104 words) - 15:18, 6 February 2021
  • This little piece of code computes an approximation of Riemann's zeta function, balancing the work to be done between N threads. zetaRange s (x,y) = [ fromIntegral n ** (-s) | n <- [x..y] ]
    4 KB (555 words) - 10:58, 22 June 2021
  • ...ne the greatest common divisor of two positive integer numbers. Use Euclid's algorithm. ...for ours. The function gcd' is a straightforward implementation of Euler's algorithm, and myGCD is just a wrapper that makes sure the arguments are po
    777 bytes (117 words) - 19:42, 18 January 2014
  • ...ent and return a result of that type". All universal quantifiers ("for all"s) must appear at the beginning of a type. ...e, even inside normal datatypes like lists or <tt>Maybe</tt>. The GHC User's Guide gives the following example:
    2 KB (347 words) - 11:46, 4 February 2023
  • This is intended as a beginner's tutorial for learning Haskell from a "Let's just solve things already!" point of view. The examples should
    6 KB (842 words) - 05:27, 8 February 2016
  • Since f is not a pure function, it's f :: x -> y -> m c. The correct form would be instance Idiomatic i f g => Idiomatic i (s -> f) (i s -> g) where
    2 KB (365 words) - 18:50, 19 September 2017
  • instance (MonadReader s m, Functor m) => MonadReader s (ListT m) where instance (MonadState s m, Functor m) => MonadState s (ListT m) where
    2 KB (402 words) - 06:31, 12 May 2015
  • ...conal/talk-2014-bayhac-denotational-design/blob/master/README.md this talk's README on GitHub].
    298 bytes (41 words) - 05:35, 23 May 2014
  • This has a problem however, that the [[constructor]]s of type ''Resistor'' are data S a = S a
    9 KB (1,351 words) - 18:21, 6 June 2020
  • ...e uncompilable). That page already has source for the bot anyway, so there's not much point in keeping this separate one.
    284 bytes (52 words) - 00:57, 17 June 2015
  • but when it's used in case expressions: Could the GHC example benefit from some more list-comprehension syntax? Let's borrow a new reserved word:
    6 KB (743 words) - 02:12, 5 August 2021
  • ...ight look like this: <hask>\x -> x + 1</hask>. (That backslash is Haskell's way of expressing a &lambda; and is supposed to look like a Lambda.) .../ foldr</hask>. So if I wanted to add one to each element of a list, here's one way to do it (without anonymous functions):
    2 KB (296 words) - 06:56, 12 April 2021
  • identifier s = identifier' s 'l' identifier' (c:s) t = (match c t) && or [identifier' s b | (a, b) <- fsm, a == t]
    2 KB (346 words) - 03:47, 10 January 2017
  • ...ve, however, is the ''wrong one'' for what we're trying to do here. So let's change the order of the arguments of the helper: Believe it or not, we're almost done! How is that? Let's parenthesize a bit for emphasis:
    5 KB (891 words) - 14:21, 3 January 2018
  • f :: s -> (a,s) f :: State s a
    4 KB (716 words) - 07:41, 26 January 2019
  • newtype DRMonad e s w a = DRMonad {runDRMonad :: s -> (Either e a,s,w)} instance (Monoid m, Error e) => Monad (DRMonad e s w) where
    6 KB (995 words) - 23:51, 16 April 2021
  • Here's a simple test for object orientation (for some reasonable definition): ...Haskell's <tt>[[Dynamic]]</tt>, where you only have to deal with <tt>B</tt>s that are instances of <tt>Typeable</tt>. But even with that, note that <tt>
    4 KB (587 words) - 11:16, 28 March 2018
  • ...GPU's. It's about unsupervised machine learning. Later: Convolutional RBM's. || Markus Liedl || BSD3 || https://github.com/haskell-munich/accelerate-rb
    3 KB (355 words) - 14:25, 30 May 2015
  • ...Moreover it is able to interface with third party EDA tools such as Altera's [http://www.model.com/ Modelsim] and [http://www.altera.com/products/softwa :David J. King and John O'Donnell's digital circuit simulator
    2 KB (333 words) - 11:47, 4 November 2014
  • The following is a list of previous documents and discussions about Haskell's module system: * Iavor S. Diatchki et al's formal specification of the Haskell 98 module system: http://purely-functio
    3 KB (368 words) - 22:21, 24 February 2016
  • ...fine, but alas not always. Perhaps this is a deficiency in GHC, but here's one way it can happen: What's going on? GHC knows, from the type signature that <tt>x::a</tt>. Then appl
    4 KB (716 words) - 11:30, 24 January 2016
  • ...sing from the ordering of external events to a functional language. Burton's technique uses abstract values contained in an (theoretically) infinite str ...d with <code>contents</code> to retrieve the abstract <code>Decision</code>s for use by <code>choice</code>:
    2 KB (341 words) - 09:18, 22 February 2022
  • | Holiday Inn Express, Penn's Landing | Holiday Inn Express, Penn's Landing
    1 KB (190 words) - 14:59, 21 October 2016
  • ...convert the problem to the equivalent problem for n > 0 by adding the list's length to n. | otherwise = let (f,s) = splitAt n xs in s ++ f
    3 KB (474 words) - 20:35, 23 May 2021
  • * <code>ST s a</code>, the type of encapsulated-state actions. The condition that an action's effects only occur if performed prevents their use in otherwise-ordinary Ha
    3 KB (428 words) - 04:08, 12 April 2024
  • For now we refer to Wikipedia's article about [http://en.wikipedia.org/wiki/Type_class type classes].
    322 bytes (46 words) - 10:06, 3 August 2015
  • As an illustration, let's take the function <haskell>div :: Int -> Int -> Int -- which is actually But there's more going on here than immediately meets the untrained eye. It could be a
    4 KB (669 words) - 02:17, 3 November 2023
  • Lazy Mom : Here's a credit card, Son. Just charge what you need. from myself. What's the use pretending I'm getting them from you?
    3 KB (445 words) - 15:19, 6 February 2021
  • toHTML s = MkHTML s fromHTML (MkHTML s) = s
    5 KB (887 words) - 06:53, 12 June 2023
  • ...hask> keyword with <hask>data</hask> and it'll still compile, indeed there's even a good chance your program will still work. The converse is not true, newtype State s a = State { runState :: s -> (s, a) }
    6 KB (1,007 words) - 15:57, 22 May 2016
  • ...utation of type <code>Cont r s</code>. That's a bit brain-twisting, so let's think about how we might do it... ...is going to receive a question <code>q</code> about a value of type <code>s</code>, and has to answer it somehow.
    7 KB (1,253 words) - 23:34, 25 June 2021
  • Let's untangle that, and then test the referentially transparent isolation. Let's use QuickCheck. First we need an Arbitrary instance for
    8 KB (1,214 words) - 00:46, 23 October 2017
  • = GHC's switch from darcs to git =
    571 bytes (77 words) - 18:50, 18 June 2014
  • Here's one to show it done in a fold just for the fun of it. Do note that it is le Here's one that does half as many compares:
    2 KB (320 words) - 00:08, 8 July 2019
  • Spare {frameScore=s} -> [[s-10]] Strike {frameScore=s,next=10} -> [[10],[s-20]]
    4 KB (555 words) - 15:19, 6 February 2021
  • ...S crew have made some good progress on creating a new target for GHC so it's doable at least. ...has proven that these can indeed be encoded with the current state of GHC's type features.
    2 KB (405 words) - 10:31, 9 February 2019
  • True, there's lot of right association, too, but bad enough. * Donald Bruce Stewart's [http://hackage.haskell.org/package/dlist difference list library]
    3 KB (421 words) - 16:40, 1 August 2018
  • Since there's already syntactic sugar for ranges, there's usually no reason to define a function like 'range' in Haskell. In fact, th
    1 KB (214 words) - 02:08, 5 April 2014
  • ...ad use the <code>at</code> function to construct <code>Located Trail</code>s.
    2 KB (297 words) - 06:13, 3 August 2013
  • There's lot of advocacy at [[ThingsToAvoid/Discussion]] which may be moved to here.
    322 bytes (47 words) - 03:29, 14 August 2021
  • 8 iunie 2007 S-a primit de la domnul conf M. Gontineac stirea despre continuarea unor cerc ...subiecte de pe fiecare bilet s-au referit la Haskell. Toti studentii care s-au prezentat la examen au trecut cu succes examenul.
    3 KB (399 words) - 14:50, 18 February 2015
  • ...an error message and make a note of the exception code. Look at Microsoft's [https://msdn.microsoft.com/en-us/library/cc704588.aspx NTSTATUS values pag ...[https://www.gnu.org/software/gdb/ GNU debugger] to see the debug message(s).
    1 KB (221 words) - 23:10, 28 January 2016
  • instance VarMonad (ST s) (STRef s) where ...
    1 KB (198 words) - 22:52, 21 July 2021
  • s
    853 bytes (146 words) - 04:26, 26 April 2021
  • Haskell's FFI is used to call functions from other languages (basically C at this poi ...] stuff. I could implement the whole tcgetattr / tcsetattr thing, but let's just turn ICANON on and off, so IO.getChar doesn't wait for a newline:
    2 KB (331 words) - 12:45, 17 February 2015
  • instance MonadState s (ExitT e (State s)) where instance Monad m => MonadState s (ExitT e (StateT s m)) where
    4 KB (707 words) - 09:43, 9 December 2014
  • ...ction in such as way as to feed the returned sum back into the parameter ''s'', and we will sneak the sum into the replaced tree! Example in ASCII art: 4 s
    10 KB (1,757 words) - 23:34, 24 July 2021
  • ...ain goal is to provide you with fully type-safe templates. It uses Haskell's quasi-quoting facilities so that everything is checked at compile time. Unl | s.clover@gmail.com
    1 KB (193 words) - 04:57, 26 April 2021
  • ...20100703013753/http://www.haskell.org/hdirect/user.html HaskellDirect user's manual] (HTML, in the Web Archive) :Describes HaskellDirect's features
    2 KB (253 words) - 18:19, 24 March 2015
  • Here's an example of a '''parameterized data type'''. isEmpty (StackImpl s) = null s
    5 KB (872 words) - 13:14, 2 September 2014
  • Oh like that's going to work. You'd be better off selling T-shirts that <oerjan> EvilTerran: no, it's for turning cotheorems into ffee.
    3 KB (561 words) - 02:55, 26 April 2021
  • == Rubik's Cube represented with faces == ...is a simple model for a [http://en.wikipedia.org/wiki/Rubik%27s_cube Rubik's Cube].
    8 KB (1,020 words) - 01:02, 23 September 2018
  • [toUpper c | c <- s] where <hask>s :: String</hask> is a string such as <hask>"Hello"</hask>.
    5 KB (679 words) - 17:14, 4 February 2023
  • ...ere was little accurate info on how to do multithreaded GUI in gtk2hs. It's trivial. Events are run within GTK's own thread. There is no need for extra precautions when running event code.
    4 KB (613 words) - 21:06, 7 October 2014
  • ...documentation below relates to ''using'' GHC. For documentation about GHC's internals and building GHC, head over to the [https://gitlab.haskell.org/gh ...rg/ghc/docs/latest/html/users_guide/index.html The User's Guide]: The User's Guide has all you need to know about using GHC: command line options, langu
    4 KB (626 words) - 14:08, 14 July 2020
  • ...gners to share assets. I tend to use SDL2 and 2D graphics, only because it's easier. You can also talk to the LambdaCube3D people and combine FRP and th ...ome to borrow (I only have one, you can bring your own if you want). There's online documentation and examples of how to use it.
    3 KB (578 words) - 15:24, 29 May 2015
  • return x = P $ \ s -> Just (x, s) P v >>= f = P $ \ s -> do
    7 KB (1,025 words) - 02:14, 23 July 2021
  • <hask>i</hask> is the type of the iteratee's input messages (or list elements) and <hask>o</hask> is a type of the outpu {- s = state -}
    6 KB (927 words) - 12:02, 19 April 2024
  • Frag is described in Mun's 2005 undergraduate thesis, ...3D Games]. An AI system for Frag is described in Jayatheeban Soundararajan's 2007 undergrad thesis, also titled [http://www.cse.unsw.edu.au/~pls/thesis/
    3 KB (386 words) - 11:31, 5 May 2017
  • perm n = foldr (\x xs -> [i : s | i <- [1..n], s <- xs, i `notElem` s]) [[]] [1..n]
    2 KB (287 words) - 03:50, 10 January 2017
  • Wadler's Law states that: Under these circumstances, Paul's ruling seems right: it is pointless
    4 KB (583 words) - 10:26, 26 December 2017
  • * <code>freeSTRef :: STRef s a -> ST s ()</code> ...ssives like <code>hClose</code> and <code>finalizeForeignPtr</code>...here's an idea: adapt the techniques used for those other types and values, so the
    3 KB (431 words) - 04:31, 9 June 2022
  • Let's untangle that, and then test the referentially transparent isolation. Let's use QuickCheck. First we need an Arbitrary instance for
    8 KB (1,186 words) - 20:49, 28 May 2021
  • <!-- atravers: Perhaps there's an archived version you can use to restore it? (Remember to add the "Humor"
    391 bytes (64 words) - 05:12, 24 April 2021
  • * In Simon Peyton Jones's [[Books|The implementation of functional programming languages]] (section 9 ...with their concept implementation for a ''single-use'' variant of Hancock's unique-name supply, where each one can only be used once, if at all - from
    11 KB (1,656 words) - 22:33, 4 July 2022
  • (**) Calculate Euler's totient function phi(m) (improved).
    373 bytes (58 words) - 19:46, 18 January 2014
  • ...you'd like to reuse that code for handling multiplication. But now, there's two definitions of Monoid Int! ...Revelation feature] of Modula-3 which causes similar problems like Haskell's type class instances
    3 KB (489 words) - 10:13, 31 May 2015
  • == Schönfinkel & Curry's amalgamation combinator, for Haskell == == Curry and Feys's paradoxical combinator, for Haskell ==
    4 KB (684 words) - 02:22, 18 May 2020
  • Here's how to do that. And that's it.
    1 KB (215 words) - 17:08, 27 June 2019
  • These functions can also be used for <hask>Integer</hask>s, Ok that's not possible, so just consider a <hask>State</hask> [[applicative functor]]
    3 KB (531 words) - 15:19, 6 February 2021
  • , Run Com "uname" ["-s","-r"] "" 36000 , Run Date "%a %b %_d %Y %H:%M:%S" "date" 10
    2 KB (189 words) - 01:17, 9 April 2021
  • ...new value. But GHC is able to efficiently manage garbage collection, so it's not uncommon to produce 1gb of data per second (most part of which will be Haskell's computation model is very different from that of conventional mutable langu
    3 KB (490 words) - 21:19, 21 November 2022
  • Who says functional programmers never have any fun? Here's some of the * HaskellWiki's [http://www.haskell.org/haskellwiki/QuotesPage QuotesPage]. E.g. a quotatio
    5 KB (667 words) - 22:52, 1 May 2024
  • ...arately-typecheckable packages on top of a weak module system like Haskell's. The design of Backpack is inspired by the MixML module calculus of Rossber ...U Backpack to Work: Towards Backpack in Practice] (video, NYC Haskell User's Group)
    2 KB (285 words) - 13:42, 16 March 2018
  • ...an an mzero, except the string argument; indeed, so far as I know <tt>fail s</tt> is just mzero for any MonadPlus. MonadPlus is also barely made use of ...e does satisfy Left Catch, but it seems almost like that's only because it's such a simple monad (holding only one value). It is a useful observation t
    4 KB (609 words) - 18:22, 23 June 2015
  • ...represent rational numbers exactly as the ratio of two <hask>Integer</hask>s. Applying <hask>toRational</hask> to an <hask>Integral</hask> number <hask
    564 bytes (84 words) - 08:48, 11 May 2015
  • ...kell-bin-i386-mac2.8.4-ghc6.10.4-0.11.1.2-0.dmg] (MacOS X, Intel, (Leopard's) pre-installed wxWidgets, ghc 6.10.4, updated)<br /> ...kell-bin-i386-mac2.8.4-ghc6.10.3-0.11.1.2-0.dmg] (MacOS X, Intel, (Leopard's) pre-installed wxWidgets, ghc 6.10.3, updated)<br />
    5 KB (640 words) - 18:31, 31 January 2016
  • ...ell.org (aka haskell.galois.com; aka monk) is in need of an OS upgrade. It's currently running Debian ''sarge''; the upgrade will be to ''etch'', the cu ## Rollback plan(s)
    3 KB (427 words) - 22:48, 23 April 2021
  • ...xK_Print), unsafeSpawn "import -quality 90 -descend png:$HOME/xwd-$(date +%s)$$.png") ...[[:blank:]]\\+/ /g' > $TMP && screen -S 'irssi' -X readbuf $TMP && screen -S 'irssi' -X paste .;rm $TMP")
    6 KB (615 words) - 23:47, 28 November 2018
  • together (w,s) = zip (siteCoords s) w solve' words (s:ss) = if null possWords
    5 KB (741 words) - 03:47, 10 January 2017
  • * [http://okmij.org/ftp/Haskell/HList-ext.pdf Haskell's overlooked object system] (PDF) -- Object oriented concepts in pure Haskell
    691 bytes (95 words) - 07:34, 7 March 2014
  • There's also a page [[Haskell Quiz/FizzBuzz]] with another solution.
    466 bytes (55 words) - 15:18, 6 February 2021
  • (a,s') <- liftM (randomR lohi) (readSTRef g) writeSTRef g s'
    5 KB (743 words) - 13:10, 9 May 2017
  • -- The implementation first checks if there's no more elements to select, -- if so, there's only one possible combination, the empty one,
    5 KB (659 words) - 19:40, 18 January 2014
  • ...esktop Environment Integration|basic desktop integration]], including ewmh's for taskbars and panels, gap toggling, and sensible desktop default key reb ...tp://braincrater.wordpress.com/2008/08/28/announcing-xmonad-light/ shepheb's xmonad-light], your package manager, or
    3 KB (451 words) - 12:13, 19 April 2021
  • (**) Goldbach's conjecture. Goldbach's conjecture says that every positive even number greater than 2 is the sum o
    1 KB (226 words) - 19:47, 18 January 2014
  • If you want a good configuration to start from, it's quite simple. ...a <code>composeAll</code> for the <code>manageHook</code>, or use Haskell's <code>do</code> notation for most other hooks.)
    3 KB (366 words) - 17:06, 11 January 2018
  • Usually, this is all that's required - rarely is there a subsequent need to annotate the types (fixed o Could a similar annotation be made available for ''uniqueness''? Let's borrow a small piece of [https://clean.cs.ru.nl/Clean Clean] syntax:
    3 KB (388 words) - 21:41, 16 August 2021
  • * it's a special file which seems to change anyway (e.g. terminal devices, named p ...the I/O of an ''action'' (<code>IO</code> computation) outside of Haskell's expression evaluation by moving it into the surrounding runtime system. The
    8 KB (1,215 words) - 07:10, 12 June 2023
  • ...ty list, and any Int. The 'any Int' part is fine, so we need to know if it's passed an empty list. Answering that question forces one step in the evalua Now it's clear that <code>getIt</code> has not been passed an empty list, since the
    4 KB (708 words) - 23:10, 19 April 2021
  • time is the most limited resource among the majority of users. It's good if you can configure a software in every respect. It's better if you
    5 KB (770 words) - 23:20, 11 July 2021
  • ...ing track of strings encoded as raw bytes stored in <hask>ByteString</hask>s. Using functions such as <hask>length</hask> on a Unicode string just work ...ns to encode and decode Unicode strings to and from <hask>ByteString</hask>s are provided together with <hask>Data.List</hask> like functions.
    5 KB (717 words) - 15:20, 6 February 2021
  • * <i>S</i>(<code>T</code>) is the set of <i>basic definitions</i> for <code>T</cod ...u :: T</code>) means <code>u</code> isn't used elsewhere by a member of <i>S</i>(<code>T</code>);
    13 KB (2,108 words) - 12:52, 1 January 2024
  • isPrime n = all ((/=0).mod n) $ 2:3:[x + i | x <- [6,12..s], i <- [-1,1]] where s = floor $ sqrt $ fromIntegral n
    3 KB (432 words) - 07:06, 11 May 2016
  • Using explicit [[type signature]]s is good style and [[GHC]] with option <code>-Wall</code> warns about missin runST :: (forall s . ST s a) -> a
    2 KB (267 words) - 15:18, 6 February 2021
  • ...'&amp;perp;' and in LaTeX as '\bot' (within math mode). In plain ASCII, it's often written as the extremely ugly character sequence '<code>_|_</code>'.
    2 KB (306 words) - 09:04, 16 June 2014
  • it's for short, script-like programs or large and demanding applications. * Learn about Haskell's compiler, interpreter, values, simple functions, and types
    3 KB (371 words) - 04:17, 14 August 2021
  • let s = head (head sel) v <- Model.listStoreGetValue list s
    2 KB (280 words) - 00:46, 9 April 2021
  • <i>For the moment, this proposal can be "emulated" using Haskell's type classes:</i> :instance Monomo (ST s a)
    3 KB (459 words) - 08:33, 18 August 2021
  • Clearly we want something like Maybe's <hask>(>>=)</hask> here to catch the Nothing, but instead of Maybe values a ...its result in MaybeIO then we just have to use runMaybeIO there, and that's it. What happens if we now have some "print" in between?
    5 KB (801 words) - 19:04, 8 February 2014
  • getDay s = getDay' $ words s
    2 KB (234 words) - 15:18, 6 February 2021
  • For ease of reference, here's their elegant solution: For completeness, here's the `dual':
    2 KB (240 words) - 23:49, 18 April 2021
  • ...and alignment processing -- see [http://malde.org/~ketil/biohaskell/ Ketil's bioinformatics] [http://www.ii.uib.no/~ketil/bioinformatics/ pages], and [h * [http://www.techfak.uni-bielefeld.de/ags/pi/ Robert Giegerich's group (AGPI) at Bielefeld University]
    2 KB (339 words) - 18:30, 6 December 2013
  • ...localhost. Latency would be too high to use it as a web app. That said, it's perfectly stuitable for implementing multi-user apps on a local network, se * ... not a JavaScript or HTML library. It's a GUI framework with a Haskell API and abstracts many aspects of the docume
    6 KB (786 words) - 00:53, 12 February 2022
  • *[[Arrow]]s *[[Functor]]s
    3 KB (282 words) - 18:02, 14 April 2024
  • Mark Shields and Simon Peyton Jones's [https://citeseerx.ist.psu.edu/viewdoc/download?doi=10.1.1.15.9282&rep=rep1 Because it has also [[Dependent type]]s, it can leverage them so that it is not forced to have a separate module la
    585 bytes (86 words) - 06:42, 10 August 2022
  • liftState :: (MonadState s m) => (s -> (a,s)) -> m a cumulative = scanl1 (\(x,q) (y,s) -> (y, s+q)) xs -- cumulative weights
    6 KB (894 words) - 13:41, 2 April 2019
  • <blockquote>It's important that this is NOT a newtype, so we can freely use the ...nym means we lose the <code>Functor</code> instance! Also, in the end, it's probably better that users do not need to know the underlying implementatio
    7 KB (1,077 words) - 14:56, 12 June 2014
  • As an example, <hask>map</hask> is polymorphic. It's type is simply
    692 bytes (112 words) - 20:01, 21 May 2017
  • ...been research into ''deterministic'' concurrency (e.g. Eleni Spiliopoulou's work with the Bristol Haskell system as described in his thesis [https://ci ...ions from the interface for the corresponding abstract data type. After it's used, an oracle remains constant - reusing it will not provide a "different
    4 KB (565 words) - 06:24, 12 June 2023
  • Use [http://en.wikipedia.org/wiki/Euclidean_algorithm Euclid's algorithm]. <div style="border-bottom:1px solid #eee">(**) Calculate Euler's totient function phi(m). <span style="float:right"><small>[[99 questions/So
    6 KB (805 words) - 02:30, 11 June 2023
  • ...d on [http://repetae.net/recent/out/classalias.html a page on John Meacham’s website]. data N = Z | S N
    9 KB (1,395 words) - 23:16, 24 July 2021
  • First let's specify the name of the module: ...; ''S2'' | ''( S )'' | if ''b'' then ''S1'' else ''S2'' | while ''b'' do ''S''
    11 KB (1,437 words) - 00:04, 1 September 2017
  • Lispers who love Haskell can be heard saying that Haskell is Lisp's missing [http://en.wikipedia.org/wiki/M-expression M-Expression] implementa ...binaries were available for Sparc systems running SunOS 4.1.2 and Sparc 10's (sun4m) running 4.1.3. In the last release, the full functionality of X win
    5 KB (799 words) - 16:55, 23 March 2021
  • It's Haskell with his child Hank; "My son, it's a wisp of the outside world." -
    5 KB (787 words) - 11:02, 26 December 2017
  • In formalizing this idea for programming languages, Søndergaard and Sestoft[[#notes|[2]]] conclude by saying informally, ...ator is referentially transparent if it preserves applicability of Leibniz’s law, or substitutivity of identity: the principle that any subexpression ca
    5 KB (774 words) - 10:59, 15 August 2023
  • * if a function's result changes, it is <b>only</b> because one or more of it's arguments has changed. * [[Merely monadic]] provides more information about Haskell's implementation of the monadic interface.
    4 KB (674 words) - 07:12, 12 June 2023
  • Wikipedia's [http://en.wikipedia.org/wiki/Computer_science Computer science]. Wikipedia's [http://en.wikipedia.org/wiki/Computability_theory Computability theory].
    3 KB (357 words) - 15:18, 6 February 2021
  • Here's the code for the whole unification function; you can probably remember each ...ost of the Prolog code from my talk and some comments to help explain what's going on and give you a few exercises to better understand logic programmin
    2 KB (410 words) - 11:26, 13 February 2019
  • sumStep s n = s * sumOnetoN (n `div` s) ...ximum [x | y<-[100..999], z<-[y..999], let x=y*z, let s=show x, s==reverse s]
    6 KB (881 words) - 02:31, 8 May 2016
  • details Jeff's use of profiling to solve the problems. ...ckled data structures via Data.Binary. The XML part is generated by HaXml's DtdToHaskell. On a 54M XML file, the thing swaps like crazy and takes seve
    7 KB (1,084 words) - 19:08, 3 February 2021
  • ...s love to read code. That's how we get a feel for what a language is. Here's a list of significant Haskell projects, by serious Haskell programmers, wit
    4 KB (536 words) - 00:28, 17 June 2021
  • The prompt can be colored by altering GHCi's <code>prompt</code> setting including [https://en.wikipedia.org/wiki/ANSI_e :set prompt "\ESC[34m\STX%s > \ESC[m\STX"
    3 KB (435 words) - 18:53, 22 January 2019
  • While its name might suggest otherwise, the <code>seq</code> function's purpose is to introduce ''strictness'' to a Haskell program. As indicated b ...guity is undesirable, which is why <code>pseq</code> also exists (but that's another story).
    4 KB (716 words) - 14:44, 8 January 2024
  • ...So, idea is that implementing com support on top of wxWidgets and Haskell's com support. ; Add new PowerShell's install and building script for Windows platform
    4 KB (687 words) - 14:54, 8 October 2015
  • This is easy to understand, but it's also quite slow, as it generates and tests N^N possible N-queen configurati If a list already contains two queens in a line, there's no point in considering all the possible ways of adding more queens.
    3 KB (451 words) - 17:56, 30 September 2019
  • Netwire's FRP framework is intended to be used for continuous applications. It repla Netwire's underlying abstraction is more powerful than the [http://conal.net/papers/i
    3 KB (433 words) - 21:39, 2 October 2014
  • A value of type: MList IO a represents a list of a's whose evaluation continually requires executing actions in IO.
    427 bytes (73 words) - 12:02, 19 April 2024
  • == Peter Braam's thoughts about HPC & Cloud Compute Frameworks == ...became the software and communication "standard", and more recently GPGPU's (which have CUDA and OpenCL) and other accelerators (FPGA boards are seeing
    6 KB (959 words) - 08:48, 10 August 2022
  • ''Remark that [[GHC]]'s type errors are not always in the right places should go here''
    456 bytes (63 words) - 15:19, 6 February 2021
  • The agreement precondition ensures unamb's referential transparency. See also the [[lub]] package, which extends unamb's usefulness with non-flat types.
    2 KB (356 words) - 21:36, 4 February 2014
  • Somewhat related is Lennart Augustsson's tool Hallgren's 2001 paper
    8 KB (1,365 words) - 19:23, 15 August 2019
  • ST s α ...they return a value of type <code>α</code>, and execute in "thread" <code>s</code>. All reference types are tagged with the thread, so that actions can
    5 KB (802 words) - 05:38, 4 August 2021
  • ! Identifier(s) ! Identifier(s)
    2 KB (285 words) - 01:34, 14 July 2021
  • ...#24 you don't need to generate all the lexicographic permutations by Knuth's method or any other. -- The "x"s are different numbers
    8 KB (1,054 words) - 15:53, 11 October 2015
  • ...write two functions: <code>multiplate</code> and <code>mkPlate</code>. Let's define each of these functions in turn. That's it. Now we are ready to use out generic library to process our mutually rec
    7 KB (1,049 words) - 07:41, 3 March 2022
  • ...mes, when writing programs, we tend to use lots of polymorphic types. That's good! We can reuse those pieces, thanks to the types. But it can be difficu ...even say <tt>undefined</tt> is just a really crappy, useless hole!) But it's special in that when GHC encounters a hole during compilation it will tell
    9 KB (1,711 words) - 20:19, 31 August 2014
  • ...e>) for the signal function. If the second component of <code>sense</code>'s return value is <code>Nothing</code> then the previous sample is used again ...put sample previously provided by <code>sense</code>. <code>actuate</code>'s job now is to process the output (e.g. render a collection of objects conta
    5 KB (780 words) - 11:40, 6 June 2016
  • ...ell-style-guide/blob/master/haskell-style.md Coding style guidelines]. It's not worth being super picky about these, but in general they are quite good * byorgey's time spent hacking on diagrams:
    3 KB (338 words) - 19:39, 16 October 2016
  • '''Note''': Piq is not ready for use yet. It's waiting for [[Reactive]] to get into better shape.
    835 bytes (127 words) - 03:18, 9 April 2021
  • ...tp://www.haskell.org/pipermail/haskell-cafe/2010-December/087782.html What's the motivation for η rules?]
    835 bytes (120 words) - 18:06, 15 February 2021
  • There are special cases for converting from <hask>Integer</hask>s: as well as for converting to <hask>Integer</hask>s:
    6 KB (867 words) - 01:28, 14 April 2016
  • ...l.org/package/transformers transformers] package. You may wish to check it's the same, so you can just delete it. ...rwise you need to generalize your instance to <hask>StateT</hask>. If that's not possible, you may need to introduce a <hask>newtype</hask>.
    2 KB (374 words) - 00:43, 9 April 2021
  • ...dea of what it would look like to apply genetic programming to chess. Here's a non-technical overview I wrote a few months ago, sketching out some of my .... To be a little more technical about it than I was in that overview, here's some more haskell-ish ideas.
    5 KB (819 words) - 01:04, 9 April 2021
  • * Adapter -- Allows adapting an existing widget's model (with a Data.Accessor), image or size. To implement focus delegation, widgets simply merge the child widget's event map with their own event map however they see fit.
    4 KB (663 words) - 08:07, 23 May 2021
  • 6) <s>Cabalized Library distribution.</s> a) Should probably be split according to which type system(s)
    5 KB (664 words) - 05:48, 12 July 2021
  • ...mon file types for .lhs/.hs files will be known, and that the Haskell tool's handlers ("Open in Tool", "Edit with Tool", ..) will be available via the r ...the existing ones. But users need a chance to say no, and if they do, that's it.
    6 KB (1,025 words) - 20:14, 9 December 2020
  • In conclusion, let's finally develop a program that does something useful. As another "classical ...ities. Another (<code>dispmb</code>) will be used to update the calculator's display element.
    6 KB (908 words) - 15:18, 6 February 2021
  • $ pacman -S xmonad-contrib # for the xmonad core and contrib packages $ pacman -S xmonad # for just the xmonad core package
    5 KB (613 words) - 20:56, 22 November 2016
  • * It's a bit slooow.. ...to the type graph. We'd likely get a big improvement by only loading what's needed for each particular program. [http://code.google.com/p/disciple/issu
    2 KB (394 words) - 11:57, 19 April 2021
  • Terminology is a little confusing. There's a few different things floating around: But what is a failure? It's any time that something does not succeed. Of course, this depends on your d
    6 KB (961 words) - 12:45, 12 August 2019
  • Scoped Type Variables are an extension to Haskell's type system that allow free type variables to be re-used in the scope of a ida :: a -> a -- This refers to a in the function's type signature
    3 KB (435 words) - 22:56, 12 June 2021
  • -- Knight's tours on an nxn board ending at the given square -- Closed knight's tours on an nxn board
    3 KB (449 words) - 03:45, 10 January 2017
  • ...y (along with development headers) installed through your operating system's package manager or otherwise. After that, it should ''ideally'' be enough t ...ere are instructions] for installing gtk2hs on Windows. Note that Haskell's gtk package requires gtk+-2.x, not 3.x. gtk+-2.24 is the most recent in th
    3 KB (511 words) - 01:45, 19 April 2015
  • : A locked mutable variable that can be shared across Haskell threads. MVar's can be full or empty. When reading an empty MVar, the reading thread block == S-Z ==
    4 KB (637 words) - 02:02, 6 May 2024
  • Let's walk our way through an simple example as I explain how you work with these ...splayed in the window. But before I explain <hask>FrameBuffer</hask>s, let's jump to the start of the graphics pipeline instead.
    11 KB (1,451 words) - 08:50, 19 April 2014
  • toSettingsH (Filter s:fs) i = toSettingsH fs (i { filter = s }) toSettingsH (DateFormat s:fs) i = toSettingsH fs (i { dateFormat = i= })
    10 KB (1,542 words) - 05:40, 8 June 2023
  • ...ce.html Data.Sequence] is recommended as an efficient alternative to [list]s, But many interesting <hask>Foldable</hask>s are also <hask>Functor</hask>s.
    11 KB (1,895 words) - 19:00, 18 May 2020
  • Sven Panne's GetOpt module does a fine job at parsing command line options. It but rather how supplied options influence program's behaviour, how error
    8 KB (1,082 words) - 23:30, 3 December 2020
  • ...or new users, but applied to the XMonad Contrib. Mainly because I think it's very difficult for newcomers to discover what extra features XMonad provide ...b/XMonad-Hooks-DynamicLog.html#v%3AdynamicLogWithPP DynamicLogWithPP] that's a DynamicLog with a Pretty Printer. The DynamicLog contrib module ships wit
    7 KB (1,099 words) - 15:18, 6 February 2021
  • ...y the <hask>Show</hask> class is so damn weird...) Even so, I wonder if it's more efficient to join strings or use real I/O... [[User:MathematicalOrchid ...hs has some image handling routines. for pure image format libraries there's unfortunately a little less :(
    6 KB (915 words) - 06:17, 23 July 2020
  • and, similarly, S is similar to the combinator data Term = K | S | Term :@ Term
    8 KB (1,374 words) - 14:33, 15 December 2022
  • ...(presumably), more flexible, and we're more likely to maintain it since it's in a language we prefer and are more used to.
    4 KB (592 words) - 08:43, 1 September 2022
  • .... The monad <code>State s a</code> is only a type synonym for <code>StateT s Identity a</code>. Thus both <code>State</code> and <code>StateT</code> can
    4 KB (589 words) - 19:37, 17 June 2018
  • ...s to polymorphism in Java, which is confusingly called "generics". Haskell's polymorphism can often be erased at compile-time, similar to Java where the ...lementation is necessary, similarly to <hask>Show</hask>, for instance. It's described in a [[GHC.Generics|separate wiki page]].
    4 KB (598 words) - 02:44, 13 February 2021
  • ...own monadic type that is a restricted subset of <code>IO</code>). But it's a lot more complicated than that... == Verifying safety: lambdabot's approach ==
    5 KB (830 words) - 12:41, 22 June 2021
  • This is good for ''very narrow ranges'' as Q.31's <code>isPrime</code> tests numbers by ''trial division'' using (up to<math> ...http://www.haskell.org/haskellwiki/99_questions/Solutions/31 31st question's solution] (instead of the above sieve of Turner), adjusted to start its mul
    5 KB (696 words) - 19:46, 18 January 2014
  • * <s>magic</s> <s>omnimiscent</s> [http://www.softpanorama.org/SE/quotes.shtml idiot-proof]. ...unsafe feature, the purpose is to use it to implement a safe API - if that's the case, all you have to do is add <code>Trustworthy</code> to your langua
    3 KB (471 words) - 03:00, 5 August 2021
  • * [http://coldwa.st/e/blog/2017-09-09-Cabal-2-0.html What's new in Cabal/cabal-install 2.0 — improved new-build, Backpack, foreign li ...ownloads.haskell.org/~ghc/latest/docs/html/users_guide/index.html GHC User’s Guide]
    1 KB (182 words) - 20:19, 19 March 2018
  • ...the target list length is > (orig list / 2). Here's another solution that's efficient in the other way (target < (orig list / 2)) by constructing an ac
    4 KB (666 words) - 13:03, 10 May 2014
  • Bertram's with a couple of refactors, a small let binding by Don, a new IO $ \s ->
    22 KB (3,539 words) - 00:49, 14 December 2016
  • % ghc-6.8.2 -S Foo.hc
    779 bytes (123 words) - 15:18, 6 February 2021
  • ...ctor with a <math>1</math> as its <math>n</math>th entry and <math>0</math>s everywhere else. For example, ...f the matrix, as I claimed. It's also not too hard to see that the matrix's action on any other vector is completely determined by linearity. Finally,
    14 KB (2,245 words) - 03:01, 11 April 2015
  • ...and allows the calculation of quantities of physical interest. So far, it's mainly electromagnetic theory. | A brief account of a biologist's very pleasant experience with STM and Snap, for processing brain data and g
    2 KB (335 words) - 15:02, 5 April 2014
  • In his "Filmgoer's Companion", Mr. Leslie Halliwell helpfully lists four of the cinema's greatest moments which you should get to see if at all
    8 KB (1,343 words) - 09:02, 13 March 2016
  • These three record types make up the core of xmonad's state and configuration: * A value of type <hask>XState</hask> stores xmonad's mutable runtime state, consisting of the list of workspaces, a set of mappe
    13 KB (2,057 words) - 10:15, 28 September 2017
  • ...hask>, [[Storable Vector|StorableVector.Lazy a]], <hask>(StateT s Maybe a, s)</hask> (like {{HackagePackage|id=stream-fusion}})
    3 KB (353 words) - 23:01, 29 April 2014
  • # The ways/base3.nix file let's you override and # In this example it's used to remove base >= 4 from the
    5 KB (726 words) - 10:39, 5 January 2018
  • move d0,s let s = z-(x+y)
    2 KB (378 words) - 23:58, 5 April 2021
  • ..., and casual games. In fact, I'm fairly comfortable saying that CodeWorld's collaboration API is the easiest way to build multi-player games in Haskell ...to jump in''' and work on more fundamental changes to CodeWorld, then here's a list of tasks of reasonable scope for a weekend.
    4 KB (593 words) - 01:45, 27 March 2017
  • -- The s argument is the string to output, and the c argument is putLine s mbb c = getHTMLDocument $ \doc ->
    4 KB (559 words) - 15:17, 6 February 2021
  • ...ion of [http://en.wikipedia.org/wiki/Floyd's_cycle-finding_algorithm Floyd's cycle-finding algorithm] for finding cycles in lists.
    950 bytes (133 words) - 00:39, 5 February 2019
  • ...on] with [[Roles]]. Will "probably be fixed in the future", but for now it's off the table. ...k in 7.10.) To make 7.10 not complain about the then unrecognized flag, it's best to specify it in a CPP block,
    10 KB (1,557 words) - 11:46, 24 October 2015
  • ...details-on-f-computation-expressions-aka-monadic-or-workflow-syntax.aspxF#'s monadic syntax] * [http://www.acooke.org/cute/ErlangsSyn0.html Small comparison of Erlang's syntactic difficulties]
    13 KB (1,443 words) - 23:42, 13 October 2019
  • ...-XUndecidableInstances</hask> to allow this instance declaration, but that's fair enough. GHC's "newtype deriving mechanism" (see [http://www.haskell.org/ghc/dist/current/
    5 KB (755 words) - 22:49, 12 June 2021
  • Aparut prin eforturile grupului Ro/Haskell volumul s-a dovedit o alegere inspirata fiind inca din primele luni de folos. S-a incheiat setul de laboratoare de programare functionala si grafica in HOp
    2 KB (347 words) - 18:33, 24 July 2013
  • Image:byorgey-config.png|Byorgey's dzen ...5073140/http://www.webframp.com/2009/01/06/xmonad-layout-gallery/ webframp's xmonad layout gallery] (archived; original page [http://www.webframp.com/20
    13 KB (1,464 words) - 02:28, 20 October 2014
  • It's frustrating to study about leak when the examples given no longer leak for
    1 KB (168 words) - 06:46, 4 February 2015
  • -- more times the maximum residency)", as per GHC User's Guide: io s n t = printf "%s of depth %d\t check: %d\n" s n t
    6 KB (1,055 words) - 23:27, 18 April 2020
  • newtype StateT s m a :: * -> (* -> *) -> * -> * ...>. GHC introduces another inhabited kind, <TT>#</TT>, for [[unlifted type]]s.
    2 KB (234 words) - 19:05, 28 September 2017
  • ...pecific, it's IO that's impure. That makes the IO monad impure. But that's not a general property of monads - just IO. And even then, we can pretend t ...ly possible to abstract away explicit state passing by using a Monad, that's not what a monad is. Some examples for monads that are not about state: Ide
    6 KB (1,032 words) - 16:45, 2 December 2020
  • ...instances are really more natural than the other, so we use the [[newtype]]s <tt>Sum n</tt> and <tt>Product n</tt> to distinguish between them: ...orementioned [[Foldable]], or the [[Writer monad]], or some [[Applicative]]s). But for a rather striking example of what Monoid can do alone, you can lo
    7 KB (1,101 words) - 02:30, 27 December 2019
  • ...sely on Perl's DBI interface, though it has also been influenced by Python's DB-API v2, JDBC in Java, and HSQL in Haskell. Supports SQLite3, PostgreSQL, ...th the [http://www.haskell.org/haskellDB original version from Daan Leijen's] HaskellDB and the [https://github.com/m4dc4p/haskelldb HaskellDB more up-t
    5 KB (634 words) - 11:56, 17 July 2021
  • ...ant to work on one of these, put your name in the block so we know someone's working on it. Then, change n in your block to the appropriate problem numb <div style="border-bottom:1px solid #eee">(**) Knight's tour. <span style="float:right"><small>[[99 questions/Solutions/91|Solution
    6 KB (802 words) - 06:27, 11 June 2023
  • functional dependencies and overlapping instances, and that's what instance ShowPred Bool HTrue -- the same as Show's
    10 KB (1,575 words) - 13:27, 14 January 2015
  • % leaves(T,S) :- S is the list of all leaves of the binary tree T % internals(T,S) :- S is the list of internal nodes of the binary tree T.
    12 KB (1,696 words) - 05:35, 11 June 2023
  • ...space leak, because both components must be fully evaluated to <tt>Int</tt>s when the constructor is built. GHC's strictness analyser will detect that f is strict in its argument, and compi
    5 KB (782 words) - 16:41, 4 February 2023
  • [[GHC]] runs flawlessly under Wine. Here's a guide on how to get it working. First, get the latest stable version of Wine from your distribution's repository, or from http://www.winehq.com/site/download.
    4 KB (574 words) - 07:28, 13 October 2014
  • ...information as they build it. If <hask>map</hask> is applied to a list who's size is known, the size of the result is known. (Interestingly, if it isn't Especially when it's infinite. See [[Things to avoid]] for why you should try to avoid calling <
    3 KB (587 words) - 15:19, 6 February 2021
  • Let's start with an example. Suppose that we want to make the following program m printf (__ "Hello, %s, how are you?") name
    10 KB (1,489 words) - 15:02, 26 October 2016
  • ...the [http://www.haskell.org/haddock/ Haddock]-generated documentation (it's all in the source code, of course, but may be nicer to read this way). XMo Without further ado, let's begin!
    3 KB (531 words) - 09:09, 15 August 2017
  • ...). This query currently returns 28 results, and all what is needed for one's package to appear there is to make the package directory (darcs repo) be vi querySearchEngine :: SearchEngine s => s -- search engine request
    4 KB (666 words) - 22:21, 23 April 2021
  • * A brief mention appears in Conor McBride's representation of general recursion for use with total functional languages ...Mikael Rittri and Dan Synek show how ''pseudodata'' can make Peter Hancock's <tt>name_supply</tt> viable for regular use. A small implementation by Iavo
    6 KB (809 words) - 07:56, 12 June 2023
  • ...tor]]s, each of which has a list of [[type variable]]s or [[type constant]]s. At the end, there is an optional <code>deriving</code>. Let's look at some examples. The Haskell standard data type [[Maybe]] is typical
    7 KB (1,016 words) - 15:20, 6 February 2021
  • -- take a container full of a's, to each, apply f, How about join? Well, let's have a look at the types.
    18 KB (3,270 words) - 05:36, 9 March 2021
  • ...ld each logic function from scratch; they could be shortened using Haskell's builtin equivalents: The table function in Lisp supposedly uses Lisp's symbol handling to substitute variables on the fly in the expression. I cho
    4 KB (655 words) - 07:48, 27 April 2016
  • ...table installing unsupported gnome components outside your package manager's control. Unfortunately, so far as I know they must be installed to location ...et on another host and simply install it on the small device, however that's outside the scope of this discussion.
    6 KB (1,036 words) - 10:20, 20 April 2021
  • show (OK s) = s show (Warning s) = "Warning: " ++ s
    8 KB (1,303 words) - 15:42, 18 November 2019
  • == András Kovács - A tour of GHC 8 features == ...codebases. Then we will look into our extensive use of QuickCheck, how it's used and what we learned.
    4 KB (673 words) - 05:44, 26 October 2016
  • the representation(s) data type(s) to be defined in the library and From what I've seen, Ralf's "Fun with phantom
    5 KB (859 words) - 10:10, 20 April 2021
  • ...the ''same'' <hask>Int</hask> every time we call it, but the type says it's supposed to be fresh! The problem here is that <hask>x</hask> was free in o ...e inferred types easier to read, DDC names the closure terms in a function's type after the free variables that gave rise to those terms. The user is fr
    3 KB (472 words) - 04:20, 8 June 2023
  • Moreover, it's often not clear if two programs which supposedly have the same functionalit ..., and multi-language memory management can be complex and error-prone. It's usually better to stick to Haskell if possible.
    10 KB (1,392 words) - 21:39, 26 August 2018
  • ...ven we've explicitly asked for the identifiers from specific modules there's no reason for the compiler to assume we might want them from the Prelude or ...with a large number of imports and contributors. At least with a pragma it's opt-in, and easy to change if a project later decides the redundancy is use
    9 KB (1,515 words) - 23:39, 23 October 2014
  • ...rocessors and scratchpad memories. The backend currently supports Adapteva's Epiphany many-core accelerator chip. However, the implementation of the com ...started off as a copy/paste of the hspec-discover but now has come into it's own. It has the possibility to be a general purpose test runner with some w
    5 KB (679 words) - 14:07, 5 August 2016
  • ...de</hask>. <hask>Tip</hask> is a constructor that groups no value, i.e, it's a nullary constructor. There is only one value, conveniently denoted <hask> ...hose data are its parameters. The first one has type <hask>a</hask>, so it's just a value of the parameter type <hask>a</hask>. This one is the value th
    6 KB (1,060 words) - 16:51, 18 June 2021
  • * By using HAppS's state management, you are committing yourself to keeping your entire state Prevayler' s architecture is illustrated in the diagram shown here. Prevayler [1] serves
    4 KB (517 words) - 05:52, 8 June 2023
  • data NatF a = S a | Z deriving (Eq,Show) fmap f (S z) = S (f z)
    9 KB (1,367 words) - 09:34, 17 November 2022
  • of xmonad's state. Let's take a look at the definition of the ...epresent, so let's talk about them first, so we have a better idea of what's going on when they keep coming up later.
    16 KB (2,690 words) - 16:02, 26 December 2022
  • let s = nameBase nm in case dropWhile (/=':') s of
    6 KB (836 words) - 19:46, 28 December 2013
  • As a beginner, you probably used Haskell's lazy I/O through the <code>System.IO</code> module. However, while it is go ...ell.org/package/liboleg liboleg] : An evolving collection of Oleg Kiselyov's Haskell modules (depends on the package unix and will therefore not compile
    4 KB (653 words) - 12:02, 19 April 2024
  • parseInt s = case reads s of
    7 KB (1,079 words) - 08:57, 23 May 2021
  • ==S==
    8 KB (1,251 words) - 05:43, 1 September 2022
  • ...al nodes come first, the leaves come second, and empty successors (the nil's which are not really nodes!) come last.... ...every node X with address A the following property holds: The address of X's left and right successors are 2*A and 2*A+1, respectively, if they exist. T
    9 KB (727 words) - 03:41, 10 January 2017
  • Let's define a really simple arrow type as an example, based on a function mappin Now let's define some operations that are generic to all arrow types:
    8 KB (1,315 words) - 07:54, 14 May 2024
  • | an action, merely ''returning'' the argument's value. ...implementation calling <code>main</code>, according to the implementation's private definition of the abstract <code>IO</code> type.
    6 KB (988 words) - 04:35, 16 March 2021
  • Both Swiestra's article (mentioned above) and the Essential Haskell Compiler Project tool ( * (Reader, Writer, State) [[monad]]s,
    4 KB (598 words) - 07:06, 26 January 2018
  • ...ruct a list hc(S,C) terms, where C is the Huffman code word for the symbol S. In our example, the result could be Hs = [hc(a,'0'), hc(b,'101'), hc(c,'10 Another short solution that's relatively easy to understand (I'll be back to comment later):
    5 KB (738 words) - 19:53, 18 January 2014
  • PS: There's gonna be a few welcome beers for the early birds ;-)
    3 KB (465 words) - 21:17, 27 May 2015
  • Here's a concise alternative: And here's an improved version of the previous algorithm, which is slightly more verbo
    3 KB (485 words) - 19:45, 18 January 2014
  • ...edia article on [http://en.wikipedia.org/wiki/Chaitin%27s_constant Chaitin's construction], referring to e.g. ...one for example in Section 4.1 of [https://tromp.github.io/cl/LC.pdf Tromp's paper].
    10 KB (1,527 words) - 09:31, 24 April 2024
  • ...cord_concatenation_for Typing record concatenation for free] on Erik Knoop's page ...s reading also paper on the [http://www.haskell.org/haskellDB/ Daan Leijen's original HaskellDB] page (see [http://www.haskell.org/haskellDB/doc.html Do
    6 KB (770 words) - 05:26, 10 December 2020
  • ...markup types we don't have to pay the cost of 'String' and let GHC use it's efficient, internal string types.
    1,000 bytes (161 words) - 18:06, 15 April 2018
  • .../hask>, can be made from <hask>f a</hask> by transforming all of its value(s), whilst leaving the structure of <hask>f</hask> itself unmodified.
    3 KB (603 words) - 22:50, 8 November 2021
  • Revise the package's API and prepare the 2.0 version. ...o <hask>IntMap</hask>s, <hask>HashMap</hask>s, and general <hask>Map</hask>s.
    10 KB (1,601 words) - 10:27, 27 October 2014
  • <math>\forall x : S \Rightarrow T</math> <math>\mathbf G\;S\;(\lambda x . T)</math>
    6 KB (884 words) - 16:00, 19 April 2021
  • Now a Haskell get together(s) anywhere in the USA with at least one in Portland, OR. ...- Raleigh, North Carolina. Will travel some, can stay somewhere overnight(s). Week of Oct 13-20 is not doable.
    3 KB (403 words) - 15:19, 6 February 2021
  • [testBit n k | k <- let s = bitSize n in [s-1,s-2..0]] The Fibonacci numbers can be computed in constant time using Binet's formula.
    8 KB (1,150 words) - 15:41, 5 July 2022
  • HacFreiburg is Freiburg's Haskell Hackathon, where Haskell programmers from all around the world meet ...ell's power baffling and unapproachable. The talk will provide an outsider's view on a small but realistic project, highlight the pitfalls dealing with
    7 KB (1,040 words) - 11:33, 4 August 2017
  • ...ojects into an AST with static semantics, and a token stream. Programatica's token stream contains layout and comments together with position informatio ...te monad. The first layer being Programatica's parser monad, and then HaRe's own state monad underneath. The reason for this is to plumb the token strea
    4 KB (645 words) - 12:53, 4 August 2014
  • probably was "Hello, world!", so let's do that: Let's do something fun. In Haskell, your first true program is the
    5 KB (786 words) - 22:17, 16 December 2020
  • Let's have a look at a small example: ...putations carry state of a certain type and can access it at any time. It's called ''StateT'', just like in other transformer libraries, but this one h
    12 KB (2,067 words) - 05:43, 9 March 2021
  • It's now easy to see that monad composition is an associative operator with left If we re-write the laws using Haskell's <code>do</code>-notation:
    5 KB (788 words) - 10:40, 1 February 2024
  • ...ant to work on one of these, put your name in the block so we know someone's working on it. Then, change n in your block to the appropriate problem numb arc(s,u).
    11 KB (1,679 words) - 06:20, 11 June 2023
  • * Wikipedia's [https://en.wikipedia.org/wiki/Functor Functor] article * nlab's [https://ncatlab.org/nlab/show/functor functor] and [https://ncatlab.org/nl
    3 KB (543 words) - 01:17, 16 April 2019
  • -- if it's false, so is the result This function only evaluates the first parameter, because that's all that is needed. Even if the first parameter ''is'' true, you don't need
    3 KB (450 words) - 20:07, 19 October 2020
  • There's an interesting Haskell package on [http://hackage.haskell.org/ Hackage] you
    1 KB (169 words) - 10:06, 10 March 2021
  • * [http://bikeshed.com/ Avoid bikesheds (related to Wadler's Law of Language Design)]
    2 KB (273 words) - 11:17, 11 April 2016
  • ...c vs. R2Ish vs. R2Ish). The (R2Ish v) constraints change to (ScalarIsh (V s)) constraints. But writing them over and over again is boring, so we define * So now I'm thinking it's possible and useful to just always use V2. In particular, I can't write the
    10 KB (1,671 words) - 03:59, 16 August 2014
  • We're going to utilise Xfce's Session Manager to make sure that xfwm4 (Xfce's default WM) is no longer started. Preferably, it'd be nice if we could hav ...in some cases specific applications have their own settings directory), it's easier to backup the whole thing.
    11 KB (1,742 words) - 10:28, 28 October 2013
  • It's always a design question, whether to provide default implementions of metho
    2 KB (254 words) - 21:39, 19 September 2016
  • ...ll.org/platform/ the Haskell Platform]. You will need to add cabal-install's executable directory to your %PATH% (it will tell you which path to add in You must add cabal's executable directory to your $PATH next. By default, this directory is $HOM
    11 KB (1,699 words) - 01:39, 13 December 2017
  • or just <code>M-x customize-group haskell</code> and it's in there.
    1 KB (170 words) - 18:23, 11 April 2016
  • ...the above trick, but it is different from <hask>StateT s IO a == s -> IO (s, a)</hask>. The latter is more useful in some situations, and it is not a c
    8 KB (1,326 words) - 08:20, 31 March 2022
  • Let's say we have a type class called "Throws":
    1 KB (215 words) - 10:06, 3 August 2015
  • Here's a simple example. Let's try to write a slightly more helper function that reads two lines
    14 KB (2,254 words) - 20:41, 10 November 2020
  • If the number of [[type]]s to cover is fixed, then the problem can be you need to do) in the list. Beware: there is no safe downcasting (that's what
    5 KB (863 words) - 11:44, 22 August 2021
  • ...ruct a list hc(S,C) terms, where C is the Huffman code word for the symbol S. In our example, the result could be Hs = [hc(a,'0'), hc(b,'101'), hc(c,'10
    5 KB (798 words) - 02:38, 11 June 2023
  • = <s>Discussion about Local Haskell Clubs</s> = sometimes to catch people's interest about Haskell. Maybe experienced
    8 KB (1,190 words) - 12:03, 24 July 2016
  • ...re no leap seconds or timezones. You can compare two <tt>AbsoluteTime</tt>s directly to determine which one came first. You can reference time as far i ...uration of time measured in seconds. Subtracting two <tt>AbsoluteTime</tt>s with <tt>diffAbsoluteTime</tt> will produce a <tt>DiffTime</tt> and you can
    11 KB (1,837 words) - 06:28, 8 October 2022
  • * There should be an annotation to include a function's entire definition in the documentation. This would be useful for functions
    1 KB (212 words) - 19:11, 14 March 2014
  • ...ion is for the Armo project, using Bluespec HDL to radically improve Nokia's ability to develop advanced SOCs and corresponding software for future mobi ...year old group of 16 researchers located in Cambridge, Massachusetts. NRCC's charter is to renew Nokia via open innovation, in particular via joint rese
    3 KB (383 words) - 11:37, 8 June 2023
  • * Follows Apple's Guidelines for file system layout files. These are packaged using Apple's framework, versioning, and bundling
    6 KB (862 words) - 05:34, 6 August 2014
  • ...Sorts not only integers but anything that can be compared. But granted, it's not in-place. ...rage again, this time with a type signature. Looks a bit strange, but that's the spicey ''currying''. In fact, <hask>average</hask> is a function that t
    6 KB (1,024 words) - 23:56, 25 June 2021
  • Using the [[List Monad]] it's possible to rig up a basic logic program, where the bulk of the code simply == Verify the child's statement ==
    14 KB (2,307 words) - 12:23, 31 July 2014
  • ...w.haskell.org/ghc/docs/latest/html/users_guide/lang-parallel.html GHC User's guide for parallel programming]
    3 KB (296 words) - 15:06, 25 June 2017
  • ...ee</code>s) are created from the bottom (leaves) up, but <code>DTree</code>s transform) in its subtree. Brent's elegant solution was twofold:
    8 KB (1,340 words) - 13:19, 29 March 2014
  • ...ds, libraries and applications for verifying the correctness of a web site's behaviour.
    2 KB (207 words) - 00:35, 17 January 2017
  • ...the pros and cons of functional or object-oriented programming. Rather, it's a guide for a new Haskell programmer coming from languages like Java, C#/.N ...mutable state then you can't ''guarantee'' referential transparency. That's the big deal with Haskell: no mutable state means you ''can'' guarantee ref
    10 KB (1,718 words) - 07:14, 10 August 2022
  • ld: symbol(s) not found ...haskell.org/package/Sprig Sprig], a foreign Binding to Jonny D's SDL Primitives Generator (SPriG) library
    7 KB (1,003 words) - 23:19, 5 April 2021
  • ...www.cs.tufts.edu/comp/150FP/archive/geoff-mainland/quasiquoting.pdf Why It's Nice to be Quoted: Quasiquoting for Haskell]. ...pecific syntax to construct fragments of their program. Along with Haskell's existing support for domain specific languages, you are now free to use new
    12 KB (1,695 words) - 15:27, 12 November 2019
  • ...e variable rather than a type) but also isn't specified on the left (there's no 'b' in the left part). In Haskell98, you would have to write perimeter (Square s) = 4*s
    13 KB (2,093 words) - 10:57, 25 October 2023
  • | S FLUID
    1 KB (220 words) - 23:40, 27 July 2015
  • Haskell's cryptic form<br> and so is Haiku's<br>
    4 KB (621 words) - 05:56, 26 April 2021
  • ...his question. Solve it as you would under such circumstances for this week's Ruby Quiz."
    1 KB (175 words) - 15:18, 6 February 2021
  • ...ronments for functional programming. I'd been wondering how to map a user's gestures into operations on a functional program. Lots of noodling led to ...skellwiki/phooey Phooey] is a functional GUI library that has much of Eros's GUI implementation techniques, but much more carefully structured than in t
    3 KB (540 words) - 21:40, 3 May 2024
  • ...wards replication. For more information read Anderson, Lehnardt and Slater's book "CouchDB - The definite guide" ([http://books.couchdb.org/relax/]). stripResult (Error s) = error $ "JSON error " ++ s
    12 KB (1,556 words) - 15:19, 6 February 2021
  • And here is an implementation of generalized Bresenham's line drawing algorithm, in terms of balanced words: https://github.com/Lamb
    1 KB (168 words) - 23:01, 11 July 2021
  • ...lication features a brain viewer which enables you to explore the computer's internal game tree.
    1 KB (231 words) - 13:25, 16 March 2018
  • | Friend's place. | Friend's place.
    5 KB (679 words) - 18:16, 11 March 2024
  • It's about time we got some job done in [[Haskell]], eh? Now, one of my Let's have at it!
    13 KB (1,817 words) - 17:53, 20 October 2016
  • [[MonadLib]] is written by Iavor S. Diatchki. A refinement of MonadRandom to integrate RandomGen's split function.
    4 KB (648 words) - 09:43, 9 December 2014
  • ...t. It is based on The Update Framework (TUF) that has been inspired by tor's built-in software upgrade system. TUF is an implementation-independent spec
    2 KB (233 words) - 11:01, 27 May 2015
  • ...every one'' of these functions is already provided by inf-haskell.el! Here's a selection of the highlights: ...this by customising haskell-program-name) on your file. Don't worry if it's not an isolated module, GHCi will load all the modules it imports as normal
    8 KB (1,358 words) - 17:26, 9 August 2019
  • ...programming language] like [http://www.eecs.harvard.edu/~avi/ Avi Pfeffer]'s [http://www.eecs.harvard.edu/~avi/IBAL/index.html IBAL] -- not only [http:/ I've proposed a machine learning library for this year's Google Summer of Code. [http://hackage.haskell.org/trac/summer-of-code/
    8 KB (1,161 words) - 08:26, 1 December 2018
  • Let's start with the following: -- ... My stack overflows when there's a chain of around 500000 (+)'s !!!
    16 KB (2,235 words) - 10:26, 29 March 2019
  • Primele luni ale anului 2011 s-au dovedit prolifice pentru realizatorii de compilatoare: type S = Int
    20 KB (2,558 words) - 22:39, 29 June 2021
  • ...rallel Haskell Digest is a newsletter aiming to show off all the work that's going on using parallelism and concurrency in the Haskell community.
    2 KB (245 words) - 12:02, 9 May 2024
  • Some clarifications on issues raised by yesterday's article. It's the 'id' function of the unix shell. BSD 'cat.c' is a [http://www.cse.unsw.
    25 KB (3,657 words) - 18:20, 12 September 2015
  • ...tp://haskell.org/haskellwiki/IO_inside Haskell I/O inside: Down the Rabbit's Hole] を読んでみてください
    7 KB (299 words) - 11:39, 22 October 2022
  • Xmonad makes a great drop-in replacement for Gnome's default window manager (metacity) giving the user a slick tiling window man ...ager, it looks in the ~/.gnomerc file for the WINDOW_MANGER variable. Let's set that. My ~/.gnomerc file looks like this:
    11 KB (1,587 words) - 07:49, 20 April 2021
  • that retrieve the field's value from a particular record.
    1 KB (193 words) - 20:08, 23 July 2021
  • ...hich forces us to convert our results to list format and exclude any Maybe's). (Perhaps, all this example is impractical and exaggerated, because in rea But if we want to do something similar with a ''parser'' on Maybe's to achieve a ''parser'' on list, then <hask>maybeToList</hask> is not enoug
    9 KB (1,305 words) - 03:17, 23 September 2014
  • Let's start off with a little quiz. What will be the output of running the follow The answer is: it's undefined. If you want to understand why, keep reading.
    21 KB (3,408 words) - 09:26, 9 September 2014
  • * It's a bit slooow.. ...to the type graph. We'd likely get a big improvement by only loading what's needed for each particular program. [http://code.google.com/p/disciple/issu
    4 KB (583 words) - 00:53, 9 April 2021
  • ...Workshop/2012/Diatchki|Implementing Type-Level Literals in GHC]]''' (Iavor S. Diatchki) [http://www.haskell.org/wikiupload/1/11/Hiw2012-iavor-diatchki.p ...kellImplementorsWorkshop/2012/Stutterheim|Web browser programming with UHC's JavaScript backend]]''' (Atze Dijkstra) [http://www.haskell.org/wikiupload/
    6 KB (790 words) - 03:05, 25 July 2021
  • However, all is not well in paradise. You see, while the SDL's programming capabilities are both simple and fairly flexible, what they are There's still a slight problem though. Some shapes have a 'radius'. However, spotli
    9 KB (1,391 words) - 15:17, 6 February 2021
  • ...g/package/cv-combinators-0.1.2.3 cv-combinators] library that wraps OpenCV's high-level computer vision capabilities in a pure, functional interface.
    1 KB (178 words) - 12:02, 8 June 2023
  • Haskell 2010 changes the syntax for [[guard]]s by replacing the use of a single condition with a list of qualifiers. These From the GHC user's guide,
    1 KB (217 words) - 23:22, 24 July 2021
  • * [http://www.pnotepad.org/ Programmer's Notepad] == Generating Dynamically Linked Libraries (DLL's) ==
    12 KB (1,886 words) - 19:30, 3 February 2021
  • An ongoing record of Simon's harassment is here: http://www.flickr.com/photos/97222587@N07/sets/72157635
    1 KB (192 words) - 23:05, 22 August 2013
  • fail s = \ u -> let !_ = part u in error s
    4 KB (691 words) - 08:14, 12 June 2023
  • It's easy to accidentally write functions that aren't strict, though. Often a l ...er]]. However, the parameter <hask>acc</hask> isn't strict, because there's no guarantee that the caller will evaluate it. The compiler will use a ful
    7 KB (1,162 words) - 17:16, 8 June 2022
  • For a long time, I didn't understand what [[Generalised algebraic datatype]]s were or how they could be used. It almost seemed a conspiracy of silence &m Let's build a hypothetical Haskell extension that mimics, for type
    14 KB (2,322 words) - 13:55, 24 November 2023
  • ...like points, sizes, polygons and most importantly matrices are there. It's also easy to bind missing datatypes. We use inline-c to inline C++ code in ghc-mod's codebase has been accumulating a lot of functionality over the years,
    11 KB (1,776 words) - 18:15, 3 September 2016
  • :Jun Mukai's search-based mail client, written in Haskell. ...n of [http://homepages.paradise.net.nz/warrickg/haskell/http/ Warrick Gray's original version].
    6 KB (929 words) - 18:17, 31 August 2016
  • ...fs and programs. Agda is also a functional language with [[Dependent type]]s. This language is very similar to Cayenne and Agda is intended to be a (alm ...und on [https://staff.fnwi.uva.nl/d.j.n.vaneijck2/index.html Jan van Eijck's page].
    6 KB (926 words) - 12:12, 16 January 2022
  • With a name that combines parts of "Ha"skell and "bit"s, Habit
    1 KB (189 words) - 06:37, 16 September 2013
  • possible spine shape up to 4 'App's deep. I could possibly do this more combinator. There are rules for reducing under both 2 and 3 'App's.
    10 KB (1,653 words) - 00:25, 12 July 2021
  • * '''[[Monoid]]s''' ...cture; but we'll stick with sets now). What this means is that given <math>S</math>, we want to find some set <math>M</math>, together with appropriate
    13 KB (2,245 words) - 15:18, 6 February 2021
  • ...code.haskell.org/wxhaskell</code>). You can use previous darcs.haskell.org's Darcs repository, too.
    2 KB (259 words) - 21:40, 1 December 2015
  • That's a mouthful, but once you see it in use, perhaps the idea will last action in the chain. So there's one more primitive,
    5 KB (958 words) - 15:20, 3 August 2022
  • This is a solution done for simplicity rather than performance. It's SLOOOOW. If I were to check intermediate solutions against the blocks that type Row s = [s]
    17 KB (2,482 words) - 20:34, 8 June 2017
  • This page is obsolete. It's content has been replaced by: *<b>S:</b> [http://www.cs.chalmers.se/~andrei/ Andrei Sabelfeld], Chalmers Univer
    11 KB (1,759 words) - 09:41, 10 August 2022
  • ...rogram (for example, the call stack) at a certain point in time (Wikipedia's [http://en.wikipedia.org/wiki/Continuation Continuation]). ...lexical) <code>goto</code> instruction but a ''dynamic'' one (David Madore's [http://www.madore.org/~david/computers/callcc.html#sec_intro A page about
    10 KB (1,560 words) - 12:02, 15 April 2024
  • ...ver and over, and which is affected by the existence of extensions. So let's define interfaces for libraries that make this easier and build some initia ...ped core around this language, after going over it with a comb to check it's adequately expressive?:
    5 KB (735 words) - 15:20, 6 February 2021
  • ...tp://code.haskell.org/Salsa/Samples/Conway Conway]: a simulator for Conway's Game of Life with a Windows Presentation Foundation GUI. (Requires .NET 3.0 | <pre-c>s.Length</pre-c>
    5 KB (685 words) - 07:56, 22 August 2016
  • ...ts transformed as we move from root to leaf. Recall our sample tree t. Let's name some of the relevant subtrees for brevity: There's a principled way to get the necessary types for contexts and the
    10 KB (1,623 words) - 21:10, 26 June 2023
  • Here's a very simple program which copies a file from standard input to Note that we are using strict bytestrings here. (It's quite common to import the
    17 KB (2,795 words) - 04:06, 16 June 2020
  • ...tionality for modifying popular data structures such as <hask>Vector</hask>s. More details about these problems can be found in a Haskell Implementor's workshop [http://www.youtube.com/watch?v=xiPrpWQN7m0 talk from 2012].
    5 KB (865 words) - 18:26, 21 November 2013
  • ### show nested two-action do's ## nested do's
    10 KB (1,520 words) - 07:20, 10 November 2020
  • What is Lua? It's a scripting language (like Perl) targeted to be literally 5 minutes. let's try:
    13 KB (2,016 words) - 18:34, 20 August 2017
  • * Dr Matt Fairtlough's [http://web.archive.org/web/20060713051810/http://www.dcs.shef.ac.uk/~matt/ * Dr Matt Fairtlough's [http://web.archive.org/web/20060713051910/http://www.dcs.shef.ac.uk/~matt/
    13 KB (2,068 words) - 23:19, 3 June 2019
  • problem_43 = sum . map l2n . map (\s -> head ([0..9] \\ s):s) let s = addZ 3 . reverse . explode $ m
    12 KB (1,626 words) - 05:45, 9 March 2021
  • * [http://happstack.com/ Happstack's web site] is simple and clean. * [http://snapframework.com/ Snap's web site] is pretty and professionally designed.
    14 KB (1,908 words) - 02:23, 6 March 2017
  • ...rs_guide/exts/pragmas.html#language-pragma chapter 6.20.1. of the GHC User's Guide].
    2 KB (248 words) - 14:43, 5 January 2024
  • Here's another solution, and this one squeaks by in just under a minute on my mach import qualified Data.Set as S
    15 KB (2,018 words) - 01:29, 26 April 2021
  • *[http://hackage.haskell.org/ Hackage] - the Haskell community's public repository of cabal packages
    2 KB (244 words) - 12:34, 2 October 2020
  • it is rather limited, but it's intended to answering some of the basic it's /System/Links/Headers/bzlib.h. It provides many of procedures of
    15 KB (2,511 words) - 06:03, 1 June 2022
  • ...ay be worth of solving a specific problem with arrows (instead of [[monad]]s) can be read in But Leijen's post is rather old (2000). Arrows are now significantly easier to understa
    11 KB (1,636 words) - 20:01, 13 May 2020
  • * Henning's Darcs repository with the cutting edge features:
    2 KB (314 words) - 09:50, 26 September 2018
  • ...39639.html Designing DSL with explicit sharing (was: I love purity, but it's killing me)] ...askell/comments/2e8d53/whats_the_best_practice_for_building_a_dsl_in/ What's the best practice for building a DSL in haskell?], a discussion at Reddit
    5 KB (616 words) - 10:22, 10 June 2021
  • ...ell code dynamically in a GHCi-like manner. For this reason, a lot of GHC's features can be accessed by programs which import the <tt>ghc</tt> package. ...odule, but occasionally you may have to import other modules. See the GHC's [https://downloads.haskell.org/~ghc/latest/docs/html/libraries/ haddock doc
    9 KB (1,261 words) - 15:40, 22 December 2017
  • ...resentation and go straight to evaluation or code generation or... but let's fix just one goal here.) Here is an internal representation: ...s and returns a semicolon-separated sequence of one or more <hask>p</hask>'s.
    8 KB (1,033 words) - 02:43, 21 March 2018
  • ...are available on [http://hackage.haskell.org/package/Bravo Hackage]; there's no darcs repository for Bravo at the moment. ...ecessary. If the application is supposed to be released in binary form, it's not necessary to ship the template files with the application.
    9 KB (1,381 words) - 22:32, 29 June 2021
  • There's an idiom that's briefly mentioned in the User Guide under [https://downloads.haskell.org/gh That's not wrong; but by talking about "class and instance contexts" in the same b
    14 KB (2,091 words) - 17:28, 4 February 2023
  • ...ually, for a function taking more than two arguments, you can do it but it's not nearly as nice (note the need for extra parentheses):
    1 KB (159 words) - 23:45, 25 June 2021
  • Usually if you have a partial function, it's because your types are incorrect and you should fix your types rather than
    1 KB (247 words) - 16:53, 15 November 2014
  • ...e, handle errors, abstract and are easy to combine into bigger forms. Here's an example: You can also have more advanced widgets, like a radio-choice, that's where you use enumRadio:
    8 KB (985 words) - 06:56, 16 September 2013
  • You could use ghc's [https://wiki.haskell.org/GADTs_for_dummies Generalised Algebraic Data Stru
    2 KB (312 words) - 23:26, 19 September 2016
  • It's hard to gauge how much people like proposals like this, so let's try the experiment of collecting votes here: Names of people who think that on balance it's a bad idea
    7 KB (1,198 words) - 05:55, 10 December 2020
  • == Finding today's date ==
    2 KB (224 words) - 21:06, 6 January 2019
  • ...mechanism, the platform process enforces standardisation on the candidate's base API before admission completes.
    1 KB (214 words) - 15:19, 6 February 2021
  • ...to speed by reading [[Tutorials/Programming Haskell/Introduction|yesterday's introductory article]]. [[Tutorials/Programming Haskell/Introduction|yesterday's article]].
    19 KB (3,139 words) - 04:08, 22 October 2021
  • Hack is a simple interface for applications. Based on Ruby's Rack, it presents a very low barrier to entry. Unlike WAI, it uses lazy byt
    2 KB (217 words) - 12:02, 19 April 2024
  • Programming in FRP consists of creating a network of "Behavior"s and "Event"s (although Events are more like event streams). A Behavior represents someth ...e-Banana. You can find more information about it at [[Reactive-banana | it's wiki page]]. It is highly recommended that you read the [[FRP_explanation_u
    12 KB (1,907 words) - 21:33, 19 September 2015
  • * [http://www.cs.cmu.edu/~kw/pubs/conway.pdf Proving Conway's Lost Cosmological Theorem with Haskell]
    2 KB (242 words) - 05:23, 12 July 2021
  • Let's create a type for that: we'll call it "Lover", and a "Lover" friend's beloveds.
    28 KB (4,668 words) - 15:16, 6 February 2021
  • There's also an API which is believed to be more human-readable. ...t very interesting since one wants to interact with the outside world. Let's take a look at how to extend UrlDisp to handle database access.
    4 KB (592 words) - 21:17, 29 June 2021
  • Xmonad makes an excellent drop-in replacement for Gnome's default window manager (metacity) giving you a slick tiling window manager. This should set up Xmonad to make space for Gnome's panel and status bar automatically. Note that this requires xmonad-contrib
    7 KB (1,095 words) - 15:16, 6 February 2021
  • ...The type is labeled "Rank-N" where N is the number of <hask>forall</hask>s which are nested and cannot be merged with a previous one. For example: -- | Append two 'ChurchList's. This runs in O(1) time. Note that
    4 KB (693 words) - 13:33, 15 April 2024
  • Yes, each of those techniques produces more <code>IO</code> thingies. That's the real beauty of it: if you have a value that is dependent on the environ Alright, here's the short answer: '''You don't.'''
    4 KB (726 words) - 05:08, 6 April 2022
  • ...presentation into LaTeX (via Xy-pic) and into dot, the format for AT&amp;T's Graphviz tools. Since no horizontal sorting is done, the Xy-pic output is r :Iavor Diatchki's library of monad transformers for Haskell. It enables the quick constructio
    10 KB (1,459 words) - 19:29, 15 August 2019
  • ...t on line length? What's the purpose of that if not to allow the use of C's getline() primitive (in both senses of the word)? And if we're picky, all import qualified Data.ByteString.Lazy.Char8 as S
    20 KB (3,239 words) - 02:07, 26 April 2021
  • ...l/Publications/PaperStore/db-utwente-0000003696.pdf The Haskell Programmer's Guide to the IO Monad]
    5 KB (398 words) - 11:37, 22 October 2022
  • ...ation just means substituting arguments for some of the lambda abstraction's variables, which always halts with the result a now-unapplied lambda abstra
    2 KB (253 words) - 22:16, 5 April 2021
  • Peter Ljunglöf's many [http://www.cse.chalmers.se/~peb/bibliography.html publications] on na [http://homepages.cwi.nl/~jve/index.html Jan van Eijck's page] contains a huge amount of materials on logic and language:
    15 KB (2,211 words) - 16:44, 1 August 2021
  • '''Hackage''' is the Haskell community's central package archive. Package authors use it to publish their libraries
    2 KB (335 words) - 11:22, 25 February 2016
  • Many people ask me "What's Manatee?", i think correct answer should be : ...not design for WM, it's design for OS, so don't compare it with XMonad, it's really different thing with XMonad. Please watch '''Window split''' feature
    12 KB (1,458 words) - 02:36, 26 April 2021
  • ...Mac, using Haskell to build those insanely great Mac applications. There's two ways you could go about it. One might be to build it as a Haskell-for-
    1 KB (222 words) - 13:03, 5 March 2024
  • * Haskell binding to Apple's 2D animation and games framework SpriteKit. * install [http://www.macports.org MacPort]'s [http://trac.macports.org/browser/trunk/dports/lang/ghc/Portfile ghc] packa
    7 KB (1,042 words) - 15:32, 26 December 2022
  • Johan Tibell writes: I'm very happy with Adam's work strict Haskell. StrictData is already in HEAD and will be part of 8.0. Alex's excellent work is [https://github.com/Alllex/stm-data-collection here] and
    8 KB (1,152 words) - 13:09, 24 March 2018
  • ...noid</hask>. The <hask>Monoid</hask> typeclass however does not enforce it's instances to already be instances of <hask>Semigroup</hask></div> <div>The <hask>Semigroup</hask> is a particularly forgiving typeclass in it's requirements, and datatypes may have many instances of <hask>Semigroup</has
    4 KB (688 words) - 22:51, 29 June 2021
  • [http://wiki.freebsd.org/Haskell More information in the FreeBSD Wiki's Haskell page]
    2 KB (324 words) - 19:48, 24 April 2019
  • :It's not in the book, but it's easy when you know how: ...in a list of actions) and then perform them using the trick above. But it's much simpler to do this:
    6 KB (1,106 words) - 12:32, 15 November 2019
  • ...why people say that Haskell lets you write your own control structures. It's also one of the motivations behind Haskell being a [[pure]] language (thoug .../tt> processes the whole list, and then <tt>or</tt> finds any <tt>True</tt>s – but if the very first item of the list satisfies <tt>p</tt>, then you r
    9 KB (1,503 words) - 13:55, 15 December 2019
  • Don's Papers - Thanx Don for all you had done for us !
    3 KB (432 words) - 05:52, 10 August 2022
  • ...-devs mailing list which suggests to add expansion of type-synonims in GHC's error-messages. Simon Peyton Jones suggested we should create a wiki-page f
    2 KB (215 words) - 09:14, 19 June 2015
  • ...e [http://fmapfixreturn.wordpress.com/tag/hstringtemplate/ Sterling Clover's blog], and for downloads and API docs see [http://hackage.haskell.org/packa ...can be based around any 'Stringable' type, allowing you to use ByteString's or any other type if you write the Stringable instance. The template has a
    12 KB (1,726 words) - 15:16, 6 February 2021
  • If you are not using a DSN, it's critical to explicitly set the Port in the connection string
    1 KB (210 words) - 11:52, 19 April 2021
  • ...for [[H-99: Ninety-Nine Haskell Problems]], with one page for each problem's solutions.
    2 KB (107 words) - 19:30, 18 January 2014
  • print ("Current desktop %s is not supported." % current_desktop) print ("Killing pid %d (%s)" % (pid, pname))
    8 KB (1,040 words) - 08:05, 15 November 2023
  • [(n,sum [s * partitions ! p| (s,p) <- zip signs $ parts n])|
    7 KB (972 words) - 02:57, 3 May 2015
  • It's recommended to use some sort of sandboxing tool while working on diagrams. For coding style, see Johan Tibell's [https://github.com/tibbe/haskell-style-guide/blob/master/haskell-style.md
    9 KB (1,429 words) - 02:17, 19 April 2015
  • Of all the alternatives, TypeScript's advantage is that it makes no changes to JavaScript. Existing JavaScript co ...p://www.haskell.org/haskellwiki/Yhc/Javascript an old wiki page] about Yhc's JavaScript support, but Yhc itself is a dead project.
    11 KB (1,601 words) - 18:02, 26 October 2020
  • This is [[User:SamB|SamB]]'s BF interpreter.
    2 KB (242 words) - 01:12, 26 April 2021
  • In some cases a state monad is simply not efficient enough. Let's say the state is an array and the update operations are modification of sin If the set of required effects is small, F. Warren Burton's ''pseudodata'' technique can be used to access them via abstract values in
    10 KB (1,634 words) - 22:52, 6 April 2022
  • ...de to integrate ghc into [https://wiki.openwrt.org/doc/howto/build OpenWRT's buildroot], the strategies here are pretty much synonymous with [https://gh it's also a good idea to de-select
    13 KB (1,967 words) - 16:07, 9 August 2016
  • xrandr -s 0
    2 KB (236 words) - 00:49, 27 January 2018
  • network. So let's start by importing modules from the standard library and the ''network'' pa ...ails are important: the nick, the user name, and a channel to join. So let's send those.
    21 KB (3,285 words) - 19:34, 11 April 2024
  • There are two version of <hask>Text</hask>s: lazy and strict.
    2 KB (285 words) - 20:38, 2 March 2014
  • (10:17) <Martingale> It's seems like we need information we don't yet have as we traverse the tree (10:43) <Martingale> that's for sure
    9 KB (1,383 words) - 16:48, 18 November 2013
  • Haskell's built-in features for interfacing to other languages are formally defined i ...002808/http://www.reid-consulting-uk.ltd.uk/docs/ffi.html Guide to Haskell's Foreign Function Interface]
    7 KB (1,100 words) - 06:49, 8 June 2023
  • ...://sigfpe.blogspot.com/2006/11/from-l-theorem-to-spreadsheet.html From Löb's Theorem to Spreadsheet Evaluation] ...an.blogspot.com/2007/07/peanos-axioms-iv-advanced-functions-and.html Peano's Axioms IV: Advanced Functions and Integers]
    9 KB (903 words) - 07:20, 16 April 2020
  • As a running example, let's suppose you want to develop an extension Receiving objects: 100% (13578/13578), 9.21 MiB | 2.00 MiB/s, done.
    16 KB (2,392 words) - 17:44, 2 August 2021
  • s <- senses, let is = take 4 $ iterate s i,
    8 KB (1,028 words) - 15:16, 16 September 2015
  • ...how you can use these types to represent others is to see an example. Let's represent the <hask>UserTree</hask> type shown before: M1 S NoSelector (
    16 KB (2,615 words) - 20:24, 19 October 2020
  • :Kinetic is an operating system where the expressiveness of Haskell's type system guides the design of operating system features and facilities. ...re threading and exceptions are all realized via delimited [[continuation]]s.
    11 KB (1,663 words) - 19:17, 15 August 2019
  • ...html C-x 8 RET]</tt> (<tt>ucs-insert</tt>), then type either the character's name or its hexadecimal code point. Use Agda's [http://agda.readthedocs.io/en/latest/tools/emacs-mode.html#unicode-input i
    9 KB (1,396 words) - 23:18, 24 July 2021
  • ...icit should provide the necessary background to understand reactive-banana's haddock comments. Spreadsheets are something we all (for certain values of we) know about. Let's talk about a typical, simplified, spreadsheet. We have a list of products t
    25 KB (4,168 words) - 15:10, 24 October 2017
  • It's a pretty big wheel with a circumference of 210 and allows us to calculate t ...ing just <code>(p-1)/p</code>. See [[Prime_numbers#Euler.27s_Sieve | Euler's Sieve]], or the [[Research papers/Functional pearls|functional pearl]] titl
    18 KB (2,583 words) - 20:08, 19 December 2020
  • ...s to the language. Even if they may be too onerous to change right now, it's possible that it would make sense to address them at some other time. * <hask>default</hask> is a useful name for a variable, but it's taken up as a keyword for the rarely used defaulting declaration. DefaultS
    7 KB (1,033 words) - 01:16, 27 September 2021
  • permutations n = take l $ map (read . take l) $ tails $ take (2*l -1) $ cycle s s = show n
    11 KB (1,557 words) - 09:03, 19 September 2014
  • -- Here are the functions to access web-browser's DOM structures. -- This function obtains reference to an object's method similarly
    12 KB (2,023 words) - 22:51, 5 April 2021
  • Here's how to configure Xmonad to work with KDE. ...ttp://haskell.org/haskellwiki/Xmonad/Frequently_asked_questions XMonad FAQ's], [http://haskell.org/haskellwiki/Xmonad/General_xmonad.hs_config_tips XMon
    10 KB (1,540 words) - 03:32, 27 January 2024
  • Haskell is the world's leading purely functional programming language :Erik's 13 part lecture series on Haskell, using [http://www.amazon.com/Programming
    11 KB (1,456 words) - 07:05, 7 August 2016
  • Here's an example for <code>C-c C-=</code>. Put your cursor after <hask>myInt</has
    2 KB (358 words) - 18:22, 11 April 2016
  • ...libraries. For an earlier attempt at this problem, please look at Peng Li's paper [https://repository.upenn.edu/cgi/viewcontent.cgi?article=1391&contex -- For switch, target thread's status must be BlockedOn*. Otherwise,
    19 KB (2,840 words) - 16:41, 1 August 2021
  • render_en_US WhatsYourName = "What's your name?" render_pt_BR (Ihave_apples n) = "Tenho " ++ show n ++ " maçãs."
    2 KB (354 words) - 03:41, 14 August 2021
  • LDFLAGS = -s ${LIBS} + eprint("error, cannot allocate color '%s'\n", colstr);
    7 KB (986 words) - 15:19, 6 February 2021
  • ....org/node/1277 The Next Mainstream Programming Languages: A Game Developer's Perspective] (PPT, PDF) presentation by Tim Sweeney .../feature/2985/postmortem_naughty_dogs_jak_and_.php Postmortem: Naughty Dog's Jak and Daxter: the Precursor Legacy]; an article about a game developed wi
    9 KB (1,258 words) - 05:36, 8 June 2023
  • ...m superir, polimorfismo, classes tipadas e mônadicas. Compiladores Haskell são livremente disponíveis para as mais variadas plataformas. ;[[Image:Uma_Abordagem_Pratica.jpg|Cover]] Claudio Cesar de S and Marcio Ferreira da Silva: <em> Haskell: Uma Abordagem Prática</em>, [h
    5 KB (663 words) - 19:51, 4 April 2019
  • <!-- Hide the "plz register" banner, it's basically too late now * 03:00pm [Upper room] Rúnar Bjarnason: [https://www.dropbox.com/s/lasx6zxkoe07jyq/AdjunctionsHaskell.pdf?dl=0 '''Adjunctions in Everyday Life
    6 KB (877 words) - 22:29, 26 April 2017
  • [http://www.spcapitaliq.com/ http://www.seas.upenn.edu/~antals/hac-phi/logos/S%26P%20Capital%20IQ%20@300.jpg]&nbsp; UPenn's admissions office has [http://www.admissions.upenn.edu/visit/directions-and
    10 KB (1,656 words) - 21:25, 21 October 2016
  • ...wiki's syntax highlight at least does not garble the source, unlike hpaste's highlight.
    5 KB (503 words) - 07:14, 22 December 2021
  • ;[http://www.cse.unsw.edu.au/~chak/haskell/ctk/ Manuel Chakravarty's Compiler Toolkit] ...ribute Grammars Matter|Why Attribute Grammars Matter]]. Utrecht University's [https://web.archive.org/web/20170224115838/http://www.cs.uu.nl/wiki/HUT/At
    13 KB (1,947 words) - 14:44, 21 July 2023
  • instance (MonadReader s m, Functor m) => MonadReader s (ListT m) where instance (MonadState s m, Functor m) => MonadState s (ListT m) where
    13 KB (2,036 words) - 13:54, 4 July 2023
  • ...nal alignment/local origin has to be explicitly saved and restored if that's what you want. I'd like to have some combinators that automatically do thi
    2 KB (397 words) - 20:05, 1 June 2015
  • ...l-cafe/2013-February/106222.html almost was] but there were problems so it's not included. It will possibly be available in GHC 7.8.
    3 KB (409 words) - 07:55, 19 October 2015
  • But wait, that's evil isn't it? ...if you actually had to write these extended types in regular programs. It's a good thing then that, for the most part, you can ignore the extended regi
    5 KB (834 words) - 04:20, 8 June 2023
  • ...ant to work on one of these, put your name in the block so we know someone's working on it. Then, change n in your block to the appropriate problem numb
    2 KB (327 words) - 19:49, 4 January 2024
  • People often ask, «Okay, Haskell looks like a fun language; but what's written in it?»
    2 KB (296 words) - 14:29, 24 February 2020
  • GLFW.keyCallback $= \k s -> when (fromEnum k == fromEnum GLFW.ESC && s == GLFW.Press) $
    10 KB (1,537 words) - 21:44, 2 October 2014
  • ...Hammond K. Horiguchi S. Klusik U. Loogen R. Michaelson G.J. Pena R. Priebe S. Trinder P.W. Higher-order and Symbolic Computation 16(3) (2003). ...W. Trinder P.W. Hall C.V. Hammond K. Junaidu S.B. Morgan R.G. Peyton Jones S.L. Concurrency: Practice and Experience, 11(12) (December 1999), pp 701-75
    9 KB (1,352 words) - 21:43, 10 May 2024
  • Haskell's basic syntax consists of function definition and function application. It's not amazing that Haskell provides a lot of syntactic sugar.
    16 KB (2,610 words) - 17:17, 4 February 2023
  • ...of short, useful, cool, magical examples, which should incite the reader's curiosity and (hopefully) lead to a deeper understanding of advanced Haskel fix (\f l -> if null l then [] else let (s,e) = break (==' ') l in s:f (drop 1 e))
    12 KB (1,704 words) - 17:53, 22 November 2019
  • ...ything is done with function calls), statically, implicitly typed ([[type]]s are checked by the compiler, but you don't have to declare them), lazy (not Calling [[function]]s is done by putting the arguments directly after the function. There are no
    13 KB (1,986 words) - 17:59, 9 August 2019
  • ...formation during a program execution that shows unintended behaviour. Hoed's post-mortem algorithmic debugging view presents the user with questions abo
    6 KB (896 words) - 09:12, 22 December 2015
  • ...in <tt>long_description</tt>. It's necessary due to the format of Debian's <tt>control</tt> file.)</li>
    6 KB (802 words) - 04:59, 12 July 2021
  • crash, and he was not able to recover it. That's the bindings haste2
    2 KB (310 words) - 05:54, 10 October 2013
  • <code>linear</code>’s functions are very similar to <code>vector-space</code>. The biggest differ This is the ''opposite'' way round to <code>vector-space</code>’s lerp.
    11 KB (1,707 words) - 01:06, 1 May 2015
  • ...result and forget about it. You can implement this as a 'fastccall' but it's quicker and standard FFI in any case.
    2 KB (288 words) - 01:58, 9 April 2021
  • ...ink it should happen again, but this time at Imperial College, London. Who's up for it (add names further down)? This year it's being (un)organised by Matthew Sackman (matthew-_), Tristan Allwood (ToRA)
    11 KB (1,801 words) - 09:22, 23 May 2022
  • *[[Xmonad]]'s central StackSet.hs module has been checked repeatedly, as it has evolved.
    2 KB (353 words) - 08:17, 6 August 2015
  • Xmonad makes an excellent drop-in replacement for Gnome's default window manager (metacity) giving you a slick tiling window manager. ....desktop</code> file and running a full gnome session replacing only gnome's window manager. They tell gnome-session to use xmonad instead of metacity b
    28 KB (4,089 words) - 18:22, 5 February 2016
  • OCaml's <tt>let</tt> is non-recursive by default, but has the form <tt>let rec</tt>
    2 KB (293 words) - 16:34, 15 May 2023
  • There's a package on Hackage, you want to use it, but it has some signatures and yo Let's suppose you want to use the str-sig signature package. The general recipe i
    10 KB (1,679 words) - 23:28, 2 April 2017
  • ...ymorphic in the clock. In that case, they are called <hask>Behaviour</hask>s, since they model the original FRP idea of a value (or function) varying wi ...tible clocks form the main high-level components, called <hask>Rhine</hask>s themselves.
    8 KB (1,207 words) - 21:07, 26 September 2018
  • ...en concatenates the sublists to a result list (if not apparent: the author's a novice):
    4 KB (546 words) - 19:18, 31 August 2016
  • ...[https://downloads.haskell.org/~ghc/latest/docs/html/users_guide/ GHC User's Guide]. ...and snippets for use with the latest version of GHCi, beyond what the User's Guide covers. Please add to it!
    21 KB (3,021 words) - 12:03, 15 May 2020
  • ...r that sharing f2 will have the same effect. If this seems arbitrary, that's because it is. It is difficult to design an objective rule which disallows ...riction is probably the most annoying and controversial feature of Haskell's type system.
    16 KB (2,628 words) - 21:19, 16 December 2022
  • Now for the fun part. Let's combine the <hask>apples</hask> and <hask>bananas</hask> inputs and the <ha However, there's a much more elegant formulation, using <hask>uncurryA</hask> and <hask>$$</
    13 KB (1,988 words) - 02:05, 24 September 2021
  • :*It's easy to migrate from standard Lists/Sets/Maps to the new package. The packa ...presentation into LaTeX (via Xy-pic) and into dot, the format for AT&amp;T's Graphviz tools. Since no horizontal sorting is done, the Xy-pic output is r
    17 KB (2,508 words) - 07:09, 8 June 2023
  • ...his bug fixed. With 0.13 release, you will want to modify your X11 session's xmonad startup to remove the <code>xmonad.state</code> file before launchin
    2 KB (420 words) - 18:27, 12 December 2017
  • implementing compilers and interpreters. Here's a selection of compilers ...mitted-choice constraint logic programming language, implemented using GHC's software transactional memory. According to the site referenced by the abo
    12 KB (1,707 words) - 07:27, 10 March 2020
  • ...teaching [[Questions and answers|beginners]] the language! However, there's an appropriate way and an inappropriate way to get help. If you have been your school's resources, then the Haskell community may be able to help you
    8 KB (1,447 words) - 08:49, 15 September 2015
  • * To twist other people's arms to present
    2 KB (371 words) - 09:32, 12 September 2017
  • It's helpful to have repositories in the diagrams organization on github generat
    2 KB (329 words) - 13:42, 17 October 2014
  • ...me with SDL graphics and Kinect and Wiimote support. Written in FRP, there's a fork in Haskell for Android. ...example programs, please see [http://code.google.com/p/yogurt-mud/ Yogurt's home page].
    15 KB (2,258 words) - 16:22, 1 July 2023
  • Finally, it's not a goal of the interface to provide a nice API for writing web applicati , errors = \s -> hPutStr stderr s >> hFlush stderr
    14 KB (2,193 words) - 05:45, 12 July 2021
  • * [http://www.cin.ufpe.br/~haskell/hopengl/ Andre Furtado's nice tutorial] written in 2001 (bitrotted) ....haskell.org/package/vinyl-gl vinyl-gl]: Utilities for working with OpenGL's GLSL shading language and vinyl records
    9 KB (1,237 words) - 02:14, 8 August 2022
  • The inliner's job is to replace a function with its definition. This removes one layer of # The function's (exact) definition is included in the interface file for the module.
    13 KB (2,038 words) - 10:49, 22 March 2017
  • Wedler's is not explained. It's just magic.
    9 KB (1,615 words) - 15:16, 6 February 2021
  • ...011, there were more than 200 projects on Hackage with dependencies on GHC's STM implementation, including:
    3 KB (386 words) - 11:56, 15 March 2024
  • runConn conn -- run our server's logic However, as we don't need the thread's id, we'll ignore the result.
    11 KB (1,739 words) - 04:19, 19 April 2024
  • ...rs-debuggers-and-over-interested-souls in the RTS section] of the GHC user's guide. s = M.lookup 4 m
    9 KB (1,453 words) - 19:18, 3 February 2021

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