Search results

Jump to navigation Jump to search

Page title matches

Page text matches

  • #redirect [[OOP vs type classes]]
    68 bytes (10 words) - 06:28, 8 June 2023
  • #redirect [[Lazy vs. non-strict]]
    68 bytes (9 words) - 07:00, 8 June 2023
  • adjToGraph (Adj ((v, a):vs)) = Graph (v : xs) ((a >>= f) ++ ys) Graph xs ys = adjToGraph (Adj vs)
    2 KB (245 words) - 03:48, 10 January 2017
  • #REDIRECT[[Declaration vs. expression_style]]
    119 bytes (14 words) - 04:27, 8 June 2023
  • #REDIRECT[[Declaration vs. expression_style]]
    119 bytes (14 words) - 04:47, 8 June 2023
  • ''Note: you may want to read [[Parallelism vs. Concurrency]], as the terms have historically been conflated.''
    181 bytes (24 words) - 22:31, 10 May 2024
  • koch ((v, us):vs) eused vused vplan = koch vs eused' (vn:vused) ((v, vn):vplan)
    3 KB (420 words) - 22:52, 7 June 2017
  • vs <- f (n-1) return $! v : vs
    986 bytes (142 words) - 15:18, 6 February 2021
  • dfs g vs = runST ( search marks vs
    3 KB (428 words) - 04:08, 12 April 2024
  • dfs g vs = runST ( search marks vs
    4 KB (488 words) - 04:24, 5 April 2024
  • : ''see parallelism (vs concurrency)'' : ''see spark (vs threads)''
    4 KB (637 words) - 02:02, 6 May 2024
  • ''Note: you may want to read [[Parallelism vs. Concurrency]], as the terms have historically been conflated.''
    736 bytes (96 words) - 12:02, 9 May 2024
  • * [http://twanvl.nl/blog/haskell/conduits-vs-pipes Conduits vs. Pipes]
    1 KB (138 words) - 02:42, 13 July 2019
  • adjToGraph (Adj ((v, a):vs)) = Graph (v : xs) ((a >>= f) ++ ys) Graph xs ys = adjToGraph (Adj vs)
    2 KB (388 words) - 03:47, 10 January 2017
  • | [http://zamez.org/source/factorcss/ VS/SVN](?)
    1 KB (154 words) - 16:13, 5 June 2019
  • ....org/pipermail/glasgow-haskell-users/2006-November/011480.html Thread: seq vs. pseq], Haskell mail archive.
    1 KB (146 words) - 00:16, 8 September 2020
  • .../setting-up-haskell-in-vs-code-on-macos-d2cc1ce9f60a Setting up Haskell in VS Code on macOS] (blog)
    2 KB (301 words) - 12:07, 16 December 2023
  • == Effect typing vs State monads ==
    5 KB (834 words) - 04:20, 8 June 2023
  • ''Note: you may want to read [[Parallelism vs. Concurrency]], as the terms have historically been conflated.''
    2 KB (245 words) - 12:02, 9 May 2024
  • * [http://lukeplant.me.uk/blog.php?id=1107301659 Null pointers vs None vs Maybe] ...n-haskell.blogspot.com/2007/01/ruby-vs-haskell-choose-what-works.html Ruby vs Haskell: choose what works]
    13 KB (1,443 words) - 23:42, 13 October 2019
  • where gather [xs] (v:vs) in if v' == [] then [] else map (:v:vs) v'
    6 KB (979 words) - 10:20, 18 May 2022
  • ...cies can be replaced with [[type families]]. See [[functional dependencies vs. type families]].
    1 KB (198 words) - 22:52, 21 July 2021
  • * [http://www.mail-archive.com/haskell-cafe@haskell.org/msg45890.html Lazy vs correct IO]
    2 KB (228 words) - 15:18, 6 February 2021
  • let vs = parMap rnf id $ depth minN maxN mapM_ (\((m,d,i)) -> io (show m ++ "\t trees") d i) vs
    6 KB (1,055 words) - 23:27, 18 April 2020
  • ...ckoverflow.com/questions/4865616/purity-vs-referential-transparency Purity vs Referential transparency], Stack Overflow.
    2 KB (290 words) - 08:52, 24 April 2024
  • ====Coding style: clever vs readable====
    6 KB (833 words) - 00:02, 6 November 2021
  • === If-Then-Else vs. guards ===
    6 KB (937 words) - 05:34, 10 December 2020
  • Comparatie C++ vs Haskell
    3 KB (432 words) - 05:52, 10 August 2022
  • * [[Error vs. Exception]]
    2 KB (296 words) - 15:56, 7 August 2022
  • * [[Lazy vs. non-strict]]
    2 KB (291 words) - 15:20, 6 February 2021
  • ==Functional vs imperative languages==
    7 KB (1,116 words) - 13:17, 1 October 2021
  • * A trailing colon is like a [[terminator vs. separator|terminator]].
    2 KB (312 words) - 17:33, 10 January 2014
  • ...concatenation. With a foldr we can use (:) instead, which is faster (O(n) vs. O(n²)). The use of zip [1..] does not seem to add any overhead compared t
    2 KB (354 words) - 14:31, 5 January 2024
  • ''Note: you may want to read [[Parallelism vs. Concurrency]], as the terms have historically been conflated.''
    4 KB (456 words) - 12:02, 9 May 2024
  • ===Logging out of the Gnome session vs. quitting Xmonad===
    7 KB (1,095 words) - 15:16, 6 February 2021
  • ''Note: you may want to read [[Parallelism vs. Concurrency]], as the terms have historically been conflated.''
    3 KB (360 words) - 12:02, 9 May 2024
  • === Data.Sequence vs. lists ===
    10 KB (1,392 words) - 21:39, 26 August 2018
  • ==Functional vs imperative languages==
    9 KB (1,323 words) - 22:19, 10 May 2024
  • If you used the idiom of checking for a first time startup vs. restart of xmonad:
    3 KB (495 words) - 23:20, 27 June 2016
  • mult n i vs | length (concat vs) >= 9 = concat vs
    11 KB (1,557 words) - 09:03, 19 September 2014
  • This seems to be only a matter of taste in the sense of "[[Declaration vs. expression style]]", however there is more to it.
    4 KB (716 words) - 07:41, 26 January 2019
  • ''Note: you may want to read [[Parallelism vs. Concurrency]], as the terms have historically been conflated.''
    4 KB (479 words) - 09:56, 15 May 2024
  • '''New features vs Alpha1'''
    4 KB (583 words) - 00:53, 9 April 2021
  • In general you should be very careful not to [[Error vs. Exception|mix up]] exceptions with [[error]]s. * [[Error vs. Exception]]
    10 KB (1,404 words) - 06:22, 22 January 2020
  • (v,vs) <- parse (Times x (Star x)) (t:ts) return (v:vs)
    8 KB (1,374 words) - 14:33, 15 December 2022
  • ...API's for 2D, 3D, and generic code. But it already did (generic vs. R2Ish vs. R2Ish). The (R2Ish v) constraints change to (ScalarIsh (V s)) constraints
    10 KB (1,671 words) - 03:59, 16 August 2014
  • 3.1.5 Declarations vs Expressions
    3 KB (332 words) - 03:38, 14 August 2021
  • * [[Functional dependencies vs. type families]]
    4 KB (706 words) - 22:41, 21 July 2021
  • ...a factor of 10<sup>10</sup> compared to <code>Data.Time.Clock</code> (10ms vs. 1ps). This hardware dependence and potentially low precision make <code>Sy
    5 KB (780 words) - 11:40, 6 June 2016
  • ...le.edu/publications/techreports/tr1049.pdf Haskell vs. Ada vs. C++ vs. Awk vs. ..., An Experiment in Software Prototyping Productivity] by Paul Hudak and
    14 KB (2,263 words) - 06:31, 10 August 2022
  • ...ply crashing applications. (which leads to another confusing area: [[Error vs. Exception]]).
    5 KB (668 words) - 12:02, 9 May 2024
  • vs <- replicateM n (newName "x") vs]
    30 KB (4,551 words) - 00:29, 15 June 2023
  • e.g. type name in the identifier as prefix vs. suffix.
    5 KB (765 words) - 22:40, 23 April 2021
  • (Need to define statically vs dynamically extensibility).
    5 KB (827 words) - 04:00, 6 April 2021
  • To compare tuples vs lists:
    5 KB (863 words) - 11:44, 22 August 2021
  • * [[Error vs. Exception]]
    6 KB (961 words) - 12:45, 12 August 2019
  • ** [[Type|data vs newtype]] (and [[Newtype|here]])
    17 KB (1,020 words) - 07:22, 9 June 2023
  • ...lly, because the programmer read about [[non-strict semantics]] and [[lazy vs. non-strict]]. The programmer explicitly wrote <hask>sum</hask> as [[Tail r
    7 KB (1,162 words) - 17:16, 8 June 2022
  • ...int, however, there are two choices, corresponding, essentially, to static vs. dynamic typing.
    8 KB (1,309 words) - 19:09, 18 May 2014
  • ===Logging out of the Gnome session vs. quitting Xmonad===
    28 KB (4,089 words) - 18:22, 5 February 2016
  • binds = map (\(x,y) -> x ++ "=" ++ y) vs vs = erase (CWit :: CWit Show) show r
    25 KB (4,073 words) - 08:53, 9 December 2013
  • [[Lazy vs. non-strict |Non-strict]] languages provide exactly this kind of demand-dri ===Functional vs imperative===
    26 KB (4,102 words) - 23:54, 29 February 2020
  • <!-- related is the problem on inefficient void (mapM f xs) vs. (mapM_ f xs) -->
    10 KB (1,589 words) - 01:08, 27 September 2021
  • ...load?doi=10.1.1.368.1058&rep=rep1&type=pdf Haskell vs. Ada vs. C++ vs. Awk vs. ..., An Experiment in Software Prototyping Productivity] (PDF)
    31 KB (4,662 words) - 08:38, 20 April 2024
  • = Optimised vs unoptimised unfoldings =
    13 KB (2,038 words) - 10:49, 22 March 2017
  • ...wnload?doi=10.1.1.5.6776&rep=rep1&type=pdf Making a fast curry: push/enter vs eval/apply for higher-order languages]
    9 KB (1,252 words) - 05:28, 1 September 2022
  • == Type classes vs classes ==
    30 KB (4,685 words) - 01:34, 14 July 2021
  • g vs = map (f 2) vs g_opt vs = map (f_opt 2) vs
    36 KB (5,898 words) - 06:04, 10 August 2022
  • ...cy (or there is no Functional Dependency), it has a different significance vs. improving a type:
    14 KB (2,091 words) - 17:28, 4 February 2023
  • == Haskell vs OOP ==
    33 KB (5,616 words) - 22:30, 3 May 2024
  • ...choice of terminating versus non-terminating. Thus taking only termination vs nontermination into account, when calculating Chaitin's construction.
    10 KB (1,527 words) - 09:31, 24 April 2024
  • ...he confusion between the order of arguments in <hask>Data.FiniteMap</hask> vs. <hask>Data.Map</hask>). -- ThomasJaeger :One more thing about pattern match failure vs. <hask>init</hask>. Though it doesn't matter match in this simple example,
    24 KB (4,110 words) - 01:13, 7 November 2020
  • ...Fig. 20: In the definition of <_alpha, in the first case, what if tau = G vs? And how does a var compare to a non-var, and so on?
    9 KB (1,527 words) - 09:11, 10 August 2022
  • * Another mailing list discussion (functional vs OO approaches): http://www.haskell.org/pipermail/haskell/2005-June/016058.h
    13 KB (2,093 words) - 10:57, 25 October 2023
  • ** [[Type|data vs newtype]] (and [[Newtype|here]])
    13 KB (1,986 words) - 17:59, 9 August 2019
  • [https://wiki.haskell.org/OOP_vs_type_classes OOP vs type classes - HaskellWiki]
    28 KB (3,716 words) - 13:01, 20 October 2017
  • ** [[Type|data vs newtype]] (y [[Newtype|aquí]])
    14 KB (2,164 words) - 16:35, 9 October 2016
  • ...load?doi=10.1.1.134.9317&rep=rep1&type=pdf Making a fast curry: push/enter vs. eval/apply for higher-order languages] by Simon Marlow and Simon Peyton Jo
    15 KB (2,396 words) - 07:19, 10 August 2022
  • This is like the confusion between [[Parallelism vs. Concurrency|parallelism and concurrency]].
    16 KB (2,728 words) - 16:45, 23 July 2019
  • ** Duncan Coutts: Lightning talk: "async I/O vs sync I/O" & "[http://new-new-hackage.haskell.org/ Hackage 2]".
    16 KB (2,339 words) - 12:15, 8 April 2014
  • The algorithm used may be a useful thing (backtracking vs NFA/DFA).
    18 KB (2,819 words) - 19:20, 15 August 2019
  • .../setting-up-haskell-in-vs-code-on-macos-d2cc1ce9f60a Setting up Haskell in VS Code on macOS]
    19 KB (2,866 words) - 10:23, 29 March 2022
  • vs.
    20 KB (3,555 words) - 06:05, 24 April 2024
  • [https://wiki.haskell.org/OOP_vs_type_classes OOP vs type classes - HaskellWiki]
    34 KB (2,180 words) - 13:00, 20 October 2017
  • ...ension-CApiFFI User's Guide])!'''<ref>Oleg Grenrus/phadej on <tt>capi</tt> vs <tt>ccall</tt>: [https://mail.haskell.org/pipermail/haskell-cafe/2021-June/ [http://breaks.for.alienz.org/blog/2012/05/23/ffi-vs-primops/ Here] is a comparison of the different approaches on a specific ca
    33 KB (5,008 words) - 16:46, 20 December 2023
  • getVar v = do vs <- gets vars return $ lookup v vs
    169 KB (26,630 words) - 00:15, 19 September 2021
  • ...rting functional dependencies to type families: "[[Functional dependencies vs. type families]]"
    42 KB (6,828 words) - 17:15, 4 February 2023
  • solve' a (x,y) (v:vs) = do writeBoard a (x,y) v -- put a guess onto the board solve' a (x,y) vs -- recurse over the remainder of the list
    67 KB (9,593 words) - 05:40, 9 March 2021
  • classes in type inference, Int vs. Integer, etc. These problems were a
    40 KB (6,259 words) - 05:49, 6 June 2020
  • ...e, so there's a simpler constructor we'll use instead (note the lower case vs upper case):
    40 KB (6,787 words) - 01:19, 8 April 2014
  • ...y=Relevance aceste] [https://medium.com/@dogwith1eye/setting-up-haskell-in-vs-code-on-macos-d2cc1ce9f60a pagini]), [https://kate-editor.org/ Kate], [http ...ramați în Haskell, cel mai bine configurați un editor de text (Vim, Emacs, VS Code, Atom, Sublime Text, Notepad++, SciTe etc.) sau dacă sunteți pe macO
    39 KB (6,088 words) - 16:59, 30 September 2021
  • ...<code>safe</code>/<code>unsafe</code> (like breaking equational reasoning vs. invoking undefined behaviour (so can corrupt the run-time system))
    82 KB (13,140 words) - 09:07, 3 May 2024