source: src/GenPoly/Box.cc @ ae63a18

ADTaaron-thesisarm-ehast-experimentalcleanup-dtorsctordeferred_resndemanglerenumforall-pointer-decaygc_noraiijacob/cs343-translationjenkins-sandboxmemorynew-astnew-ast-unique-exprnew-envno_listpersistent-indexerpthread-emulationqualifiedEnumresolv-newstringwith_gc
Last change on this file since ae63a18 was ae63a18, checked in by Rob Schluntz <rschlunt@…>, 9 years ago

resolving conflicts

  • Property mode set to 100644
File size: 50.4 KB
Line 
1//
2// Cforall Version 1.0.0 Copyright (C) 2015 University of Waterloo
3//
4// The contents of this file are covered under the licence agreement in the
5// file "LICENCE" distributed with Cforall.
6//
7// Box.cc --
8//
9// Author           : Richard C. Bilson
10// Created On       : Mon May 18 07:44:20 2015
11// Last Modified By : Rob Schluntz
12// Last Modified On : Fri Dec 18 14:53:08 2015
13// Update Count     : 217
14//
15
16#include <set>
17#include <stack>
18#include <string>
19#include <iterator>
20#include <algorithm>
21#include <cassert>
22
23#include "Box.h"
24#include "PolyMutator.h"
25#include "FindFunction.h"
26#include "ScrubTyVars.h"
27
28#include "Parser/ParseNode.h"
29
30#include "SynTree/Constant.h"
31#include "SynTree/Type.h"
32#include "SynTree/Expression.h"
33#include "SynTree/Initializer.h"
34#include "SynTree/Statement.h"
35#include "SynTree/Mutator.h"
36
37#include "ResolvExpr/TypeEnvironment.h"
38
39#include "SymTab/Mangler.h"
40
41#include "SemanticError.h"
42#include "UniqueName.h"
43#include "utility.h"
44
45#include <ext/functional> // temporary
46
47namespace GenPoly {
48        namespace {
49                const std::list<Label> noLabels;
50
51                FunctionType *makeAdapterType( FunctionType *adaptee, const TyVarMap &tyVars );
52
53                /// Replaces polymorphic return types with out-parameters, replaces calls to polymorphic functions with adapter calls as needed, and adds appropriate type variables to the function call
54                class Pass1 : public PolyMutator {
55                  public:
56                        Pass1();
57                        virtual Expression *mutate( ApplicationExpr *appExpr );
58                        virtual Expression *mutate( AddressExpr *addrExpr );
59                        virtual Expression *mutate( UntypedExpr *expr );
60                        virtual DeclarationWithType* mutate( FunctionDecl *functionDecl );
61                        virtual TypeDecl *mutate( TypeDecl *typeDecl );
62                        virtual Expression *mutate( CommaExpr *commaExpr );
63                        virtual Expression *mutate( ConditionalExpr *condExpr );
64                        virtual Statement * mutate( ReturnStmt *returnStmt );
65                        virtual Type *mutate( PointerType *pointerType );
66                        virtual Type * mutate( FunctionType *functionType );
67
68                        virtual void doBeginScope();
69                        virtual void doEndScope();
70                  private:
71                        void passTypeVars( ApplicationExpr *appExpr, std::list< Expression *>::iterator &arg, const TyVarMap &exprTyVars );
72                        Expression *addRetParam( ApplicationExpr *appExpr, FunctionType *function, Type *retType, std::list< Expression *>::iterator &arg );
73                        Expression *addPolyRetParam( ApplicationExpr *appExpr, FunctionType *function, std::string typeName, std::list< Expression *>::iterator &arg );
74                        Expression *applyAdapter( ApplicationExpr *appExpr, FunctionType *function, std::list< Expression *>::iterator &arg, const TyVarMap &exprTyVars );
75                        void boxParam( Type *formal, Expression *&arg, const TyVarMap &exprTyVars );
76                        void boxParams( ApplicationExpr *appExpr, FunctionType *function, std::list< Expression *>::iterator &arg, const TyVarMap &exprTyVars );
77                        void addInferredParams( ApplicationExpr *appExpr, FunctionType *functionType, std::list< Expression *>::iterator &arg, const TyVarMap &tyVars );
78                        void findAssignOps( const std::list< TypeDecl *> &forall );
79                        void passAdapters( ApplicationExpr *appExpr, FunctionType *functionType, const TyVarMap &exprTyVars );
80                        FunctionDecl *makeAdapter( FunctionType *adaptee, FunctionType *realType, const std::string &mangleName, const TyVarMap &tyVars );
81                        Expression *handleIntrinsics( ApplicationExpr *appExpr );
82                        ObjectDecl *makeTemporary( Type *type );
83
84                        typedef std::map< std::string, DeclarationWithType *> AdapterMap;
85                        std::map< std::string, DeclarationWithType *> assignOps;
86                        std::stack< AdapterMap > adapters;
87                        DeclarationWithType *retval;
88                        bool useRetval;
89                        UniqueName tempNamer;
90                };
91
92                /// Moves polymorphic returns in function types to pointer-type parameters, adds type size and assertion parameters to parameter lists as well
93                class Pass2 : public PolyMutator {
94                  public:
95                        template< typename DeclClass >
96                        DeclClass *handleDecl( DeclClass *decl, Type *type );
97                        virtual DeclarationWithType *mutate( FunctionDecl *functionDecl );
98                        virtual ObjectDecl *mutate( ObjectDecl *objectDecl );
99                        virtual TypeDecl *mutate( TypeDecl *typeDecl );
100                        virtual TypedefDecl *mutate( TypedefDecl *typedefDecl );
101                        virtual Type *mutate( PointerType *pointerType );
102                        virtual Type *mutate( FunctionType *funcType );
103                  private:
104                        void addAdapters( FunctionType *functionType );
105
106                        std::map< UniqueId, std::string > adapterName;
107                };
108
109                /// Replaces initialization of polymorphic values with alloca, declaration of dtype/ftype with appropriate void expression, and sizeof expressions of polymorphic types with the proper variable
110                class Pass3 : public PolyMutator {
111                  public:
112                        template< typename DeclClass >
113                        DeclClass *handleDecl( DeclClass *decl, Type *type );
114                        virtual DeclarationWithType *mutate( FunctionDecl *functionDecl );
115                        virtual ObjectDecl *mutate( ObjectDecl *objectDecl );
116                        virtual TypedefDecl *mutate( TypedefDecl *objectDecl );
117                        virtual TypeDecl *mutate( TypeDecl *objectDecl );
118                        virtual Statement *mutate( DeclStmt *declStmt );
119                        virtual Type *mutate( PointerType *pointerType );
120                        virtual Type *mutate( FunctionType *funcType );
121                  private:
122                };
123
124        } // anonymous namespace
125
126        void printAllNotBuiltin( const std::list< Declaration *>& translationUnit, std::ostream &os ) {
127                for ( std::list< Declaration *>::const_iterator i = translationUnit.begin(); i != translationUnit.end(); ++i ) {
128                        if ( ! LinkageSpec::isBuiltin( (*i)->get_linkage() ) ) {
129                                (*i)->print( os );
130                                os << std::endl;
131                        } // if
132                } // for
133        }
134
135        void box( std::list< Declaration *>& translationUnit ) {
136                Pass1 pass1;
137                Pass2 pass2;
138                Pass3 pass3;
139                mutateAll( translationUnit, pass1 );
140                mutateAll( translationUnit, pass2 );
141                mutateAll( translationUnit, pass3 );
142        }
143
144        ////////////////////////////////////////// Pass1 ////////////////////////////////////////////////////
145
146        namespace {
147                std::string makePolyMonoSuffix( FunctionType * function, const TyVarMap &tyVars ) {
148                        std::stringstream name;
149
150                        // NOTE: this function previously used isPolyObj, which failed to produce
151                        // the correct thing in some situations. It's not clear to me why this wasn't working.
152
153                        // if the return type or a parameter type involved polymorphic types, then the adapter will need
154                        // to take those polymorphic types as pointers. Therefore, there can be two different functions
155                        // with the same mangled name, so we need to further mangle the names.
156                        for ( std::list< DeclarationWithType *>::iterator retval = function->get_returnVals().begin(); retval != function->get_returnVals().end(); ++retval ) {
157                                if ( isPolyType( (*retval)->get_type(), tyVars ) ) {
158                                        name << "P";
159                                } else {
160                                        name << "M";
161                                }
162                        }
163                        name << "_";
164                        std::list< DeclarationWithType *> &paramList = function->get_parameters();
165                        for ( std::list< DeclarationWithType *>::iterator arg = paramList.begin(); arg != paramList.end(); ++arg ) {
166                                if ( isPolyType( (*arg)->get_type(), tyVars ) ) {
167                                        name << "P";
168                                } else {
169                                        name << "M";
170                                }
171                        } // for
172                        return name.str();
173                }
174
175                std::string mangleAdapterName( FunctionType * function, const TyVarMap &tyVars ) {
176                        return SymTab::Mangler::mangle( function ) + makePolyMonoSuffix( function, tyVars );
177                }
178
179                std::string makeAdapterName( const std::string &mangleName ) {
180                        return "_adapter" + mangleName;
181                }
182
183                Pass1::Pass1() : useRetval( false ), tempNamer( "_temp" ) {
184                        adapters.push(AdapterMap());
185                }
186
187                // returns true if the given declaration is: (*?=?)(T *, T) for some T (return not checked, but maybe should be)
188                bool checkAssignment( DeclarationWithType *decl, std::string &name ) {
189                        if ( decl->get_name() == "?=?" ) {
190                                if ( PointerType *ptrType = dynamic_cast< PointerType *>( decl->get_type() ) ) {
191                                        if ( FunctionType *funType = dynamic_cast< FunctionType *>( ptrType->get_base() ) ) {
192                                                if ( funType->get_parameters().size() == 2 ) {
193                                                        if ( PointerType *pointer = dynamic_cast< PointerType *>( funType->get_parameters().front()->get_type() ) ) {
194                                                                if ( TypeInstType *typeInst = dynamic_cast< TypeInstType *>( pointer->get_base() ) ) {
195                                                                        if ( TypeInstType *typeInst2 = dynamic_cast< TypeInstType *>( funType->get_parameters().back()->get_type() ) ) {
196                                                                                if ( typeInst->get_name() == typeInst2->get_name() ) {
197                                                                                        name = typeInst->get_name();
198                                                                                        return true;
199                                                                                } // if
200                                                                        } // if
201                                                                } // if
202                                                        } // if
203                                                } // if
204                                        } // if
205                                } // if
206                        } // if
207                        return false;
208                }
209
210                void Pass1::findAssignOps( const std::list< TypeDecl *> &forall ) {
211                        // what if a nested function uses an assignment operator?
212                        // assignOps.clear();
213                        for ( std::list< TypeDecl *>::const_iterator i = forall.begin(); i != forall.end(); ++i ) {
214                                for ( std::list< DeclarationWithType *>::const_iterator assert = (*i)->get_assertions().begin(); assert != (*i)->get_assertions().end(); ++assert ) {
215                                        std::string typeName;
216                                        if ( checkAssignment( *assert, typeName ) ) {
217                                                assignOps[ typeName ] = *assert;
218                                        } // if
219                                } // for
220                        } // for
221                }
222
223                DeclarationWithType *Pass1::mutate( FunctionDecl *functionDecl ) {
224                        if ( functionDecl->get_statements() ) {         // empty routine body ?
225                                doBeginScope();
226                                TyVarMap oldtyVars = scopeTyVars;
227                                std::map< std::string, DeclarationWithType *> oldassignOps = assignOps;
228                                DeclarationWithType *oldRetval = retval;
229                                bool oldUseRetval = useRetval;
230
231                                // process polymorphic return value
232                                retval = 0;
233                                std::string typeName;
234                                if ( isPolyRet( functionDecl->get_functionType(), typeName ) && functionDecl->get_linkage() == LinkageSpec::Cforall ) {
235                                        retval = functionDecl->get_functionType()->get_returnVals().front();
236
237                                        // give names to unnamed return values
238                                        if ( retval->get_name() == "" ) {
239                                                retval->set_name( "_retparm" );
240                                                retval->set_linkage( LinkageSpec::C );
241                                        } // if
242                                } // if
243
244                                FunctionType *functionType = functionDecl->get_functionType();
245                                makeTyVarMap( functionDecl->get_functionType(), scopeTyVars );
246                                findAssignOps( functionDecl->get_functionType()->get_forall() );
247
248                                std::list< DeclarationWithType *> &paramList = functionType->get_parameters();
249                                std::list< FunctionType *> functions;
250                                for ( std::list< TypeDecl *>::iterator tyVar = functionType->get_forall().begin(); tyVar != functionType->get_forall().end(); ++tyVar ) {
251                                        for ( std::list< DeclarationWithType *>::iterator assert = (*tyVar)->get_assertions().begin(); assert != (*tyVar)->get_assertions().end(); ++assert ) {
252                                                findFunction( (*assert)->get_type(), functions, scopeTyVars, needsAdapter );
253                                        } // for
254                                } // for
255                                for ( std::list< DeclarationWithType *>::iterator arg = paramList.begin(); arg != paramList.end(); ++arg ) {
256                                        findFunction( (*arg)->get_type(), functions, scopeTyVars, needsAdapter );
257                                } // for
258                                AdapterMap & adapters = Pass1::adapters.top();
259                                for ( std::list< FunctionType *>::iterator funType = functions.begin(); funType != functions.end(); ++funType ) {
260                                        std::string mangleName = mangleAdapterName( *funType, scopeTyVars );
261                                        if ( adapters.find( mangleName ) == adapters.end() ) {
262                                                std::string adapterName = makeAdapterName( mangleName );
263                                                adapters.insert( std::pair< std::string, DeclarationWithType *>( mangleName, new ObjectDecl( adapterName, DeclarationNode::NoStorageClass, LinkageSpec::C, 0, new PointerType( Type::Qualifiers(), makeAdapterType( *funType, scopeTyVars ) ), 0 ) ) );
264                                        } // if
265                                } // for
266
267                                functionDecl->set_statements( functionDecl->get_statements()->acceptMutator( *this ) );
268
269                                scopeTyVars = oldtyVars;
270                                assignOps = oldassignOps;
271                                // std::cerr << "end FunctionDecl: ";
272                                // for ( TyVarMap::iterator i = scopeTyVars.begin(); i != scopeTyVars.end(); ++i ) {
273                                //      std::cerr << i->first << " ";
274                                // }
275                                // std::cerr << "\n";
276                                retval = oldRetval;
277                                useRetval = oldUseRetval;
278                                doEndScope();
279                        } // if
280                        return functionDecl;
281                }
282
283                TypeDecl *Pass1::mutate( TypeDecl *typeDecl ) {
284                        scopeTyVars[ typeDecl->get_name() ] = typeDecl->get_kind();
285                        return Mutator::mutate( typeDecl );
286                }
287
288                Expression *Pass1::mutate( CommaExpr *commaExpr ) {
289                        bool oldUseRetval = useRetval;
290                        useRetval = false;
291                        commaExpr->set_arg1( maybeMutate( commaExpr->get_arg1(), *this ) );
292                        useRetval = oldUseRetval;
293                        commaExpr->set_arg2( maybeMutate( commaExpr->get_arg2(), *this ) );
294                        return commaExpr;
295                }
296
297                Expression *Pass1::mutate( ConditionalExpr *condExpr ) {
298                        bool oldUseRetval = useRetval;
299                        useRetval = false;
300                        condExpr->set_arg1( maybeMutate( condExpr->get_arg1(), *this ) );
301                        useRetval = oldUseRetval;
302                        condExpr->set_arg2( maybeMutate( condExpr->get_arg2(), *this ) );
303                        condExpr->set_arg3( maybeMutate( condExpr->get_arg3(), *this ) );
304                        return condExpr;
305
306                }
307
308                void Pass1::passTypeVars( ApplicationExpr *appExpr, std::list< Expression *>::iterator &arg, const TyVarMap &exprTyVars ) {
309                        // pass size/align for type variables
310                        for ( TyVarMap::const_iterator tyParm = exprTyVars.begin(); tyParm != exprTyVars.end(); ++tyParm ) {
311                                ResolvExpr::EqvClass eqvClass;
312                                assert( env );
313                                if ( tyParm->second == TypeDecl::Any ) {
314                                        Type *concrete = env->lookup( tyParm->first );
315                                        if ( concrete ) {
316                                                arg = appExpr->get_args().insert( arg, new SizeofExpr( concrete->clone() ) );
317                                                arg++;
318                                                arg = appExpr->get_args().insert( arg, new AlignofExpr( concrete->clone() ) );
319                                                arg++;
320                                        } else {
321                                                throw SemanticError( "unbound type variable in application ", appExpr );
322                                        } // if
323                                } // if
324                        } // for
325
326                        // add size/align for generic types to parameter list
327                        //assert( ! appExpr->get_function()->get_results().empty() );
328                        if ( appExpr->get_function()->get_results().empty() ) return;
329                        FunctionType *funcType = getFunctionType( appExpr->get_function()->get_results().front() );
330                        assert( funcType );
331
332                        std::list< DeclarationWithType* >::const_iterator fnParm = funcType->get_parameters().begin();
333                        std::list< Expression* >::const_iterator fnArg = arg;
334                        std::set< std::string > seenTypes; //< names for generic types we've seen
335                        for ( ; fnParm != funcType->get_parameters().end() && fnArg != appExpr->get_args().end(); ++fnParm, ++fnArg ) {
336                                Type *parmType = (*fnParm)->get_type();
337                                if ( ! dynamic_cast< TypeInstType* >( parmType ) && isPolyType( parmType, exprTyVars ) ) {
338                                        std::string sizeName = sizeofName( parmType );
339                                        if ( seenTypes.count( sizeName ) ) continue;
340
341                                        assert( ! (*fnArg)->get_results().empty() );
342                                        Type *argType = (*fnArg)->get_results().front();
343                                        arg = appExpr->get_args().insert( arg, new SizeofExpr( argType->clone() ) );
344                                        arg++;
345                                        arg = appExpr->get_args().insert( arg, new AlignofExpr( argType->clone() ) );
346                                        arg++;
347
348                                        seenTypes.insert( sizeName );
349                                }
350                        }
351                }
352
353                ObjectDecl *Pass1::makeTemporary( Type *type ) {
354                        ObjectDecl *newObj = new ObjectDecl( tempNamer.newName(), DeclarationNode::NoStorageClass, LinkageSpec::C, 0, type, 0 );
355                        stmtsToAdd.push_back( new DeclStmt( noLabels, newObj ) );
356                        return newObj;
357                }
358
359                Expression *Pass1::addRetParam( ApplicationExpr *appExpr, FunctionType *function, Type *retType, std::list< Expression *>::iterator &arg ) {
360                        // ***** Code Removal ***** After introducing a temporary variable for all return expressions, the following code appears superfluous.
361                        // if ( useRetval ) {
362                        //      assert( retval );
363                        //      arg = appExpr->get_args().insert( arg, new VariableExpr( retval ) );
364                        //      arg++;
365                        // } else {
366
367                        // Create temporary to hold return value of polymorphic function and produce that temporary as a result
368                        // using a comma expression.  Possibly change comma expression into statement expression "{}" for multiple
369                        // return values.
370                        ObjectDecl *newObj = makeTemporary( retType->clone() );
371                        Expression *paramExpr = new VariableExpr( newObj );
372                        // If the type of the temporary is not polymorphic, box temporary by taking its address; otherwise the
373                        // temporary is already boxed and can be used directly.
374                        if ( ! isPolyType( newObj->get_type(), scopeTyVars, env ) ) {
375                                paramExpr = new AddressExpr( paramExpr );
376                        } // if
377                        arg = appExpr->get_args().insert( arg, paramExpr ); // add argument to function call
378                        arg++;
379                        // Build a comma expression to call the function and emulate a normal return.
380                        CommaExpr *commaExpr = new CommaExpr( appExpr, new VariableExpr( newObj ) );
381                        commaExpr->set_env( appExpr->get_env() );
382                        appExpr->set_env( 0 );
383                        return commaExpr;
384                        // } // if
385                        // return appExpr;
386                }
387
388                Expression *Pass1::addPolyRetParam( ApplicationExpr *appExpr, FunctionType *function, std::string typeName, std::list< Expression *>::iterator &arg ) {
389                        ResolvExpr::EqvClass eqvClass;
390                        assert( env );
391                        Type *concrete = env->lookup( typeName );
392                        if ( concrete == 0 ) {
393                                throw SemanticError( "Unbound type variable " + typeName + " in ", appExpr );
394                        } // if
395                        return addRetParam( appExpr, function, concrete, arg );
396                }
397
398                Expression *Pass1::applyAdapter( ApplicationExpr *appExpr, FunctionType *function, std::list< Expression *>::iterator &arg, const TyVarMap &tyVars ) {
399                        Expression *ret = appExpr;
400                        if ( ! function->get_returnVals().empty() && isPolyType( function->get_returnVals().front()->get_type(), tyVars ) ) {
401                                ret = addRetParam( appExpr, function, function->get_returnVals().front()->get_type(), arg );
402                        } // if
403                        std::string mangleName = mangleAdapterName( function, tyVars );
404                        std::string adapterName = makeAdapterName( mangleName );
405
406                        appExpr->get_args().push_front( appExpr->get_function() );
407                        appExpr->set_function( new NameExpr( adapterName ) );
408
409                        return ret;
410                }
411
412                void Pass1::boxParam( Type *param, Expression *&arg, const TyVarMap &exprTyVars ) {
413                        assert( ! arg->get_results().empty() );
414//   if ( ! dynamic_cast< PointerType *>( arg->get_results().front() ) ) {
415                        TypeInstType *typeInst = dynamic_cast< TypeInstType *>( param );
416                        if ( typeInst && exprTyVars.find( typeInst->get_name() ) != exprTyVars.end() ) {
417                                if ( dynamic_cast< TypeInstType *>( arg->get_results().front() ) ) {
418                                        // if the argument's type is a type parameter, we don't need to box again!
419                                        return;
420                                } else if ( arg->get_results().front()->get_isLvalue() ) {
421                                        // VariableExpr and MemberExpr are lvalues
422                                        arg = new AddressExpr( arg );
423                                } else {
424                                        ObjectDecl *newObj = new ObjectDecl( tempNamer.newName(), DeclarationNode::NoStorageClass, LinkageSpec::C, 0, arg->get_results().front()->clone(), 0 );
425                                        newObj->get_type()->get_qualifiers() = Type::Qualifiers(); // TODO: is this right???
426                                        stmtsToAdd.push_back( new DeclStmt( noLabels, newObj ) );
427                                        UntypedExpr *assign = new UntypedExpr( new NameExpr( "?=?" ) );
428                                        assign->get_args().push_back( new VariableExpr( newObj ) );
429                                        assign->get_args().push_back( arg );
430                                        stmtsToAdd.push_back( new ExprStmt( noLabels, assign ) );
431                                        arg = new AddressExpr( new VariableExpr( newObj ) );
432                                } // if
433                        } // if
434//   }
435                }
436
437                void addCast( Expression *&actual, Type *formal, const TyVarMap &tyVars ) {
438                        Type *newType = formal->clone();
439                        std::list< FunctionType *> functions;
440                        // instead of functions needing adapters, this really ought to look for
441                        // any function mentioning a polymorphic type
442                        findAndReplaceFunction( newType, functions, tyVars, needsAdapter );
443                        if ( ! functions.empty() ) {
444                                actual = new CastExpr( actual, newType );
445                        } else {
446                                delete newType;
447                        } // if
448                }
449
450                void Pass1::boxParams( ApplicationExpr *appExpr, FunctionType *function, std::list< Expression *>::iterator &arg, const TyVarMap &exprTyVars ) {
451                        for ( std::list< DeclarationWithType *>::const_iterator param = function->get_parameters().begin(); param != function->get_parameters().end(); ++param, ++arg ) {
452                                assert( arg != appExpr->get_args().end() );
453                                addCast( *arg, (*param)->get_type(), exprTyVars );
454                                boxParam( (*param)->get_type(), *arg, exprTyVars );
455                        } // for
456                }
457
458                void Pass1::addInferredParams( ApplicationExpr *appExpr, FunctionType *functionType, std::list< Expression *>::iterator &arg, const TyVarMap &tyVars ) {
459                        std::list< Expression *>::iterator cur = arg;
460                        for ( std::list< TypeDecl *>::iterator tyVar = functionType->get_forall().begin(); tyVar != functionType->get_forall().end(); ++tyVar ) {
461                                for ( std::list< DeclarationWithType *>::iterator assert = (*tyVar)->get_assertions().begin(); assert != (*tyVar)->get_assertions().end(); ++assert ) {
462                                        InferredParams::const_iterator inferParam = appExpr->get_inferParams().find( (*assert)->get_uniqueId() );
463                                        assert( inferParam != appExpr->get_inferParams().end() && "NOTE: Explicit casts of polymorphic functions to compatible monomorphic functions are currently unsupported" );
464                                        Expression *newExpr = inferParam->second.expr->clone();
465                                        addCast( newExpr, (*assert)->get_type(), tyVars );
466                                        boxParam( (*assert)->get_type(), newExpr, tyVars );
467                                        appExpr->get_args().insert( cur, newExpr );
468                                } // for
469                        } // for
470                }
471
472                void makeRetParm( FunctionType *funcType ) {
473                        DeclarationWithType *retParm = funcType->get_returnVals().front();
474
475                        // make a new parameter that is a pointer to the type of the old return value
476                        retParm->set_type( new PointerType( Type::Qualifiers(), retParm->get_type() ) );
477                        funcType->get_parameters().push_front( retParm );
478
479                        // we don't need the return value any more
480                        funcType->get_returnVals().clear();
481                }
482
483                FunctionType *makeAdapterType( FunctionType *adaptee, const TyVarMap &tyVars ) {
484                        // actually make the adapter type
485                        FunctionType *adapter = adaptee->clone();
486                        if ( ! adapter->get_returnVals().empty() && isPolyType( adapter->get_returnVals().front()->get_type(), tyVars ) ) {
487                                makeRetParm( adapter );
488                        } // if
489                        adapter->get_parameters().push_front( new ObjectDecl( "", DeclarationNode::NoStorageClass, LinkageSpec::C, 0, new PointerType( Type::Qualifiers(), new FunctionType( Type::Qualifiers(), true ) ), 0 ) );
490                        return adapter;
491                }
492
493                Expression *makeAdapterArg( DeclarationWithType *param, DeclarationWithType *arg, DeclarationWithType *realParam, const TyVarMap &tyVars ) {
494                        assert( param );
495                        assert( arg );
496                        if ( isPolyType( realParam->get_type(), tyVars ) ) {
497//     if ( dynamic_cast< PointerType *>( arg->get_type() ) ) {
498//       return new CastExpr( new VariableExpr( param ), arg->get_type()->clone() );
499//     } else {
500                                if ( dynamic_cast<TypeInstType *>(arg->get_type()) == NULL ) {
501                                        UntypedExpr *deref = new UntypedExpr( new NameExpr( "*?" ) );
502                                        deref->get_args().push_back( new CastExpr( new VariableExpr( param ), new PointerType( Type::Qualifiers(), arg->get_type()->clone() ) ) );
503                                        deref->get_results().push_back( arg->get_type()->clone() );
504                                        return deref;
505                                } // if
506//     }
507                        } // if
508                        return new VariableExpr( param );
509                }
510
511                void addAdapterParams( ApplicationExpr *adapteeApp, std::list< DeclarationWithType *>::iterator arg, std::list< DeclarationWithType *>::iterator param, std::list< DeclarationWithType *>::iterator paramEnd, std::list< DeclarationWithType *>::iterator realParam, const TyVarMap &tyVars ) {
512                        UniqueName paramNamer( "_p" );
513                        for ( ; param != paramEnd; ++param, ++arg, ++realParam ) {
514                                if ( (*param)->get_name() == "" ) {
515                                        (*param)->set_name( paramNamer.newName() );
516                                        (*param)->set_linkage( LinkageSpec::C );
517                                } // if
518                                adapteeApp->get_args().push_back( makeAdapterArg( *param, *arg, *realParam, tyVars ) );
519                        } // for
520                }
521
522
523
524                FunctionDecl *Pass1::makeAdapter( FunctionType *adaptee, FunctionType *realType, const std::string &mangleName, const TyVarMap &tyVars ) {
525                        FunctionType *adapterType = makeAdapterType( adaptee, tyVars );
526                        adapterType = ScrubTyVars::scrub( adapterType, tyVars );
527                        DeclarationWithType *adapteeDecl = adapterType->get_parameters().front();
528                        adapteeDecl->set_name( "_adaptee" );
529                        ApplicationExpr *adapteeApp = new ApplicationExpr( new CastExpr( new VariableExpr( adapteeDecl ), new PointerType( Type::Qualifiers(), realType ) ) );
530                        Statement *bodyStmt;
531
532                        std::list< TypeDecl *>::iterator tyArg = realType->get_forall().begin();
533                        std::list< TypeDecl *>::iterator tyParam = adapterType->get_forall().begin();
534                        std::list< TypeDecl *>::iterator realTyParam = adaptee->get_forall().begin();
535                        for ( ; tyParam != adapterType->get_forall().end(); ++tyArg, ++tyParam, ++realTyParam ) {
536                                assert( tyArg != realType->get_forall().end() );
537                                std::list< DeclarationWithType *>::iterator assertArg = (*tyArg)->get_assertions().begin();
538                                std::list< DeclarationWithType *>::iterator assertParam = (*tyParam)->get_assertions().begin();
539                                std::list< DeclarationWithType *>::iterator realAssertParam = (*realTyParam)->get_assertions().begin();
540                                for ( ; assertParam != (*tyParam)->get_assertions().end(); ++assertArg, ++assertParam, ++realAssertParam ) {
541                                        assert( assertArg != (*tyArg)->get_assertions().end() );
542                                        adapteeApp->get_args().push_back( makeAdapterArg( *assertParam, *assertArg, *realAssertParam, tyVars ) );
543                                } // for
544                        } // for
545
546                        std::list< DeclarationWithType *>::iterator arg = realType->get_parameters().begin();
547                        std::list< DeclarationWithType *>::iterator param = adapterType->get_parameters().begin();
548                        std::list< DeclarationWithType *>::iterator realParam = adaptee->get_parameters().begin();
549                        param++;                // skip adaptee parameter
550                        if ( realType->get_returnVals().empty() ) {
551                                addAdapterParams( adapteeApp, arg, param, adapterType->get_parameters().end(), realParam, tyVars );
552                                bodyStmt = new ExprStmt( noLabels, adapteeApp );
553                        } else if ( isPolyType( adaptee->get_returnVals().front()->get_type(), tyVars ) ) {
554                                if ( (*param)->get_name() == "" ) {
555                                        (*param)->set_name( "_ret" );
556                                        (*param)->set_linkage( LinkageSpec::C );
557                                } // if
558                                UntypedExpr *assign = new UntypedExpr( new NameExpr( "?=?" ) );
559                                UntypedExpr *deref = new UntypedExpr( new NameExpr( "*?" ) );
560                                deref->get_args().push_back( new CastExpr( new VariableExpr( *param++ ), new PointerType( Type::Qualifiers(), realType->get_returnVals().front()->get_type()->clone() ) ) );
561                                assign->get_args().push_back( deref );
562                                addAdapterParams( adapteeApp, arg, param, adapterType->get_parameters().end(), realParam, tyVars );
563                                assign->get_args().push_back( adapteeApp );
564                                bodyStmt = new ExprStmt( noLabels, assign );
565                        } else {
566                                // adapter for a function that returns a monomorphic value
567                                addAdapterParams( adapteeApp, arg, param, adapterType->get_parameters().end(), realParam, tyVars );
568                                bodyStmt = new ReturnStmt( noLabels, adapteeApp );
569                        } // if
570                        CompoundStmt *adapterBody = new CompoundStmt( noLabels );
571                        adapterBody->get_kids().push_back( bodyStmt );
572                        std::string adapterName = makeAdapterName( mangleName );
573                        return new FunctionDecl( adapterName, DeclarationNode::NoStorageClass, LinkageSpec::C, adapterType, adapterBody, false, false );
574                }
575
576                void Pass1::passAdapters( ApplicationExpr * appExpr, FunctionType * functionType, const TyVarMap & exprTyVars ) {
577                        // collect a list of function types passed as parameters or implicit parameters (assertions)
578                        std::list< DeclarationWithType *> &paramList = functionType->get_parameters();
579                        std::list< FunctionType *> functions;
580                        for ( std::list< TypeDecl *>::iterator tyVar = functionType->get_forall().begin(); tyVar != functionType->get_forall().end(); ++tyVar ) {
581                                for ( std::list< DeclarationWithType *>::iterator assert = (*tyVar)->get_assertions().begin(); assert != (*tyVar)->get_assertions().end(); ++assert ) {
582                                        findFunction( (*assert)->get_type(), functions, exprTyVars, needsAdapter );
583                                } // for
584                        } // for
585                        for ( std::list< DeclarationWithType *>::iterator arg = paramList.begin(); arg != paramList.end(); ++arg ) {
586                                findFunction( (*arg)->get_type(), functions, exprTyVars, needsAdapter );
587                        } // for
588
589                        // parameter function types for which an appropriate adapter has been generated.  we cannot use the types
590                        // after applying substitutions, since two different parameter types may be unified to the same type
591                        std::set< std::string > adaptersDone;
592
593                        for ( std::list< FunctionType *>::iterator funType = functions.begin(); funType != functions.end(); ++funType ) {
594                                FunctionType *originalFunction = (*funType)->clone();
595                                FunctionType *realFunction = (*funType)->clone();
596                                std::string mangleName = SymTab::Mangler::mangle( realFunction );
597
598                                // only attempt to create an adapter or pass one as a parameter if we haven't already done so for this
599                                // pre-substitution parameter function type.
600                                if ( adaptersDone.find( mangleName ) == adaptersDone.end() ) {
601                                        adaptersDone.insert( adaptersDone.begin(), mangleName );
602
603                                        // apply substitution to type variables to figure out what the adapter's type should look like
604                                        assert( env );
605                                        env->apply( realFunction );
606                                        mangleName = SymTab::Mangler::mangle( realFunction );
607                                        mangleName += makePolyMonoSuffix( originalFunction, exprTyVars );
608
609                                        AdapterMap & adapters = Pass1::adapters.top();
610                                        AdapterMap::iterator adapter = adapters.find( mangleName );
611                                        if ( adapter == adapters.end() ) {
612                                                // adapter has not been created yet in the current scope, so define it
613                                                FunctionDecl *newAdapter = makeAdapter( *funType, realFunction, mangleName, exprTyVars );
614                                                adapter = adapters.insert( adapters.begin(), std::pair< std::string, DeclarationWithType *>( mangleName, newAdapter ) );
615                                                stmtsToAdd.push_back( new DeclStmt( noLabels, newAdapter ) );
616                                        } // if
617                                        assert( adapter != adapters.end() );
618
619                                        // add the appropriate adapter as a parameter
620                                        appExpr->get_args().push_front( new VariableExpr( adapter->second ) );
621                                } // if
622                        } // for
623                } // passAdapters
624
625                Expression *makeIncrDecrExpr( ApplicationExpr *appExpr, Type *polyType, bool isIncr ) {
626                        NameExpr *opExpr;
627                        if ( isIncr ) {
628                                opExpr = new NameExpr( "?+=?" );
629                        } else {
630                                opExpr = new NameExpr( "?-=?" );
631                        } // if
632                        UntypedExpr *addAssign = new UntypedExpr( opExpr );
633                        if ( AddressExpr *address = dynamic_cast< AddressExpr *>( appExpr->get_args().front() ) ) {
634                                addAssign->get_args().push_back( address->get_arg() );
635                        } else {
636                                addAssign->get_args().push_back( appExpr->get_args().front() );
637                        } // if
638                        addAssign->get_args().push_back( new NameExpr( sizeofName( polyType ) ) );
639                        addAssign->get_results().front() = appExpr->get_results().front()->clone();
640                        if ( appExpr->get_env() ) {
641                                addAssign->set_env( appExpr->get_env() );
642                                appExpr->set_env( 0 );
643                        } // if
644                        appExpr->get_args().clear();
645                        delete appExpr;
646                        return addAssign;
647                }
648
649                Expression *Pass1::handleIntrinsics( ApplicationExpr *appExpr ) {
650                        if ( VariableExpr *varExpr = dynamic_cast< VariableExpr *>( appExpr->get_function() ) ) {
651                                if ( varExpr->get_var()->get_linkage() == LinkageSpec::Intrinsic ) {
652                                        if ( varExpr->get_var()->get_name() == "?[?]" ) {
653                                                assert( ! appExpr->get_results().empty() );
654                                                assert( appExpr->get_args().size() == 2 );
655                                                Type *baseType1 = isPolyPtr( appExpr->get_args().front()->get_results().front(), scopeTyVars, env );
656                                                Type *baseType2 = isPolyPtr( appExpr->get_args().back()->get_results().front(), scopeTyVars, env );
657                                                assert( ! baseType1 || ! baseType2 ); // the arguments cannot both be polymorphic pointers
658                                                UntypedExpr *ret = 0;
659                                                if ( baseType1 || baseType2 ) { // one of the arguments is a polymorphic pointer
660                                                        ret = new UntypedExpr( new NameExpr( "?+?" ) );
661                                                } // if
662                                                if ( baseType1 ) {
663                                                        UntypedExpr *multiply = new UntypedExpr( new NameExpr( "?*?" ) );
664                                                        multiply->get_args().push_back( appExpr->get_args().back() );
665                                                        multiply->get_args().push_back( new NameExpr( sizeofName( baseType1 ) ) );
666                                                        ret->get_args().push_back( appExpr->get_args().front() );
667                                                        ret->get_args().push_back( multiply );
668                                                } else if ( baseType2 ) {
669                                                        UntypedExpr *multiply = new UntypedExpr( new NameExpr( "?*?" ) );
670                                                        multiply->get_args().push_back( appExpr->get_args().front() );
671                                                        multiply->get_args().push_back( new NameExpr( sizeofName( baseType2 ) ) );
672                                                        ret->get_args().push_back( multiply );
673                                                        ret->get_args().push_back( appExpr->get_args().back() );
674                                                } // if
675                                                if ( baseType1 || baseType2 ) {
676                                                        ret->get_results().push_front( appExpr->get_results().front()->clone() );
677                                                        if ( appExpr->get_env() ) {
678                                                                ret->set_env( appExpr->get_env() );
679                                                                appExpr->set_env( 0 );
680                                                        } // if
681                                                        appExpr->get_args().clear();
682                                                        delete appExpr;
683                                                        return ret;
684                                                } // if
685                                        } else if ( varExpr->get_var()->get_name() == "*?" ) {
686                                                assert( ! appExpr->get_results().empty() );
687                                                assert( ! appExpr->get_args().empty() );
688                                                if ( isPolyType( appExpr->get_results().front(), scopeTyVars, env ) ) {
689                                                        Expression *ret = appExpr->get_args().front();
690                                                        delete ret->get_results().front();
691                                                        ret->get_results().front() = appExpr->get_results().front()->clone();
692                                                        if ( appExpr->get_env() ) {
693                                                                ret->set_env( appExpr->get_env() );
694                                                                appExpr->set_env( 0 );
695                                                        } // if
696                                                        appExpr->get_args().clear();
697                                                        delete appExpr;
698                                                        return ret;
699                                                } // if
700                                        } else if ( varExpr->get_var()->get_name() == "?++" || varExpr->get_var()->get_name() == "?--" ) {
701                                                assert( ! appExpr->get_results().empty() );
702                                                assert( appExpr->get_args().size() == 1 );
703                                                if ( Type *baseType = isPolyPtr( appExpr->get_results().front(), scopeTyVars, env ) ) {
704                                                        Type *tempType = appExpr->get_results().front()->clone();
705                                                        if ( env ) {
706                                                                env->apply( tempType );
707                                                        } // if
708                                                        ObjectDecl *newObj = makeTemporary( tempType );
709                                                        VariableExpr *tempExpr = new VariableExpr( newObj );
710                                                        UntypedExpr *assignExpr = new UntypedExpr( new NameExpr( "?=?" ) );
711                                                        assignExpr->get_args().push_back( tempExpr->clone() );
712                                                        if ( AddressExpr *address = dynamic_cast< AddressExpr *>( appExpr->get_args().front() ) ) {
713                                                                assignExpr->get_args().push_back( address->get_arg()->clone() );
714                                                        } else {
715                                                                assignExpr->get_args().push_back( appExpr->get_args().front()->clone() );
716                                                        } // if
717                                                        CommaExpr *firstComma = new CommaExpr( assignExpr, makeIncrDecrExpr( appExpr, baseType, varExpr->get_var()->get_name() == "?++" ) );
718                                                        return new CommaExpr( firstComma, tempExpr );
719                                                } // if
720                                        } else if ( varExpr->get_var()->get_name() == "++?" || varExpr->get_var()->get_name() == "--?" ) {
721                                                assert( ! appExpr->get_results().empty() );
722                                                assert( appExpr->get_args().size() == 1 );
723                                                if ( Type *baseType = isPolyPtr( appExpr->get_results().front(), scopeTyVars, env ) ) {
724                                                        return makeIncrDecrExpr( appExpr, baseType, varExpr->get_var()->get_name() == "++?" );
725                                                } // if
726                                        } else if ( varExpr->get_var()->get_name() == "?+?" || varExpr->get_var()->get_name() == "?-?" ) {
727                                                assert( ! appExpr->get_results().empty() );
728                                                assert( appExpr->get_args().size() == 2 );
729                                                Type *baseType1 = isPolyPtr( appExpr->get_args().front()->get_results().front(), scopeTyVars, env );
730                                                Type *baseType2 = isPolyPtr( appExpr->get_args().back()->get_results().front(), scopeTyVars, env );
731                                                if ( baseType1 && baseType2 ) {
732                                                        UntypedExpr *divide = new UntypedExpr( new NameExpr( "?/?" ) );
733                                                        divide->get_args().push_back( appExpr );
734                                                        divide->get_args().push_back( new NameExpr( sizeofName( baseType1 ) ) );
735                                                        divide->get_results().push_front( appExpr->get_results().front()->clone() );
736                                                        if ( appExpr->get_env() ) {
737                                                                divide->set_env( appExpr->get_env() );
738                                                                appExpr->set_env( 0 );
739                                                        } // if
740                                                        return divide;
741                                                } else if ( baseType1 ) {
742                                                        UntypedExpr *multiply = new UntypedExpr( new NameExpr( "?*?" ) );
743                                                        multiply->get_args().push_back( appExpr->get_args().back() );
744                                                        multiply->get_args().push_back( new NameExpr( sizeofName( baseType1 ) ) );
745                                                        appExpr->get_args().back() = multiply;
746                                                } else if ( baseType2 ) {
747                                                        UntypedExpr *multiply = new UntypedExpr( new NameExpr( "?*?" ) );
748                                                        multiply->get_args().push_back( appExpr->get_args().front() );
749                                                        multiply->get_args().push_back( new NameExpr( sizeofName( baseType2 ) ) );
750                                                        appExpr->get_args().front() = multiply;
751                                                } // if
752                                        } else if ( varExpr->get_var()->get_name() == "?+=?" || varExpr->get_var()->get_name() == "?-=?" ) {
753                                                assert( ! appExpr->get_results().empty() );
754                                                assert( appExpr->get_args().size() == 2 );
755                                                Type *baseType = isPolyPtr( appExpr->get_results().front(), scopeTyVars, env );
756                                                if ( baseType ) {
757                                                        UntypedExpr *multiply = new UntypedExpr( new NameExpr( "?*?" ) );
758                                                        multiply->get_args().push_back( appExpr->get_args().back() );
759                                                        multiply->get_args().push_back( new NameExpr( sizeofName( baseType ) ) );
760                                                        appExpr->get_args().back() = multiply;
761                                                } // if
762                                        } // if
763                                        return appExpr;
764                                } // if
765                        } // if
766                        return 0;
767                }
768
769                Expression *Pass1::mutate( ApplicationExpr *appExpr ) {
770                        // std::cerr << "mutate appExpr: ";
771                        // for ( TyVarMap::iterator i = scopeTyVars.begin(); i != scopeTyVars.end(); ++i ) {
772                        //      std::cerr << i->first << " ";
773                        // }
774                        // std::cerr << "\n";
775                        bool oldUseRetval = useRetval;
776                        useRetval = false;
777                        appExpr->get_function()->acceptMutator( *this );
778                        mutateAll( appExpr->get_args(), *this );
779                        useRetval = oldUseRetval;
780
781                        assert( ! appExpr->get_function()->get_results().empty() );
782                        PointerType *pointer = dynamic_cast< PointerType *>( appExpr->get_function()->get_results().front() );
783                        assert( pointer );
784                        FunctionType *function = dynamic_cast< FunctionType *>( pointer->get_base() );
785                        assert( function );
786
787                        if ( Expression *newExpr = handleIntrinsics( appExpr ) ) {
788                                return newExpr;
789                        } // if
790
791                        Expression *ret = appExpr;
792
793                        std::list< Expression *>::iterator arg = appExpr->get_args().begin();
794                        std::list< Expression *>::iterator paramBegin = appExpr->get_args().begin();
795
796                        std::string typeName;
797                        if ( isPolyRet( function, typeName ) ) {
798                                ret = addPolyRetParam( appExpr, function, typeName, arg );
799                        } else if ( needsAdapter( function, scopeTyVars ) ) {
800                                // std::cerr << "needs adapter: ";
801                                // for ( TyVarMap::iterator i = scopeTyVars.begin(); i != scopeTyVars.end(); ++i ) {
802                                //      std::cerr << i->first << " ";
803                                // }
804                                // std::cerr << "\n";
805                                // change the application so it calls the adapter rather than the passed function
806                                ret = applyAdapter( appExpr, function, arg, scopeTyVars );
807                        } // if
808                        arg = appExpr->get_args().begin();
809
810                        TyVarMap exprTyVars;
811                        makeTyVarMap( function, exprTyVars );
812
813                        passTypeVars( appExpr, arg, exprTyVars );
814                        addInferredParams( appExpr, function, arg, exprTyVars );
815
816                        arg = paramBegin;
817
818                        boxParams( appExpr, function, arg, exprTyVars );
819
820                        passAdapters( appExpr, function, exprTyVars );
821
822                        return ret;
823                }
824
825                Expression *Pass1::mutate( UntypedExpr *expr ) {
826                        if ( ! expr->get_results().empty() && isPolyType( expr->get_results().front(), scopeTyVars, env ) ) {
827                                if ( NameExpr *name = dynamic_cast< NameExpr *>( expr->get_function() ) ) {
828                                        if ( name->get_name() == "*?" ) {
829                                                Expression *ret = expr->get_args().front();
830                                                expr->get_args().clear();
831                                                delete expr;
832                                                return ret->acceptMutator( *this );
833                                        } // if
834                                } // if
835                        } // if
836                        return PolyMutator::mutate( expr );
837                }
838
839                Expression *Pass1::mutate( AddressExpr *addrExpr ) {
840                        assert( ! addrExpr->get_arg()->get_results().empty() );
841
842                        bool needs = false;
843                        if ( UntypedExpr *expr = dynamic_cast< UntypedExpr *>( addrExpr->get_arg() ) ) {
844                                if ( ! expr->get_results().empty() && isPolyType( expr->get_results().front(), scopeTyVars, env ) ) {
845                                        if ( NameExpr *name = dynamic_cast< NameExpr *>( expr->get_function() ) ) {
846                                                if ( name->get_name() == "*?" ) {
847                                                        if ( ApplicationExpr * appExpr = dynamic_cast< ApplicationExpr * >( expr->get_args().front() ) ) {
848                                                                assert( ! appExpr->get_function()->get_results().empty() );
849                                                                PointerType *pointer = dynamic_cast< PointerType *>( appExpr->get_function()->get_results().front() );
850                                                                assert( pointer );
851                                                                FunctionType *function = dynamic_cast< FunctionType *>( pointer->get_base() );
852                                                                assert( function );
853                                                                needs = needsAdapter( function, scopeTyVars );
854                                                        } // if
855                                                } // if
856                                        } // if
857                                } // if
858                        } // if
859                        addrExpr->set_arg( mutateExpression( addrExpr->get_arg() ) );
860                        if ( isPolyType( addrExpr->get_arg()->get_results().front(), scopeTyVars, env ) || needs ) {
861                                Expression *ret = addrExpr->get_arg();
862                                delete ret->get_results().front();
863                                ret->get_results().front() = addrExpr->get_results().front()->clone();
864                                addrExpr->set_arg( 0 );
865                                delete addrExpr;
866                                return ret;
867                        } else {
868                                return addrExpr;
869                        } // if
870                }
871
872                Statement * Pass1::mutate( ReturnStmt *returnStmt ) {
873                        if ( retval && returnStmt->get_expr() ) {
874                                assert( ! returnStmt->get_expr()->get_results().empty() );
875                                // ***** Code Removal ***** After introducing a temporary variable for all return expressions, the following code appears superfluous.
876                                // if ( returnStmt->get_expr()->get_results().front()->get_isLvalue() ) {
877                                // by this point, a cast expr on a polymorphic return value is redundant
878                                while ( CastExpr *castExpr = dynamic_cast< CastExpr *>( returnStmt->get_expr() ) ) {
879                                        returnStmt->set_expr( castExpr->get_arg() );
880                                        returnStmt->get_expr()->set_env( castExpr->get_env() );
881                                        castExpr->set_env( 0 );
882                                        castExpr->set_arg( 0 );
883                                        delete castExpr;
884                                } //while
885                                TypeInstType *typeInst = dynamic_cast< TypeInstType *>( retval->get_type() );
886                                assert( typeInst );
887                                std::map< std::string, DeclarationWithType *>::const_iterator assignIter = assignOps.find( typeInst->get_name() );
888                                if ( assignIter == assignOps.end() ) {
889                                        throw SemanticError( "Attempt to return dtype or ftype object in ", returnStmt->get_expr() );
890                                } // if
891                                ApplicationExpr *assignExpr = new ApplicationExpr( new VariableExpr( assignIter->second ) );
892                                Expression *retParm = new NameExpr( retval->get_name() );
893                                retParm->get_results().push_back( new PointerType( Type::Qualifiers(), retval->get_type()->clone() ) );
894                                assignExpr->get_args().push_back( retParm );
895                                assignExpr->get_args().push_back( returnStmt->get_expr() );
896                                stmtsToAdd.push_back( new ExprStmt( noLabels, mutateExpression( assignExpr ) ) );
897                                // } else {
898                                //      useRetval = true;
899                                //      stmtsToAdd.push_back( new ExprStmt( noLabels, mutateExpression( returnStmt->get_expr() ) ) );
900                                //      useRetval = false;
901                                // } // if
902                                returnStmt->set_expr( 0 );
903                        } else {
904                                returnStmt->set_expr( mutateExpression( returnStmt->get_expr() ) );
905                        } // if
906                        return returnStmt;
907                }
908
909                Type * Pass1::mutate( PointerType *pointerType ) {
910                        TyVarMap oldtyVars = scopeTyVars;
911                        makeTyVarMap( pointerType, scopeTyVars );
912
913                        Type *ret = Mutator::mutate( pointerType );
914
915                        scopeTyVars = oldtyVars;
916                        return ret;
917                }
918
919                Type * Pass1::mutate( FunctionType *functionType ) {
920                        TyVarMap oldtyVars = scopeTyVars;
921                        makeTyVarMap( functionType, scopeTyVars );
922
923                        Type *ret = Mutator::mutate( functionType );
924
925                        scopeTyVars = oldtyVars;
926                        return ret;
927                }
928
929                void Pass1::doBeginScope() {
930                        // push a copy of the current map
931                        adapters.push(adapters.top());
932                }
933
934                void Pass1::doEndScope() {
935                        adapters.pop();
936                }
937
938////////////////////////////////////////// Pass2 ////////////////////////////////////////////////////
939
940                void Pass2::addAdapters( FunctionType *functionType ) {
941                        std::list< DeclarationWithType *> &paramList = functionType->get_parameters();
942                        std::list< FunctionType *> functions;
943                        for ( std::list< DeclarationWithType *>::iterator arg = paramList.begin(); arg != paramList.end(); ++arg ) {
944                                Type *orig = (*arg)->get_type();
945                                findAndReplaceFunction( orig, functions, scopeTyVars, needsAdapter );
946                                (*arg)->set_type( orig );
947                        }
948                        std::set< std::string > adaptersDone;
949                        for ( std::list< FunctionType *>::iterator funType = functions.begin(); funType != functions.end(); ++funType ) {
950                                std::string mangleName = mangleAdapterName( *funType, scopeTyVars );
951                                if ( adaptersDone.find( mangleName ) == adaptersDone.end() ) {
952                                        std::string adapterName = makeAdapterName( mangleName );
953                                        paramList.push_front( new ObjectDecl( adapterName, DeclarationNode::NoStorageClass, LinkageSpec::C, 0, new PointerType( Type::Qualifiers(), makeAdapterType( *funType, scopeTyVars ) ), 0 ) );
954                                        adaptersDone.insert( adaptersDone.begin(), mangleName );
955                                }
956                        }
957//  deleteAll( functions );
958                }
959
960                template< typename DeclClass >
961                DeclClass * Pass2::handleDecl( DeclClass *decl, Type *type ) {
962                        DeclClass *ret = static_cast< DeclClass *>( Mutator::mutate( decl ) );
963
964                        return ret;
965                }
966
967                DeclarationWithType * Pass2::mutate( FunctionDecl *functionDecl ) {
968                        return handleDecl( functionDecl, functionDecl->get_functionType() );
969                }
970
971                ObjectDecl * Pass2::mutate( ObjectDecl *objectDecl ) {
972                        return handleDecl( objectDecl, objectDecl->get_type() );
973                }
974
975                TypeDecl * Pass2::mutate( TypeDecl *typeDecl ) {
976                        scopeTyVars[ typeDecl->get_name() ] = typeDecl->get_kind();
977                        if ( typeDecl->get_base() ) {
978                                return handleDecl( typeDecl, typeDecl->get_base() );
979                        } else {
980                                return Mutator::mutate( typeDecl );
981                        }
982                }
983
984                TypedefDecl * Pass2::mutate( TypedefDecl *typedefDecl ) {
985                        return handleDecl( typedefDecl, typedefDecl->get_base() );
986                }
987
988                Type * Pass2::mutate( PointerType *pointerType ) {
989                        TyVarMap oldtyVars = scopeTyVars;
990                        makeTyVarMap( pointerType, scopeTyVars );
991
992                        Type *ret = Mutator::mutate( pointerType );
993
994                        scopeTyVars = oldtyVars;
995                        return ret;
996                }
997
998                Type *Pass2::mutate( FunctionType *funcType ) {
999                        TyVarMap oldtyVars = scopeTyVars;
1000                        makeTyVarMap( funcType, scopeTyVars );
1001
1002                        // move polymorphic return type to parameter list
1003                        std::string typeName;
1004                        if ( isPolyRet( funcType, typeName ) ) {
1005                                DeclarationWithType *ret = funcType->get_returnVals().front();
1006                                ret->set_type( new PointerType( Type::Qualifiers(), ret->get_type() ) );
1007                                funcType->get_parameters().push_front( ret );
1008                                funcType->get_returnVals().pop_front();
1009                        }
1010
1011                        // add size/align and assertions for type parameters to parameter list
1012                        std::list< DeclarationWithType *>::iterator last = funcType->get_parameters().begin();
1013                        std::list< DeclarationWithType *> inferredParams;
1014                        ObjectDecl newObj( "", DeclarationNode::NoStorageClass, LinkageSpec::C, 0, new BasicType( Type::Qualifiers(), BasicType::LongUnsignedInt ), 0 );
1015//   ObjectDecl *newFunPtr = new ObjectDecl( "", DeclarationNode::NoStorageClass, LinkageSpec::Cforall, 0, new PointerType( Type::Qualifiers(), new FunctionType( Type::Qualifiers(), true ) ), 0 );
1016                        for ( std::list< TypeDecl *>::const_iterator tyParm = funcType->get_forall().begin(); tyParm != funcType->get_forall().end(); ++tyParm ) {
1017                                ObjectDecl *sizeParm, *alignParm;
1018                                // add all size and alignment parameters to parameter list
1019                                if ( (*tyParm)->get_kind() == TypeDecl::Any ) {
1020                                        TypeInstType parmType( Type::Qualifiers(), (*tyParm)->get_name(), *tyParm );
1021
1022                                        sizeParm = newObj.clone();
1023                                        sizeParm->set_name( sizeofName( &parmType ) );
1024                                        last = funcType->get_parameters().insert( last, sizeParm );
1025                                        ++last;
1026
1027                                        alignParm = newObj.clone();
1028                                        alignParm->set_name( alignofName( &parmType ) );
1029                                        last = funcType->get_parameters().insert( last, alignParm );
1030                                        ++last;
1031                                }
1032                                // move all assertions into parameter list
1033                                for ( std::list< DeclarationWithType *>::iterator assert = (*tyParm)->get_assertions().begin(); assert != (*tyParm)->get_assertions().end(); ++assert ) {
1034//      *assert = (*assert)->acceptMutator( *this );
1035                                        inferredParams.push_back( *assert );
1036                                }
1037                                (*tyParm)->get_assertions().clear();
1038                        }
1039
1040                        // add size/align for generic types to parameter list
1041                        std::set< std::string > seenTypes; //< sizeofName for generic types we've seen
1042                        for ( std::list< DeclarationWithType* >::const_iterator fnParm = last; fnParm != funcType->get_parameters().end(); ++fnParm ) {
1043                                Type *parmType = (*fnParm)->get_type();
1044                                if ( ! dynamic_cast< TypeInstType* >( parmType ) && isPolyType( parmType, scopeTyVars ) ) {
1045                                        std::string sizeName = sizeofName( parmType );
1046                                        if ( seenTypes.count( sizeName ) ) continue;
1047
1048                                        ObjectDecl *sizeParm, *alignParm;
1049                                        sizeParm = newObj.clone();
1050                                        sizeParm->set_name( sizeName );
1051                                        last = funcType->get_parameters().insert( last, sizeParm );
1052                                        ++last;
1053
1054                                        alignParm = newObj.clone();
1055                                        alignParm->set_name( alignofName( parmType ) );
1056                                        last = funcType->get_parameters().insert( last, alignParm );
1057                                        ++last;
1058
1059                                        seenTypes.insert( sizeName );
1060                                }
1061                        }
1062
1063                        // splice assertion parameters into parameter list
1064                        funcType->get_parameters().splice( last, inferredParams );
1065                        addAdapters( funcType );
1066                        mutateAll( funcType->get_returnVals(), *this );
1067                        mutateAll( funcType->get_parameters(), *this );
1068
1069                        scopeTyVars = oldtyVars;
1070                        return funcType;
1071                }
1072
1073////////////////////////////////////////// Pass3 ////////////////////////////////////////////////////
1074
1075                template< typename DeclClass >
1076                DeclClass * Pass3::handleDecl( DeclClass *decl, Type *type ) {
1077                        TyVarMap oldtyVars = scopeTyVars;
1078                        makeTyVarMap( type, scopeTyVars );
1079
1080                        DeclClass *ret = static_cast< DeclClass *>( Mutator::mutate( decl ) );
1081                        ScrubTyVars::scrub( decl, scopeTyVars );
1082
1083                        scopeTyVars = oldtyVars;
1084                        return ret;
1085                }
1086
1087                ObjectDecl * Pass3::mutate( ObjectDecl *objectDecl ) {
1088                        return handleDecl( objectDecl, objectDecl->get_type() );
1089                }
1090
1091                DeclarationWithType * Pass3::mutate( FunctionDecl *functionDecl ) {
1092                        return handleDecl( functionDecl, functionDecl->get_functionType() );
1093                }
1094
1095                TypedefDecl * Pass3::mutate( TypedefDecl *typedefDecl ) {
1096                        return handleDecl( typedefDecl, typedefDecl->get_base() );
1097                }
1098
1099                TypeDecl * Pass3::mutate( TypeDecl *typeDecl ) {
1100//   Initializer *init = 0;
1101//   std::list< Expression *> designators;
1102//   scopeTyVars[ typeDecl->get_name() ] = typeDecl->get_kind();
1103//   if ( typeDecl->get_base() ) {
1104//     init = new SimpleInit( new SizeofExpr( handleDecl( typeDecl, typeDecl->get_base() ) ), designators );
1105//   }
1106//   return new ObjectDecl( typeDecl->get_name(), Declaration::Extern, LinkageSpec::C, 0, new BasicType( Type::Qualifiers(), BasicType::UnsignedInt ), init );
1107
1108                        scopeTyVars[ typeDecl->get_name() ] = typeDecl->get_kind();
1109                        return Mutator::mutate( typeDecl );
1110                }
1111
1112                Type * Pass3::mutate( PointerType *pointerType ) {
1113                        TyVarMap oldtyVars = scopeTyVars;
1114                        makeTyVarMap( pointerType, scopeTyVars );
1115
1116                        Type *ret = Mutator::mutate( pointerType );
1117
1118                        scopeTyVars = oldtyVars;
1119                        return ret;
1120                }
1121
1122                Type * Pass3::mutate( FunctionType *functionType ) {
1123                        TyVarMap oldtyVars = scopeTyVars;
1124                        makeTyVarMap( functionType, scopeTyVars );
1125
1126                        Type *ret = Mutator::mutate( functionType );
1127
1128                        scopeTyVars = oldtyVars;
1129                        return ret;
1130                }
1131
1132                Statement *Pass3::mutate( DeclStmt *declStmt ) {
1133                        if ( ObjectDecl *objectDecl = dynamic_cast< ObjectDecl *>( declStmt->get_decl() ) ) {
1134                                if ( isPolyType( objectDecl->get_type(), scopeTyVars ) ) {
1135                                        // change initialization of a polymorphic value object
1136                                        // to allocate storage with alloca
1137                                        Type *declType = objectDecl->get_type();
1138                                        UntypedExpr *alloc = new UntypedExpr( new NameExpr( "__builtin_alloca" ) );
1139                                        alloc->get_args().push_back( new NameExpr( sizeofName( declType ) ) );
1140
1141                                        delete objectDecl->get_init();
1142
1143                                        std::list<Expression*> designators;
1144                                        objectDecl->set_init( new SingleInit( alloc, designators ) );
1145                                }
1146                        }
1147                        return Mutator::mutate( declStmt );
1148                }
1149        } // anonymous namespace
1150} // namespace GenPoly
1151
1152// Local Variables: //
1153// tab-width: 4 //
1154// mode: c++ //
1155// compile-command: "make install" //
1156// End: //
Note: See TracBrowser for help on using the repository browser.