-- | This module contains test data taken from "Elements of Statistical
-- Learning".
--
-- TODO correct citation

module TestData.Elements where

import qualified Data.Vector.Unboxed as VU
import Statistics.EM.GMM

table_8_1 :: VU.Vector Double
table_8_1 = VU.fromList [ -0.39, 0.12, 0.94, 1.67, 1.76, 2.44, 3.72, 4.28, 4.92, 5.53
                        ,  0.06, 0.48, 1.01, 1.68, 1.80, 3.25, 4.12, 4.60, 5.28, 6.22 ]