Search results

Jump to navigation Jump to search
  • g x = sqrt y + x g y x = sqrt y + x
    3 KB (453 words) - 19:08, 19 January 2011
  • taylor_n_bound = sqrt $ sqrt epsilon
    711 bytes (109 words) - 16:35, 15 November 2006
  • normize v = (1/sqrt (dot v v)).*v tetrahed = [V (x*sqrt 1.5) (-sqrt 2/3) (-1/3)|x<-[-1,1]]++
    5 KB (922 words) - 15:33, 18 November 2008
  • f x = sqrt ( fromIntegral f x = sqrt (fromIntegral ((x * 10133123) `mod` 1231111121 :: Int))
    3 KB (355 words) - 20:09, 18 January 2007
  • ...atural numbers ''n <= sqrt k''. We need only check the '''''primes''' p <= sqrt k'': where s = floor $ sqrt $ fromIntegral n
    3 KB (432 words) - 07:06, 11 May 2016
  • Rationals are precise but <hask>pi</hask> and <hask>sqrt 2</hask> are not rational. isSquare n = (round . sqrt $ fromIntegral n) ^ 2 == n
    6 KB (847 words) - 12:16, 29 December 2010
  • xm=floor$sqrt $fromIntegral c f(-2) z = xy/sqrt(x^2 + y^2)
    7 KB (1,180 words) - 01:49, 13 February 2010
  • ( sqrt ( -delta ) / ( 2 * a ) ) |otherwise = Real ( ( -b + sqrt ( delta ) ) / ( 2 * a ) )
    4 KB (640 words) - 05:52, 20 November 2008
  • (a2 + sqrt dk) (a2 + sqrt dk)
    13 KB (1,795 words) - 04:56, 17 July 2007
  • evenFib n = round $ (2 + sqrt 5) ** (fromIntegral n) / sqrt 5 floor $ (log (fromIntegral n - 0.5) + 0.5*log 5) / log (2 + sqrt 5)
    6 KB (881 words) - 02:31, 8 May 2016
  • m = (truncate (sqrt (fromIntegral r)) + n) `div` d where x = floor . sqrt . fromIntegral $ n
    9 KB (1,356 words) - 13:14, 1 July 2011
  • ...ied to <hask>Floating</hask>-point numbers. Instead, one must write <hask>sqrt (fromIntegral n)</hask> to explicitly convert <hask>n</hask> to a floating-
    6 KB (867 words) - 01:28, 14 April 2016
  • ...ch is slightly more verbose but only checks for primality up to (ceiling $ sqrt n); and is thus much faster. factor n = let divisors = dropWhile ((/= 0) . mod n) [2 .. ceiling $ sqrt $ fromIntegral n]
    3 KB (485 words) - 19:45, 18 January 2014
  • isSquare n = (round . sqrt $ fromIntegral n) ^ 2 == n len = (sqrt . normSq) v
    9 KB (1,266 words) - 10:51, 12 February 2010
  • vmag = sqrt . vmag_sqr
    2 KB (410 words) - 14:10, 18 April 2007
  • ratio = toRational (2/(1+sqrt(5)::Double)) -- golden
    2 KB (204 words) - 18:56, 26 October 2009
  • | otherwise = sqrt $! vBv / vv | otherwise = sqrt $! vBv / vv
    16 KB (2,603 words) - 06:09, 21 February 2010
  • in (divided, sqrt norm2) divideBySqrtIInorm2 vector scalar = scaleIInorm2 vector (1 / sqrt scalar)
    12 KB (1,607 words) - 10:48, 12 February 2010
  • ...plied to too few arguments (perhaps none) like <code>(+) 2</code> or <code>sqrt</code>.
    2 KB (253 words) - 22:16, 5 April 2021
  • mysqrt a = sqrt a mysqrtCPS a k = k (sqrt a)
    10 KB (1,560 words) - 12:02, 15 April 2024

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