Search results

Jump to navigation Jump to search

Page title matches

  • {{Es/Traducción en progreso|titulo=Librerias y Herramientas/Estructuras de Datos}} == Librerias y herramientas para Estructuras de datos en Haskell ==
    10 KB (1,459 words) - 19:29, 15 August 2019

Page text matches

  • A simple utility to repeatedly print <code>"y"</code> to standard output. main = let y = putStrLn "y" >> y in y
    472 bytes (67 words) - 03:24, 26 April 2021
  • and here is the proof that <hask>((.) <$> (:) <*> (:)) = (\y z -> y:y:z)</hask>: \y -> (\x -> (.) (x:)) y (y:) = -- definition of (<*>) for functions
    2 KB (220 words) - 20:45, 28 December 2014
  • gcd' 0 y = y gcd' x y = gcd' (y `mod` x) x
    777 bytes (117 words) - 19:42, 18 January 2014
  • where fCycle (x:xs) (_:y:ys) | x == y = fStart xxs xs
    950 bytes (133 words) - 00:39, 5 February 2019
  • variables (Add x y) = variables x ++ variables y variables (Sub x y) = variables x ++ variables y
    2 KB (315 words) - 08:34, 12 May 2016
  • uncommon x y=common (finalsort (x++y)) common (x:y:zs)
    857 bytes (148 words) - 04:14, 18 June 2021
  • { fie y 2; fie x x-(fie y 1);
    3 KB (276 words) - 15:17, 6 February 2021
  • getReps (y:ys) | y == x = let (f,r) = getReps ys in (y:f, r)
    2 KB (347 words) - 21:03, 20 December 2018
  • data Infix f y = f :- y x -:f:- y = x `f` y
    2 KB (240 words) - 23:49, 18 April 2021
  • Prelude.False ? (_ : y) = y False ? (_ :? y) = y
    847 bytes (121 words) - 23:08, 24 July 2021
  • f <$> x <*> y Since f is not a pure function, it's f :: x -> y -> m c. The correct form would be
    2 KB (365 words) - 18:50, 19 September 2017
  • knightMoves n (x, y) = filter (onBoard n) [(x+2, y+1), (x+2, y-1), (x+1, y+2), (x+1, y-2),
    3 KB (449 words) - 03:45, 10 January 2017
  • g y = bind x y g y = bind x y
    772 bytes (147 words) - 15:19, 6 February 2021
  • add x t@(Branch y l r) = case compare x y of LT -> Branch y (add x l) r
    741 bytes (117 words) - 22:03, 23 April 2021
  • layoutAux x y sep Empty = Empty layoutAux x y sep (Branch a l r) =
    2 KB (299 words) - 03:42, 10 January 2017
  • adjacent = [x | (x,y)<-e,y==nv] ++ [x | (y,x)<-e,y==nv] adjacent = [x | (x,y)<-e,y==nv] ++ [x | (y,x)<-e,y==nv]
    1 KB (163 words) - 03:51, 10 January 2017
  • * y(v) is equal to the depth of the node v in the tree where layoutAux x y Empty = (Empty, x)
    2 KB (337 words) - 03:41, 10 January 2017
  • filter (\(x,y) -> isPrime x && isPrime y) $ goldbach n = head [(x,y) | x <- pr, y <- pr, x+y==n]
    1 KB (226 words) - 19:47, 18 January 2014
  • helper x (y@(a,b):ys) | otherwise = (1,x):y:ys
    3 KB (381 words) - 02:13, 5 March 2019
  • .../code>がIOアクションなら、<code>(x >> y)</code>は<code>x</code>を実行し、結果を破棄し、そのあと<code>y</code>を実行してその結果を返します。 x >> y = x >>= const y
    7 KB (299 words) - 11:39, 22 October 2022
  • quick (h:t)= quick [ y | y <- t , y < h] ++ [h] ++ quick [ y | y <- t , y > h] * { y | y ← t , y < h }
    1 KB (213 words) - 21:55, 5 April 2021
  • (\x -> 2*x*x + y) (\x -> 2*x*x + y)(7)
    878 bytes (133 words) - 16:57, 6 February 2016
  • layoutAux x y Empty = ([], Empty, []) layoutAux x y (Branch a l r) = (ll', Branch (a, (x,y)) l' r', rr')
    4 KB (637 words) - 03:42, 10 January 2017
  • generate (x :+ y) = binaryOp x y add generate (x :- y) = binaryOp x y sub
    3 KB (386 words) - 21:41, 23 April 2021
  • Partial application in Haskell involves passing less than the full number of arguments to a function that takes multiple argumen add x y = x + y
    1 KB (248 words) - 20:05, 13 May 2020
  • $ ./a.out "%a %b %e %H:%M:%S %Z %Y" $ ./a.out "%y-%m-%d"
    543 bytes (78 words) - 15:19, 6 February 2021
  • range x y = [x..y] range x y = take (y-x+1) $ iterate (+1) x
    1 KB (214 words) - 02:08, 5 April 2014
  • adjacent = [x | (x,y)<-e,y==top] ++ [x | (y,x)<-e,y==top]
    714 bytes (91 words) - 03:50, 10 January 2017
  • f x = (\y -> x + y)
    566 bytes (92 words) - 13:53, 1 January 2017
  • adjacent = [x | (x,y)<-e,y==top] ++ [x | (y,x)<-e,y==top]
    1 KB (123 words) - 03:51, 10 January 2017
  • ...module <hask>Mod</hask> exports four functions named <hask>x</hask>, <hask>y</hask>, <hask>z</hask>, and <hask>(+++)</hask>... | <hask>x, y, z, (+++), Mod.x, Mod.y, Mod.z, (Mod.+++)</hask>
    4 KB (659 words) - 10:27, 14 January 2024
  • ...go ls = [ x ++ [snd y] | x <- ls, y <- g, last x == fst y, not (snd y `elem` tail x)]
    1 KB (153 words) - 06:29, 31 July 2021
  • y:ys -> h y ys y:ys -> uncurry h $ viewRTotal y ys
    3 KB (506 words) - 04:03, 4 September 2017
  • tfs (x:y:xs) | y == ',' || y == ')' = return (y:xs, Branch x Empty Empty)
    2 KB (372 words) - 03:43, 10 January 2017
  • (Key _ x) `mappend` (Key k y) = Key k (x `mappend` y) measure (Elem x y) = Key x y
    2 KB (315 words) - 15:19, 6 February 2021
  • edgeIn g (x,y) = elem y (adjacent g x) weight x y g = head [c | (a,c) <- g!x, a == y]
    1 KB (189 words) - 03:50, 10 January 2017
  • \x y -> ... fun x y -> ...
    2 KB (293 words) - 16:34, 15 May 2023
  • polar (x, y) = atan2 (y - y0) (x - x0) grahamScan' xs [y] = y : xs
    2 KB (298 words) - 03:42, 14 August 2021
  • > mul xs ys = do x<-xs; y<-ys; return (x*y) > mul x' y' = do x<-x'; y<-y' return (x*y)
    3 KB (320 words) - 15:53, 21 June 2018
  • !y -> h y u2 !y -> h y u2
    13 KB (2,108 words) - 12:52, 1 January 2024
  • Or I could make a nameless function of two parameters, x and y: <hask>\x y -> x + y</hask>, which could be applied like so:
    2 KB (296 words) - 06:56, 12 April 2021
  • where swap (x,y) = (y,x)
    722 bytes (109 words) - 19:45, 18 January 2014
  • safeDiv x y = Right (x `div` y)
    877 bytes (61 words) - 02:13, 14 November 2023
  • y <- x case y of
    4 KB (707 words) - 09:43, 9 December 2014
  • f x = y where y = ... x ...
    4 KB (716 words) - 07:41, 26 January 2019
  • ...gy to the "right hand rule" convention which assigns an ordering to the "x y and z" axes and determines that z will be "out of" rather than "into" the p The mid points of the 27 small cubes are (x,y,z) where x,y,z ∈ {-10,0,10}.
    8 KB (1,020 words) - 01:02, 23 September 2018
  • scoreFrame (x:y:rest) | x+y < 10 = (x+y,rest) addFrame (total,x:y:rest) | x+y < 10 = (total+x+y ,rest)
    4 KB (555 words) - 15:19, 6 February 2021
  • ...k> if i pieces can be bought, and moreover it can be done by x boxes of 6, y boxes of 9, and z boxes of 20. Below the code for <hask>buy</hask> is more Just(x,y,z) -> Just(x+1,y,z)
    6 KB (929 words) - 06:42, 21 November 2020
  • gray' n = (gl . gr) [] where gl y = foldr (\s acc -> ('0':s):acc) y gp gr y = foldl (\acc s -> ('1':s):acc) y gp
    2 KB (298 words) - 03:02, 7 June 2021
  • let y = sum [0..47] in x `seq` 3 + y + y^2
    4 KB (716 words) - 14:44, 8 January 2024

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