Search results

Jump to navigation Jump to search
  • ...aris]]で動作します。[[GHC]]をインストールすると、<tt>ghc</tt>と<tt>[[GHC/GHCi | ghci]]</tt>という2つのプログラムが入っているのが確認できます。最初の< :Prelude> <hask>4 ^ 2 - 1</hask>
    17 KB (1,020 words) - 07:22, 9 June 2023
  • ...ut modeling units (seconds, meters, meters per second, etc) in Haskell? I'm particularly interested in getting the typechecker to verify proper usage, ...can't see a good way of handling it without forcing a choice of basis. I'm also not sure how it would work -- the whole point of GA is to incorporate
    3 KB (521 words) - 07:04, 13 September 2016
  • ...e</hask>. This is just a little helper function that takes the two terms I'm unifying, updates them with the MGU so far and calls the actual case-by-cas Right now, the slides themselves are a little broken, so I'm not putting them up yet.
    2 KB (410 words) - 11:26, 13 February 2019
  • ...former was part of [https://hackage.haskell.org/package/transformers-0.5.6.2/docs/Control-Monad-Trans-List.html Control.Monad.Trans.List]. newtype ListT m a = ListT { runListT :: m [a] }
    13 KB (2,036 words) - 13:54, 4 July 2023
  • ...orm. Finally, combine the two predicates in a single predicate tree_string/2 which can be used in both directions. stringToTree :: (Monad m) => String -> m (Tree Char)
    2 KB (372 words) - 03:43, 10 January 2017
  • ...(4+2)</hask> which is 36 compared to <hask>square 4 + 2</hask> which is 16+2=18. average x y = (x+y)/2
    6 KB (1,024 words) - 23:56, 25 June 2021
  • import qualified Data.Map as M keys = \c -> myKeys c `M.union` keys desktopConfig c,
    4 KB (452 words) - 14:23, 2 May 2018
  • ...authenticate package to support more providers (Twitter, Facebook, OpenId 2, etc) * I'm satisfied with Persistent, though there is still plenty to be done in this
    1 KB (194 words) - 18:09, 27 January 2018
  • f k n = f (k+1) $ if even n then div n 2 else 3*n + 1 j n = fst $ foldl' h (1,1) [2..n-1]
    8 KB (1,028 words) - 15:16, 16 September 2015
  • unusual m f g = (m f [1,2,4,7] , m g ['A','C','M'] ) unusual m f g nu se poate infera un (cel mai mic) tip al lui m deoarece m este folosit odata ca <br>
    4 KB (617 words) - 03:01, 9 April 2021
  • three_number_tree = Node (Node Nil 1 Nil) 2 (Node Nil 3 Nil) left :: (MonadPlus m) => t a -> m (t a)
    5 KB (872 words) - 13:14, 2 September 2014
  • primes = 2:3:diff [5,7..] nonprimes multiples p = vip [p*p,p*p+2*p..]
    18 KB (2,583 words) - 20:08, 19 December 2020
  • tree4 = Branch 1 (Branch 2 Empty (Branch 4 Empty Empty)) (Branch 2 Empty Empty)
    12 KB (1,696 words) - 05:35, 11 June 2023
  • ...achieve something similar to currying, see [http://en.wikipedia.org/wiki/S-m-n_theorem Kleene's <math>s^m_n</math> theorem]). So using <math>f:A\times B For all <math>0\leq i<m</math>:
    13 KB (2,068 words) - 23:19, 3 June 2019
  • ;Impure Thoughts 2, B&D not S&M -(''Not licensed for this wiki; see the copy on [http://web.archive.org/web
    2 KB (241 words) - 22:48, 25 March 2017
  • f n = Just (n `mod` 2, n `div` 2) powersOf2 = 1:(map (2*) powersOf2)
    8 KB (1,072 words) - 18:32, 16 January 2017
  • . filter (elem 0) . genSeq [] $ [17,13,11,7,5,3,2] genSeq (do m <- mults 9 1000 x
    12 KB (1,626 words) - 05:45, 9 March 2021
  • f = arr (`div` 2) |<code>first f</code> ⇔ <code>x `div` 2</code>, where <code>x</code> is the first component of the pair
    8 KB (1,315 words) - 00:43, 16 May 2024
  • type Mobit m a = Monad m => m a m >> n === n >> m
    6 KB (1,032 words) - 16:45, 2 December 2020
  • mysqrt 4 + 2 :: Floating a => a mysqrtCPS 4 (+ 2) :: Floating a => a
    10 KB (1,560 words) - 12:02, 15 April 2024

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