Search results

Jump to navigation Jump to search
  • goldbachList' n m i = filter (\(x,y) -> x > i && y > i) $ goldbachList n m
    992 bytes (161 words) - 19:48, 18 January 2014
  • compress (RPair s t) (x,y) = compress s x ++ compress t y y <- bar t
    8 KB (1,072 words) - 18:32, 16 January 2017
  • pattern Snd y <- (x, y)
    2 KB (138 words) - 12:11, 22 November 2023
  • |<haskell>(m >>= (\x -> g x)) >>= (\y -> h y)</haskell> |<haskell> m >>= (\x -> g x >>= (\y -> h y))</haskell>
    5 KB (788 words) - 10:40, 1 February 2024
  • loop (y:ys) | y == '-' = (not . null) ys && isAlphaNum (head ys) && loop (tail ys) | isAlphaNum y = loop ys
    2 KB (346 words) - 03:47, 10 January 2017
  • union (x:xs) (y:ys) = case (compare x y) of LT -> x : union xs (y:ys)
    3 KB (432 words) - 07:06, 11 May 2016
  • apply Plus x y = Just (x + y) apply Minus x y = Just (x - y)
    5 KB (621 words) - 15:30, 8 June 2017
  • | updatePointer (Relative x y) || updatePointer (x,y) (1,1) | updatePointer (TowardsCentre x y) || updatePointer (0.5,0.5) (x,y)
    3 KB (495 words) - 23:20, 27 June 2016
  • parsePrices [x,y] = zip (words x) (map read. words $ y)
    1 KB (177 words) - 22:56, 5 April 2021
  • coord1ToCoord2 (x, y) = (x/500, (500-y)/500) coord2ToCoord1 (x, y) = (500/(1/x), 500 - 500/(1/y))
    6 KB (867 words) - 01:28, 14 April 2016
  • encodeModified xs = [y | x <- group xs, let y = if (length x) == 1 then Single (head x) else Multiple (length x) (head x)
    1 KB (196 words) - 19:31, 18 January 2014
  • f x y = g (x,y) ...ngly, associates ''to the left'': <hask>f x y</hask> is really <hask>(f x) y</hask>, so the types fit. <br><br>
    4 KB (669 words) - 02:17, 3 November 2023
  • ...at for any nodes X,Y of N1, X and Y are adjacent if and only if f(X) and f(Y) are adjacent.
    2 KB (287 words) - 03:50, 10 January 2017
  • Prelude> let concatPrint x y = putStrLn $ (++) x y
    1 KB (159 words) - 23:45, 25 June 2021
  • add (Cons x) (Cons y) = Cons (x+y) -- requires Num constraint on type a
    2 KB (312 words) - 23:26, 19 September 2016
  • ...connected (Graph (x':xs') ys') = not $ any (null) [paths' x' y' ys' | y' <- xs']
    2 KB (281 words) - 03:49, 10 January 2017
  • (x <> y) <> z = x <> (y <> z) ...namely all the elements of <hask>x</hask>, then all the elements of <hask>y</hask>, them all the elements of <hask>z</hask>.
    7 KB (1,101 words) - 02:30, 27 December 2019
  • The current ''Num'' class in the Prelude is (more or less) this Z + y = y
    9 KB (1,395 words) - 23:16, 24 July 2021
  • y <- newSTRef 1 fibST' n x y
    5 KB (802 words) - 05:38, 4 August 2021
  • encode' n x (y:ys) | x == y = encode' (n + 1) x ys
    3 KB (470 words) - 03:45, 19 May 2021

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