module Cube where import Face import FunctionValues --import Grid import Point import ThreeDimensional data Cube = Cube { h :: Double, i :: Int, j :: Int, k :: Int, fv :: FunctionValues } deriving (Eq) instance Show Cube where show c = "Cube_" ++ (show (i c)) ++ "," ++ (show (j c)) ++ "," ++ (show (k c)) ++ " (Center: " ++ (show (center c)) ++ ")" ++ " (xmin: " ++ (show (xmin c)) ++ ")" ++ " (xmax: " ++ (show (xmax c)) ++ ")" ++ " (ymin: " ++ (show (ymin c)) ++ ")" ++ " (ymax: " ++ (show (ymax c)) ++ ")" ++ " (zmin: " ++ (show (zmin c)) ++ ")" ++ " (zmax: " ++ (show (zmax c)) ++ ")" empty_cube :: Cube empty_cube = Cube 0 0 0 0 empty_values -- | The left-side boundary of the cube. See Sorokina and Zeilfelder, -- p. 76. xmin :: Cube -> Double xmin c = (2*i' - 1)*delta / 2 where i' = fromIntegral (i c) :: Double delta = h c -- | The right-side boundary of the cube. See Sorokina and Zeilfelder, -- p. 76. xmax :: Cube -> Double xmax c = (2*i' + 1)*delta / 2 where i' = fromIntegral (i c) :: Double delta = h c -- | The front boundary of the cube. See Sorokina and Zeilfelder, -- p. 76. ymin :: Cube -> Double ymin c = (2*j' - 1)*delta / 2 where j' = fromIntegral (j c) :: Double delta = h c -- | The back boundary of the cube. See Sorokina and Zeilfelder, -- p. 76. ymax :: Cube -> Double ymax c = (2*j' + 1)*delta / 2 where j' = fromIntegral (j c) :: Double delta = h c -- | The bottom boundary of the cube. See Sorokina and Zeilfelder, -- p. 76. zmin :: Cube -> Double zmin c = (2*k' - 1)*delta / 2 where k' = fromIntegral (k c) :: Double delta = h c -- | The top boundary of the cube. See Sorokina and Zeilfelder, -- p. 76. zmax :: Cube -> Double zmax c = (2*k' + 1)*delta / 2 where k' = fromIntegral (k c) :: Double delta = h c instance ThreeDimensional Cube where -- | The center of Cube_ijk coincides with v_ijk at -- (ih, jh, kh). See Sorokina and Zeilfelder, p. 76. center c = (x, y, z) where delta = h c i' = fromIntegral (i c) :: Double j' = fromIntegral (j c) :: Double k' = fromIntegral (k c) :: Double x = delta * i' y = delta * j' z = delta * k' contains_point c p | (x_coord p) < (xmin c) = False | (x_coord p) > (xmax c) = False | (y_coord p) < (ymin c) = False | (y_coord p) > (ymax c) = False | (z_coord p) < (zmin c) = False | (z_coord p) > (zmax c) = False | otherwise = True -- instance Num Cube where -- (Cube g1 i1 j1 k1 d1) + (Cube _ i2 j2 k2 d2) = -- Cube g1 (i1 + i2) (j1 + j2) (k1 + k2) (d1 + d2) -- (Cube g1 i1 j1 k1 d1) - (Cube _ i2 j2 k2 d2) = -- Cube g1 (i1 - i2) (j1 - j2) (k1 - k2) (d1 - d2) -- (Cube g1 i1 j1 k1 d1) * (Cube _ i2 j2 k2 d2) = -- Cube g1 (i1 * i2) (j1 * j2) (k1 * k2) (d1 * d2) -- abs (Cube g1 i1 j1 k1 d1) = -- Cube g1 (abs i1) (abs j1) (abs k1) (abs d1) -- signum (Cube g1 i1 j1 k1 d1) = -- Cube g1 (signum i1) (signum j1) (signum k1) (signum d1) -- fromInteger x = empty_cube { datum = (fromIntegral x) } -- instance Fractional Cube where -- (Cube g1 i1 j1 k1 d1) / (Cube _ _ _ _ d2) = -- Cube g1 i1 j1 k1 (d1 / d2) -- recip (Cube g1 i1 j1 k1 d1) = -- Cube g1 i1 j1 k1 (recip d1) -- fromRational q = empty_cube { datum = fromRational q } -- | Return the cube corresponding to the grid point i,j,k. The list -- of cubes is stored as [z][y][x] but we'll be requesting it by -- [x][y][z] so we flip the indices in the last line. -- cube_at :: Grid -> Int -> Int -> Int -> Cube -- cube_at g i' j' k' -- | i' >= length (function_values g) = Cube g i' j' k' 0 -- | i' < 0 = Cube g i' j' k' 0 -- | j' >= length ((function_values g) !! i') = Cube g i' j' k' 0 -- | j' < 0 = Cube g i' j' k' 0 -- | k' >= length (((function_values g) !! i') !! j') = Cube g i' j' k' 0 -- | k' < 0 = Cube g i' j' k' 0 -- | otherwise = -- (((cubes g) !! k') !! j') !! i' -- Face stuff. -- | The top (in the direction of z) face of the cube. top_face :: Cube -> Face top_face c = Face v0' v1' v2' v3' where delta = (1/2)*(h c) v0' = (center c) + (-delta, delta, delta) v1' = (center c) + (delta, delta, delta) v2' = (center c) + (delta, -delta, delta) v3' = (center c) + (-delta, -delta, delta) -- | The back (in the direction of x) face of the cube. back_face :: Cube -> Face back_face c = Face v0' v1' v2' v3' where delta = (1/2)*(h c) v0' = (center c) + (delta, delta, delta) v1' = (center c) + (delta, delta, -delta) v2' = (center c) + (delta, -delta, -delta) v3' = (center c) + (delta, -delta, delta) -- The bottom face (in the direction of -z) of the cube. down_face :: Cube -> Face down_face c = Face v0' v1' v2' v3' where delta = (1/2)*(h c) v0' = (center c) + (delta, delta, -delta) v1' = (center c) + (-delta, delta, -delta) v2' = (center c) + (-delta, -delta, -delta) v3' = (center c) + (delta, -delta, -delta) -- | The front (in the direction of -x) face of the cube. front_face :: Cube -> Face front_face c = Face v0' v1' v2' v3' where delta = (1/2)*(h c) v0' = (center c) + (-delta, delta, -delta) v1' = (center c) + (-delta, delta, delta) v2' = (center c) + (-delta, -delta, delta) v3' = (center c) + (-delta, -delta, -delta) -- | The left (in the direction of -y) face of the cube. left_face :: Cube -> Face left_face c = Face v0' v1' v2' v3' where delta = (1/2)*(h c) v0' = (center c) + (-delta, -delta, delta) v1' = (center c) + (delta, -delta, delta) v2' = (center c) + (delta, -delta, -delta) v3' = (center c) + (-delta, -delta, -delta) -- | The right (in the direction of y) face of the cube. right_face :: Cube -> Face right_face c = Face v0' v1' v2' v3' where delta = (1/2)*(h c) v0' = (center c) + (-delta, delta, -delta) v1' = (center c) + (delta, delta, -delta) v2' = (center c) + (delta, delta, delta) v3' = (center c) + (-delta, delta, delta)