package scala.tools.nsc
package typechecker
import symtab.Flags._
import scala.collection.mutable.{ListBuffer, WeakHashMap}
import scala.collection.immutable.Set
trait NamesDefaults { self: Analyzer =>
import global._
import definitions._
val defaultParametersOfMethod = new WeakHashMap[Symbol, Set[Symbol]] {
override def default(key: Symbol) = Set()
}
case class NamedApplyInfo(qual: Option[Tree], targs: List[Tree],
vargss: List[List[Tree]], blockTyper: Typer)
val noApplyInfo = NamedApplyInfo(None, Nil, Nil, null)
def nameOf(arg: Tree) = arg match {
case AssignOrNamedArg(Ident(name), rhs) => Some(name)
case _ => None
}
def isNamed(arg: Tree) = nameOf(arg).isDefined
def reorderArgs[T: ClassManifest](args: List[T], pos: Int => Int): List[T] = {
val res = new Array[T](args.length)
(0 /: args) { case (index, arg) => res(pos(index)) = arg; index + 1 }
res.toList
}
def reorderArgsInv[T: ClassManifest](args: List[T], pos: Int => Int): List[T] = {
val argsArray = args.toArray
val res = new ListBuffer[T]
for (i <- 0 until argsArray.length)
res += argsArray(pos(i))
res.toList
}
def isIdentity(a: Array[Int]) = (0 until a.length).forall(i => a(i) == i)
def transformNamedApplication(typer: Typer, mode: Int, pt: Type)
(tree: Tree, argPos: Int => Int): Tree = {
import typer._
import typer.infer._
val context = typer.context
import context.unit
def baseFunBlock(baseFun: Tree): Tree = {
val isConstr = baseFun.symbol.isConstructor
val blockTyper = newTyper(context.makeNewScope(tree, context.owner))
val (baseFun1, funTargs, defaultTargs) = baseFun match {
case TypeApply(fun, targs) =>
val targsInSource =
if (targs.forall(a => context.undetparams contains a.symbol)) Nil
else targs
(fun, targs, targsInSource)
case Select(New(tpt @ TypeTree()), _) if isConstr =>
val targsInSource = tpt.tpe match {
case TypeRef(pre, sym, args)
if (!args.forall(a => context.undetparams contains a.typeSymbol)) =>
args.map(TypeTree(_))
case _ =>
Nil
}
(baseFun, Nil, targsInSource)
case Select(TypeApply(New(TypeTree()), targs), _) if isConstr =>
val targsInSource =
if (targs.forall(a => context.undetparams contains a.symbol)) Nil
else targs
(baseFun, Nil, targsInSource)
case _ => (baseFun, Nil, Nil)
}
def blockWithQualifier(qual: Tree, selected: Name) = {
val sym = blockTyper.context.owner.newValue(qual.pos, unit.freshTermName("qual$"))
.setInfo(qual.tpe)
blockTyper.context.scope.enter(sym)
val vd = atPos(sym.pos)(ValDef(sym, qual).setType(NoType))
var baseFunTransformed = atPos(baseFun.pos.makeTransparent) {
val f = Select(gen.mkAttributedRef(sym), selected)
.setType(baseFun1.tpe).setSymbol(baseFun1.symbol)
if (funTargs.isEmpty) f
else TypeApply(f, funTargs).setType(baseFun.tpe)
}
val b = Block(List(vd), baseFunTransformed)
.setType(baseFunTransformed.tpe).setPos(baseFun.pos)
val defaultQual = Some(atPos(qual.pos.focus)(gen.mkAttributedRef(sym)))
context.namedApplyBlockInfo =
Some((b, NamedApplyInfo(defaultQual, defaultTargs, Nil, blockTyper)))
b
}
def blockWithoutQualifier(defaultQual: Option[Tree]) = {
val b = atPos(baseFun.pos)(Block(Nil, baseFun).setType(baseFun.tpe))
context.namedApplyBlockInfo =
Some((b, NamedApplyInfo(defaultQual, defaultTargs, Nil, blockTyper)))
b
}
def moduleQual(pos: Position, classType: Type) = {
val pre = classType.prefix
if (pre == NoType) {
None
} else {
val module = companionModuleOf(baseFun.symbol.owner, context)
if (module == NoSymbol) None
else Some(atPos(pos.focus)(gen.mkAttributedRef(pre, module)))
}
}
baseFun1 match {
case Select(New(tp @ TypeTree()), _) if isConstr =>
blockWithoutQualifier(moduleQual(tp.pos, tp.tpe))
case Select(TypeApply(New(tp @ TypeTree()), _), _) if isConstr =>
blockWithoutQualifier(moduleQual(tp.pos, tp.tpe))
case Select(New(tp @ Ident(_)), _) if isConstr =>
blockWithoutQualifier(moduleQual(tp.pos, tp.tpe))
case Select(TypeApply(New(tp @ Ident(_)), _), _) if isConstr =>
blockWithoutQualifier(moduleQual(tp.pos, tp.tpe))
case Select(New(tp @ Select(qual, _)), _) if isConstr =>
assert(treeInfo.isPureExpr(qual), qual)
blockWithoutQualifier(moduleQual(tp.pos, tp.tpe))
case Select(TypeApply(New(tp @ Select(qual, _)), _), _) if isConstr =>
assert(treeInfo.isPureExpr(qual), qual)
blockWithoutQualifier(moduleQual(tp.pos, tp.tpe))
case Select(sp @ Super(_, _), _) if isConstr =>
blockWithoutQualifier(moduleQual(baseFun.pos, sp.symbol.tpe.parents.head))
case Select(tp, name) if isConstr =>
assert(treeInfo.isPureExpr(tp), tp)
blockWithoutQualifier(moduleQual(tp.pos, tp.tpe))
case Ident(_) =>
blockWithoutQualifier(None)
case Select(qual, name) =>
if (treeInfo.isPureExpr(qual))
blockWithoutQualifier(Some(qual.duplicate))
else
blockWithQualifier(qual, name)
}
}
def argValDefs(args: List[Tree], paramTypes: List[Type], blockTyper: Typer): List[ValDef] = {
val context = blockTyper.context
val symPs = (args, paramTypes).zipped map ((arg, tpe) => {
val byName = isByNameParamType(tpe)
val (argTpe, repeated) =
if (isScalaRepeatedParamType(tpe)) arg match {
case Typed(expr, Ident(tpnme.WILDCARD_STAR)) =>
(expr.tpe, true)
case _ =>
(seqType(arg.tpe), true)
} else (arg.tpe, false)
val s = context.owner.newValue(arg.pos, unit.freshTermName("x$"))
val valType = if (byName) functionType(List(), argTpe)
else if (repeated) argTpe
else argTpe
s.setInfo(valType)
(context.scope.enter(s), byName, repeated)
})
(symPs, args).zipped map {
case ((sym, byName, repeated), arg) =>
val body = if (byName) blockTyper.typed(Function(List(), resetLocalAttrs(arg)))
else if (repeated) arg match {
case Typed(expr, Ident(tpnme.WILDCARD_STAR)) =>
expr
case _ =>
val factory = Select(gen.mkAttributedRef(SeqModule), nme.apply)
blockTyper.typed(Apply(factory, List(resetLocalAttrs(arg))))
} else arg
atPos(body.pos)(ValDef(sym, body).setType(NoType))
}
}
if (isNamedApplyBlock(tree)) {
context.namedApplyBlockInfo.get._1
} else tree match {
case Apply(fun, namelessArgs) =>
val transformedFun = transformNamedApplication(typer, mode, pt)(fun, x => x)
if (transformedFun.isErroneous) setError(tree)
else {
assert(isNamedApplyBlock(transformedFun), transformedFun)
val NamedApplyInfo(qual, targs, vargss, blockTyper) =
context.namedApplyBlockInfo.get._2
val existingBlock @ Block(stats, funOnly) = transformedFun
val typedApp = doTypedApply(tree, funOnly, reorderArgs(namelessArgs, argPos), mode, pt)
if (typedApp.tpe.isError) setError(tree)
else typedApp match {
case Apply(expr, typedArgs) =>
val formals = formalTypes(expr.tpe.paramTypes, typedArgs.length, false, false)
val valDefs = argValDefs(reorderArgsInv(typedArgs, argPos),
reorderArgsInv(formals, argPos),
blockTyper)
val refArgs = (reorderArgs(valDefs, argPos), formals).zipped map ((vDef, tpe) => {
val ref = gen.mkAttributedRef(vDef.symbol)
atPos(vDef.pos.focus) {
if (isByNameParamType(tpe)) Apply(ref, List())
else if (isScalaRepeatedParamType(tpe)) Typed(ref, Ident(tpnme.WILDCARD_STAR))
else ref
}
})
val res = blockTyper.doTypedApply(tree, expr, refArgs, mode, pt)
res.setPos(res.pos.makeTransparent)
val block = Block(stats ::: valDefs, res).setType(res.tpe).setPos(tree.pos)
context.namedApplyBlockInfo =
Some((block, NamedApplyInfo(qual, targs, vargss ::: List(refArgs), blockTyper)))
block
}
}
case baseFun =>
baseFunBlock(baseFun)
}
}
def missingParams[T](args: List[T], params: List[Symbol], argName: T => Option[Name] = nameOf _): (List[Symbol], Boolean) = {
val namedArgs = args.dropWhile(arg => {
val n = argName(arg)
n.isEmpty || params.forall(p => p.name != n.get)
})
val namedParams = params.drop(args.length - namedArgs.length)
val missingParams = namedParams.filter(p => namedArgs.forall(arg => {
val n = argName(arg)
n.isEmpty || n.get != p.name
}))
val allPositional = missingParams.length == namedParams.length
(missingParams, allPositional)
}
def addDefaults(givenArgs: List[Tree], qual: Option[Tree], targs: List[Tree],
previousArgss: List[List[Tree]], params: List[Symbol],
pos: util.Position, context: Context): (List[Tree], List[Symbol]) = {
if (givenArgs.length < params.length) {
val (missing, positional) = missingParams(givenArgs, params)
if (missing forall (_.hasDefaultFlag)) {
val defaultArgs = missing flatMap (p => {
val defGetter = defaultGetter(p, context)
if (defGetter == NoSymbol) None
else {
var default1 = qual match {
case Some(q) => gen.mkAttributedSelect(q.duplicate, defGetter)
case None => gen.mkAttributedRef(defGetter)
}
default1 = if (targs.isEmpty) default1
else TypeApply(default1, targs.map(_.duplicate))
val default2 = (default1 /: previousArgss)((tree, args) =>
Apply(tree, args.map(_.duplicate)))
Some(atPos(pos) {
if (positional) default2
else AssignOrNamedArg(Ident(p.name), default2)
})
}
})
(givenArgs ::: defaultArgs, Nil)
} else (givenArgs, missing filterNot (_.hasDefaultFlag))
} else (givenArgs, Nil)
}
def defaultGetter(param: Symbol, context: Context): Symbol = {
val i = param.owner.paramss.flatten.indexWhere(p => p.name == param.name) + 1
if (i > 0) {
val defGetterName = nme.defaultGetterName(param.owner.name, i)
if (param.owner.isConstructor) {
val mod = companionModuleOf(param.owner.owner, context)
mod.info.member(defGetterName)
}
else {
if (param.owner.owner.isClass) {
param.owner.owner.toInterface.info.member(defGetterName)
} else {
context.lookup(defGetterName, param.owner.owner)
}
}
} else NoSymbol
}
def removeNames(typer: Typer)(args: List[Tree], params: List[Symbol]): (List[Tree], Array[Int]) = {
import typer.infer.errorTree
val argPos = (new Array[Int](args.length)) map (x => -1)
var positionalAllowed = true
val namelessArgs = for ((arg, index) <- (args.zipWithIndex)) yield arg match {
case a @ AssignOrNamedArg(Ident(name), rhs) =>
val (pos, newName) = paramPos(params, name)
newName.foreach(n => {
typer.context.unit.deprecationWarning(arg.pos, "the parameter name "+ name +" has been deprecated. Use "+ n +" instead.")
})
if (pos == -1) {
if (positionalAllowed) {
argPos(index) = index
Assign(a.lhs, rhs).setPos(arg.pos)
} else {
errorTree(arg, "unknown parameter name: "+ name)
}
} else if (argPos contains pos) {
errorTree(arg, "parameter specified twice: "+ name)
} else {
val param = params(pos)
val paramtpe = params(pos).tpe.cloneInfo(param)
val udp = typer.context.extractUndetparams()
val subst = new SubstTypeMap(udp, udp map (_ => WildcardType)) {
override def apply(tp: Type): Type = tp match {
case TypeRef(_, ByNameParamClass, List(arg)) => super.apply(arg)
case _ => super.apply(tp)
}
}
val reportAmbiguousErrors = typer.context.reportAmbiguousErrors
typer.context.reportAmbiguousErrors = false
var variableNameClash = false
val typedAssign = try {
typer.silent(_.typed(arg, subst(paramtpe)))
} catch {
case cr @ CyclicReference(sym, info) if sym.name == param.name =>
if (sym.isVariable || sym.isGetter && sym.accessed.isVariable) {
variableNameClash = true
typer.context.error(sym.pos,
"%s definition needs %s because '%s' is used as a named argument in its body.".format(
"variable",
"type",
sym.name
)
)
typer.infer.setError(arg)
}
else cr
}
def applyNamedArg = {
if (index != pos)
positionalAllowed = false
argPos(index) = pos
rhs
}
val res = typedAssign match {
case _: TypeError => applyNamedArg
case t: Tree =>
if (t.isErroneous && !variableNameClash) {
applyNamedArg
} else if (t.isErroneous) {
t
} else {
errorTree(arg, "reference to "+ name +" is ambiguous; it is both, a parameter\n"+
"name of the method and the name of a variable currently in scope.")
}
}
typer.context.reportAmbiguousErrors = reportAmbiguousErrors
typer.context.undetparams = udp
res
}
case _ =>
argPos(index) = index
if (positionalAllowed) arg
else errorTree(arg, "positional after named argument.")
}
(namelessArgs, argPos)
}
def paramPos(params: List[Symbol], name: Name): (Int, Option[Name]) = {
var i = 0
var rest = params
while (!rest.isEmpty) {
val p = rest.head
if (!p.isSynthetic) {
if (p.name == name) return (i, None)
if (deprecatedName(p) == Some(name)) return (i, Some(p.name))
}
i += 1
rest = rest.tail
}
(-1, None)
}
def deprecatedName(sym: Symbol): Option[Name] =
sym.getAnnotation(DeprecatedNameAttr).map(ann => (ann.args(0): @unchecked) match {
case Apply(fun, Literal(str) :: Nil) if (fun.symbol == Symbol_apply) =>
newTermName(str.stringValue)
})
}