Search results

Jump to navigation Jump to search

Page title matches

  • ...ions for additive groups, vector spaces and affine spaces. There are also vector space bases and a general notion of linear maps (linear transformations). Besides this wiki page, here are more ways to find out about vector-space:
    1 KB (196 words) - 08:45, 12 March 2011
  • * {{HackagePackage|id=vector}} ...fe on [http://www.haskell.org/pipermail/haskell-cafe/2008-July/045229.html vector vs uvector]
    856 bytes (108 words) - 19:08, 27 April 2012
  • ...pt for <hask>Data.LinearMap</hask>. Until this code is removed, the <code>vector-space</code> package depends on <code>OpenGL</code>. * Changed repo location from darcs.haskell.org to http://code.haskell.org/vector-space.
    3 KB (384 words) - 19:07, 11 November 2008
  • [http://hackage.haskell.org/package/vector Vector] is a Haskell library for working with arrays. It has an emphasis on very h The vector library has an API similar to the famous Haskell list library, with many o
    23 KB (3,342 words) - 19:28, 25 April 2013

Page text matches

  • ...ions for additive groups, vector spaces and affine spaces. There are also vector space bases and a general notion of linear maps (linear transformations). Besides this wiki page, here are more ways to find out about vector-space:
    1 KB (196 words) - 08:45, 12 March 2011
  • ...imilar for a 2-vector. However, if you find yourself wanting to do lots of vector arithmetic, that becomes annoying quite quickly. Below is what I use; feel module Vector where
    2 KB (410 words) - 14:10, 18 April 2007
  • data Vector = Vector { x :: Float; y :: Float; }
    3 KB (430 words) - 11:59, 19 April 2021
  • type Vector a = Array a -- Rank 1! zilde :: Vector a -- Empty vector, rank 1
    7 KB (1,192 words) - 06:36, 29 June 2012
  • type Vector = (Double, Double) sub :: Vector -> Vector -> Vector
    9 KB (1,266 words) - 10:51, 12 February 2010
  • import Data.Array.Vector import Data.Array.Vector.Algorithms.Merge
    887 bytes (126 words) - 23:15, 22 December 2009
  • Here is a reimplementation using the vector and matrix types from the hmatrix package: cross :: Vector Double -> Vector Double -> Vector Double
    5 KB (922 words) - 15:33, 18 November 2008
  • * {{HackagePackage|id=vector}} ...fe on [http://www.haskell.org/pipermail/haskell-cafe/2008-July/045229.html vector vs uvector]
    856 bytes (108 words) - 19:08, 27 April 2012
  • n = 10000 -- vector length range = (-100, 100) -- range of vector elements
    1 KB (137 words) - 04:34, 25 January 2011
  • ! !! vector ('''e.g.''' <code>V2</code>) !! [http://projects.haskell.org/diagrams/haddo ! vector ('''e.g.''' <code>V2</code>)
    3 KB (373 words) - 20:53, 2 June 2017
  • Another useful function takes a cell ID and returns a vector, which is the center of that cell, as if the whole grid were mapped to a sp (I use GlomeVec for my vector library. One could substitute a different library with some minor modifica
    2 KB (370 words) - 03:35, 24 January 2010
  • data Vector = Vector Int Int deriving (Eq, Show) data Matrix = Matrix Vector Vector deriving (Eq, Show)
    4 KB (706 words) - 22:41, 21 July 2021
  • functional style. A bounding region for a vector space V with shortest vector in the direction of v whose perpendicular
    6 KB (1,055 words) - 19:38, 21 December 2011
  • data Vector :: * -> Nat -> * where VNil :: Vector a Zero
    2 KB (289 words) - 16:02, 28 February 2014
  • ...ntum subsystems, not necessarily of the same type, can be represented in a vector space considered to be a tensor product of the subspaces. ...e inner product and show that our Bra and Ket can be indeed considered the vector spaces with inner product.
    5 KB (715 words) - 13:59, 26 January 2010
  • [http://haskell.org/sitewiki/images/4/4e/Hackathon-utrecht.svg Vector Hackathon Logo] [http://haskell.org/sitewiki/images/c/ca/Hackathon-outline.svg Outline Vector]
    2 KB (261 words) - 14:01, 30 June 2009
  • ...res (<hask>ifThenElse</hask>, <hask>whileLoop</hask>, <hask>Maybe</hask>), vector instructions, automatic adaption to target specific extensions ...gePackage|id=synthesizer-llvm}} provides efficient signal processing using vector instructions, including a live [[Synthesizer|software synthesizer]]
    2 KB (204 words) - 11:22, 2 October 2020
  • A trebuit implementata si o citire pentru elementele unui vector.
    357 bytes (50 words) - 04:10, 14 August 2021
  • [http://hackage.haskell.org/package/vector Vector] is a Haskell library for working with arrays. It has an emphasis on very h The vector library has an API similar to the famous Haskell list library, with many o
    23 KB (3,342 words) - 19:28, 25 April 2013
  • ...pt for <hask>Data.LinearMap</hask>. Until this code is removed, the <code>vector-space</code> package depends on <code>OpenGL</code>. * Changed repo location from darcs.haskell.org to http://code.haskell.org/vector-space.
    3 KB (384 words) - 19:07, 11 November 2008

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