Search results

Jump to navigation Jump to search
  • plus2 = lift (+2) -- plus2 (Pair 2 3) ---> Pair 4 5
    7 KB (1,164 words) - 13:33, 22 May 2024
  • ...t is a palindrome. A palindrome can be read forward or backward; e.g. (x a m a x). ...ust for the fun of it. Do note that it is less efficient then the previous 2 though.
    2 KB (320 words) - 00:08, 8 July 2019
  • ack m 0 = ack (m-1) 1 ack m n = ack (m-1) (ack m (n-1))
    7 KB (356 words) - 07:44, 16 November 2019
  • Prelude> :m + Text.Show.Functions *<math> \sqrt{\ } = \{(0,0), (1,1), (4,2), (9,3), \dots \} </math>
    3 KB (430 words) - 00:30, 1 February 2016
  • poly m = [(n, x) | (n, x) <- zip [1..] $ takeWhile (<10000) $ scanl (+) 1 [m-1,2*m-3..],
    6 KB (979 words) - 10:20, 18 May 2022
  • λ> myLast [1,2,3,4] == Problem 2 ==
    5 KB (719 words) - 05:27, 10 June 2023
  • * (insert-at 'alfa '(a b c d) 2) λ> insertAt 'X' "abcd" 2
    6 KB (890 words) - 05:51, 10 June 2023
  • let maxN = max (minN + 2) n mapM_ (\((m,d,i)) -> io (show m ++ "\t trees") d i) vs
    6 KB (1,055 words) - 23:27, 18 April 2020
  • * Hacker 2 ...framework for writing stateful, elastically scalable, AP microservices. I'm probably going to be working on the cluster rebalancing system. Also, help
    2 KB (362 words) - 15:04, 21 October 2016
  • ..."border-bottom:1px solid #eee">(**) Calculate Euler's totient function phi(m). <span style="float:right"><small>[[99 questions/Solutions/34|Solutions]]< ...ined as the number of positive integers r (1 <= r < m) that are coprime to m.
    6 KB (805 words) - 02:30, 11 June 2023
  • ...d by a list of atoms and terms of the type X-Y (i.e. functor '-' and arity 2). The atoms stand for isolated nodes, the X-Y terms describe edges. If an X arc(m,q,7).
    11 KB (1,679 words) - 06:20, 11 June 2023
  • Current Status: Initial 0.1.0.2 version is available on [http://hackage.haskell.org/cgi-bin/hackage-scripts cube 0.5 `colour` Green `scale` v1x 40 `translate` vy 2
    6 KB (988 words) - 04:52, 26 April 2021
  • ...f selected papers from 6'th Conference on Lisp and Functional Programming, 2:461-493, 1992. (Cited by 469) :John Hughes. Comput. J. 32(2): 98-107 (1989) (Cited by 357)
    3 KB (361 words) - 06:58, 1 June 2022
  • | True = filter isPrime [a,a+2..b] ='''Solution 2.'''=
    5 KB (696 words) - 19:46, 18 January 2014
  • array (0,3) [(0,[100,64,36,16,4]),(1,[81,49,25,9,1]),(2,[]),(3,[])] array (0,3) [(0,[4,16,36,64,100]),(1,[1,9,25,49,81]),(2,[]),(3,[])]
    4 KB (640 words) - 21:05, 6 January 2019
  • 6 & 2 ...1,0)</math> to <math>(4,6)</math> and sends <math>(0,1)</math> to <math>(5,2)</math>. It's easy to see that multiplying a matrix by such a unit vector
    14 KB (2,245 words) - 03:01, 11 April 2015
  • import qualified Data.Map as M { borderWidth = 2
    2 KB (236 words) - 00:49, 27 January 2018
  • import qualified Data.Map as M myKeys conf@(XConfig {XMonad.modMask = modMask}) = M.fromList $
    7 KB (748 words) - 15:19, 6 February 2021
  • p31 = length $ g 200 [200,100,50,20,10,5,2,1] problem_31 = ways [1,2,5,10,20,50,100,200] !!200
    11 KB (1,557 words) - 09:03, 19 September 2014
  • *** A set <math>M</math> *** An identity <math>e \in M</math>
    13 KB (2,245 words) - 15:18, 6 February 2021

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