2016-10-24 21:26:42 +02:00
|
|
|
-- Copyright 2016 TensorFlow authors.
|
|
|
|
--
|
|
|
|
-- Licensed under the Apache License, Version 2.0 (the "License");
|
|
|
|
-- you may not use this file except in compliance with the License.
|
|
|
|
-- You may obtain a copy of the License at
|
|
|
|
--
|
|
|
|
-- http://www.apache.org/licenses/LICENSE-2.0
|
|
|
|
--
|
|
|
|
-- Unless required by applicable law or agreed to in writing, software
|
|
|
|
-- distributed under the License is distributed on an "AS IS" BASIS,
|
|
|
|
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
|
|
|
|
-- See the License for the specific language governing permissions and
|
|
|
|
-- limitations under the License.
|
|
|
|
|
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
{-# LANGUAGE OverloadedLists #-}
|
|
|
|
{-# LANGUAGE ScopedTypeVariables #-}
|
|
|
|
|
|
|
|
module Main where
|
|
|
|
|
|
|
|
import Control.Monad.IO.Class (liftIO)
|
2017-03-21 02:16:38 +01:00
|
|
|
import Lens.Family2 ((^.), (.~))
|
2016-10-24 21:26:42 +02:00
|
|
|
import Data.List (sort)
|
|
|
|
import Proto.Tensorflow.Core.Framework.Graph
|
|
|
|
( node )
|
|
|
|
import Proto.Tensorflow.Core.Framework.NodeDef
|
|
|
|
( NodeDef
|
|
|
|
, device
|
|
|
|
, name
|
|
|
|
, op )
|
|
|
|
import TensorFlow.Build
|
|
|
|
( Build
|
|
|
|
, BuildT
|
|
|
|
, asGraphDef
|
|
|
|
, evalBuildT
|
|
|
|
, flushNodeBuffer
|
|
|
|
, withDevice
|
|
|
|
, withNameScope
|
2017-03-21 02:16:38 +01:00
|
|
|
, opName
|
2016-10-24 21:26:42 +02:00
|
|
|
)
|
2016-12-15 03:53:06 +01:00
|
|
|
import TensorFlow.Types (unScalar)
|
2016-10-24 21:26:42 +02:00
|
|
|
import TensorFlow.Ops
|
|
|
|
( add
|
|
|
|
, assign
|
|
|
|
, constant
|
|
|
|
, initializedVariable
|
|
|
|
, variable
|
2017-03-21 02:16:38 +01:00
|
|
|
, variable'
|
2016-10-24 21:26:42 +02:00
|
|
|
)
|
|
|
|
import TensorFlow.Output (Device(..))
|
2017-04-07 00:10:33 +02:00
|
|
|
import TensorFlow.Tensor
|
|
|
|
( colocateWith
|
|
|
|
, render
|
|
|
|
, Tensor
|
|
|
|
, Value
|
|
|
|
, Ref
|
|
|
|
)
|
2016-10-24 21:26:42 +02:00
|
|
|
import TensorFlow.Session
|
2017-03-18 20:08:53 +01:00
|
|
|
( run
|
2016-10-24 21:26:42 +02:00
|
|
|
, runSession
|
|
|
|
, run_
|
|
|
|
)
|
2017-05-11 00:26:03 +02:00
|
|
|
import Test.Framework (defaultMain, Test)
|
2016-10-24 21:26:42 +02:00
|
|
|
import Test.Framework.Providers.HUnit (testCase)
|
|
|
|
import Test.HUnit ((@=?))
|
|
|
|
import qualified Data.Vector as V
|
|
|
|
|
2017-03-21 02:16:38 +01:00
|
|
|
-- | Test 'opName' behavior.
|
|
|
|
testOpName :: Test
|
|
|
|
testOpName = testCase "testOpName" $ do
|
2017-04-07 00:10:33 +02:00
|
|
|
let graph = variable' (opName .~ "foo") [] :: Build (Tensor Ref Float)
|
2016-10-24 21:26:42 +02:00
|
|
|
nodeDef :: NodeDef
|
|
|
|
nodeDef = head $ asGraphDef graph ^. node
|
2017-03-21 02:16:38 +01:00
|
|
|
"Variable" @=? (nodeDef ^. op)
|
2016-10-24 21:26:42 +02:00
|
|
|
"foo" @=? (nodeDef ^. name)
|
|
|
|
|
|
|
|
-- | Test that "run" will render and extend any pure ops that haven't already
|
|
|
|
-- been rendered.
|
2016-11-18 19:42:02 +01:00
|
|
|
testPureRender :: Test
|
2016-10-24 21:26:42 +02:00
|
|
|
testPureRender = testCase "testPureRender" $ runSession $ do
|
|
|
|
result <- run $ 2 `add` 2
|
|
|
|
liftIO $ 4 @=? (unScalar result :: Float)
|
|
|
|
|
|
|
|
-- | Test that "run" assigns any previously accumulated initializers.
|
2016-11-18 19:42:02 +01:00
|
|
|
testInitializedVariable :: Test
|
2016-10-24 21:26:42 +02:00
|
|
|
testInitializedVariable =
|
|
|
|
testCase "testInitializedVariable" $ runSession $ do
|
2017-03-18 20:08:53 +01:00
|
|
|
(formula, reset) <- do
|
2016-10-24 21:26:42 +02:00
|
|
|
v <- initializedVariable 42
|
|
|
|
r <- assign v 24
|
|
|
|
return (1 `add` v, r)
|
|
|
|
result <- run formula
|
|
|
|
liftIO $ 43 @=? (unScalar result :: Float)
|
|
|
|
run_ reset -- Updates v to a different value
|
|
|
|
rerunResult <- run formula
|
|
|
|
liftIO $ 25 @=? (unScalar rerunResult :: Float)
|
|
|
|
|
2016-11-18 19:42:02 +01:00
|
|
|
testInitializedVariableShape :: Test
|
2016-10-24 21:26:42 +02:00
|
|
|
testInitializedVariableShape =
|
|
|
|
testCase "testInitializedVariableShape" $ runSession $ do
|
2017-03-18 20:08:53 +01:00
|
|
|
vector <- initializedVariable (constant [1] [42 :: Float])
|
2016-10-24 21:26:42 +02:00
|
|
|
result <- run vector
|
|
|
|
liftIO $ [42] @=? (result :: V.Vector Float)
|
|
|
|
|
|
|
|
-- | Test nameScoped behavior.
|
2016-11-18 19:42:02 +01:00
|
|
|
testNameScoped :: Test
|
2016-10-24 21:26:42 +02:00
|
|
|
testNameScoped = testCase "testNameScoped" $ do
|
|
|
|
let graph = withNameScope "foo" $ variable [] :: Build (Tensor Ref Float)
|
|
|
|
nodeDef :: NodeDef
|
|
|
|
[nodeDef] = asGraphDef graph ^. node
|
|
|
|
"foo/Variable_0" @=? (nodeDef ^. name) -- TODO: Check prefix.
|
|
|
|
"Variable" @=? (nodeDef ^. op)
|
|
|
|
|
2017-03-21 02:16:38 +01:00
|
|
|
-- | Test combined opName and nameScoped behavior.
|
2016-11-18 19:42:02 +01:00
|
|
|
testNamedAndScoped :: Test
|
2016-10-24 21:26:42 +02:00
|
|
|
testNamedAndScoped = testCase "testNamedAndScoped" $ do
|
|
|
|
let graph :: Build (Tensor Ref Float)
|
2017-03-21 02:16:38 +01:00
|
|
|
graph = withNameScope "foo1" (variable' (opName .~ "bar1") [])
|
2016-10-24 21:26:42 +02:00
|
|
|
nodeDef :: NodeDef
|
|
|
|
nodeDef = head $ asGraphDef graph ^. node
|
2017-03-21 02:16:38 +01:00
|
|
|
"Variable" @=? (nodeDef ^. op)
|
2016-10-24 21:26:42 +02:00
|
|
|
"foo1/bar1" @=? (nodeDef ^. name)
|
|
|
|
|
|
|
|
-- | Flush the node buffer and sort the nodes by name (for more stable tests).
|
|
|
|
flushed :: Ord a => (NodeDef -> a) -> BuildT IO [a]
|
2017-03-18 20:08:53 +01:00
|
|
|
flushed field = sort . map field <$> flushNodeBuffer
|
2016-10-24 21:26:42 +02:00
|
|
|
|
|
|
|
-- | Test the interaction of rendering, CSE and scoping.
|
2016-11-18 19:42:02 +01:00
|
|
|
testRenderDedup :: Test
|
2016-10-24 21:26:42 +02:00
|
|
|
testRenderDedup = testCase "testRenderDedup" $ evalBuildT $ do
|
2017-03-18 20:08:53 +01:00
|
|
|
renderNodes
|
2016-10-24 21:26:42 +02:00
|
|
|
names <- flushed (^. name)
|
|
|
|
liftIO $ ["Const_1", "Variable_0", "Variable_2"] @=? names
|
|
|
|
-- Render the nodes in a different scope, which should cause them
|
|
|
|
-- to be distinct from the previous ones.
|
2017-03-18 20:08:53 +01:00
|
|
|
withNameScope "foo" renderNodes
|
2016-10-24 21:26:42 +02:00
|
|
|
scopedNames <- flushed (^. name)
|
|
|
|
liftIO $ ["foo/Const_4", "foo/Variable_3", "foo/Variable_5"] @=? scopedNames
|
|
|
|
where
|
|
|
|
renderNodes = do
|
|
|
|
-- A stateful op and a pure op.
|
|
|
|
_ :: Tensor Ref Float <- variable []
|
|
|
|
_ :: Tensor Value Float <- render 3
|
|
|
|
-- Another stateful op, and a pure op which should be
|
|
|
|
-- deduped with the previous one.
|
|
|
|
_ :: Tensor Ref Float <- variable []
|
|
|
|
_ :: Tensor Value Float <- render 3
|
|
|
|
return ()
|
|
|
|
|
|
|
|
-- | Test the interaction of rendering, CSE and scoping.
|
2016-11-18 19:42:02 +01:00
|
|
|
testDeviceColocation :: Test
|
2016-10-24 21:26:42 +02:00
|
|
|
testDeviceColocation = testCase "testDeviceColocation" $ evalBuildT $ do
|
2017-03-18 20:08:53 +01:00
|
|
|
renderNodes
|
2016-10-24 21:26:42 +02:00
|
|
|
devices <- flushed (\x -> (x ^. name, x ^. device))
|
|
|
|
liftIO $ [ ("Add_2","dev0")
|
|
|
|
, ("Const_1","dev0")
|
|
|
|
, ("Variable_0","dev0")] @=? devices
|
|
|
|
where
|
|
|
|
renderNodes = do
|
|
|
|
-- A stateful op and a pure op.
|
|
|
|
var :: Tensor Ref Float <- withDevice (Just $ Device "dev0") $ variable []
|
|
|
|
-- Uses render to cause the expression be added to the graph.
|
|
|
|
_ <- colocateWith var $ render $ 3 `add` var
|
|
|
|
return ()
|
|
|
|
|
|
|
|
main :: IO ()
|
2017-05-11 00:26:03 +02:00
|
|
|
main = defaultMain
|
|
|
|
[ testInitializedVariable
|
|
|
|
, testInitializedVariableShape
|
|
|
|
, testDeviceColocation
|
|
|
|
, testOpName
|
|
|
|
, testNameScoped
|
|
|
|
, testNamedAndScoped
|
|
|
|
, testPureRender
|
|
|
|
, testRenderDedup
|
|
|
|
]
|